Skip to content

Commit

Permalink
Let's try
Browse files Browse the repository at this point in the history
Co-authored-by: Lionel Henry <[email protected]>
  • Loading branch information
krlmlr and lionel- committed Oct 28, 2024
1 parent 9cd230f commit 43d13d5
Showing 1 changed file with 2 additions and 5 deletions.
7 changes: 2 additions & 5 deletions R/local.R
Original file line number Diff line number Diff line change
Expand Up @@ -134,12 +134,9 @@ local_reproducible_output <- function(width = 80,
)

if (isTRUE(capabilities("NLS"))) {
# FIXME: We need a new `locale` argument here, should be consistent
# with the `lang` argument to `local_reproducible_output()`
withr::local_envvar(c(LC_ALL = "en_GB"), .local_envir = .env)
if (!(Sys.getenv("LANG") %in% c("C", "C.UTF-8"))) {
suppressWarnings(
withr::local_language(lang, .local_envir = .env)
}
)
}

withr::local_collate("C", .local_envir = .env)
Expand Down

0 comments on commit 43d13d5

Please sign in to comment.