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 9b78aee commit 3d47402Copy full SHA for 3d47402
R/local.R
@@ -133,8 +133,11 @@ local_reproducible_output <- function(width = 80,
133
.local_envir = .env
134
)
135
136
- if (isTRUE(capabilities("NLS")) && !(Sys.getenv("LANG") %in% c("C", "C.UTF-8"))) {
137
- withr::local_language(lang, .local_envir = .env)
+ if (isTRUE(capabilities("NLS"))) {
+ if (!(Sys.getenv("LANG") %in% c("C", "C.UTF-8"))) {
138
+ withr::local_language(lang, .local_envir = .env)
139
+ }
140
+ withr::local_envvar(c(LC_ALL = "en_GB"), .local_envir = .env)
141
}
142
143
withr::local_collate("C", .local_envir = .env)
0 commit comments