Skip to content

Commit

Permalink
style
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy authored Jul 9, 2024
1 parent fe9d005 commit 0c16adc
Showing 1 changed file with 3 additions and 2 deletions.
5 changes: 3 additions & 2 deletions R/rd-eval.R
Original file line number Diff line number Diff line change
Expand Up @@ -23,10 +23,11 @@ local_reproducible_output <- function(.envir = parent.frame()) {
.local_envir = .envir
)
withr::local_envvar(RSTUDIO = NA, .local_envir = .envir)
if (isTRUE(capabilities("NLS")) && Sys.getenv("LANG") !=
"C") {

if (isTRUE(capabilities("NLS")) && Sys.getenv("LANG") != "C") {
lang <- unname(desc::desc_get("Language")) %|% "en"
withr::local_language(lang, .local_envir = .envir)
}

withr::local_collate("C", .local_envir = .envir)
}

0 comments on commit 0c16adc

Please sign in to comment.