Skip to content

Commit 9cd230f

Browse files
krlmlrlionel-
authored andcommitted
Set LC_ALL first?
1 parent 3d47402 commit 9cd230f

File tree

1 file changed

+3
-1
lines changed

1 file changed

+3
-1
lines changed

R/local.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -134,10 +134,12 @@ 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)
137140
if (!(Sys.getenv("LANG") %in% c("C", "C.UTF-8"))) {
138141
withr::local_language(lang, .local_envir = .env)
139142
}
140-
withr::local_envvar(c(LC_ALL = "en_GB"), .local_envir = .env)
141143
}
142144

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

0 commit comments

Comments
 (0)