We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 3d47402 commit 9cd230fCopy full SHA for 9cd230f
R/local.R
@@ -134,10 +134,12 @@ local_reproducible_output <- function(width = 80,
134
)
135
136
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"))) {
141
withr::local_language(lang, .local_envir = .env)
142
}
- withr::local_envvar(c(LC_ALL = "en_GB"), .local_envir = .env)
143
144
145
withr::local_collate("C", .local_envir = .env)
0 commit comments