Skip to content

Commit 43d13d5

Browse files
krlmlrlionel-
andcommitted
Let's try
Co-authored-by: Lionel Henry <[email protected]>
1 parent 9cd230f commit 43d13d5

File tree

1 file changed

+2
-5
lines changed

1 file changed

+2
-5
lines changed

R/local.R

Lines changed: 2 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -134,12 +134,9 @@ local_reproducible_output <- function(width = 80,
134134
)
135135

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

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

0 commit comments

Comments
 (0)