File tree Expand file tree Collapse file tree 2 files changed +14
-8
lines changed Expand file tree Collapse file tree 2 files changed +14
-8
lines changed Original file line number Diff line number Diff line change @@ -368,3 +368,5 @@ pkg_url_bug <- function(pkg) {
368368
369369 NULL
370370}
371+
372+ is_windows <- tolower(.Platform $ OS.type ) == " windows"
Original file line number Diff line number Diff line change @@ -417,16 +417,20 @@ test_that("env_poke() zaps (#1012)", {
417417})
418418
419419test_that(" env_poke() doesn't warn when unrepresentable characters are serialised" , {
420- with_non_utf8_locale( {
421- e <- env(empty_env() )
422- nm <- get_alien_lang_string()
420+ if ( is_windows && getRversion() < " 4.2 " ) {
421+ return ( )
422+ }
423423
424- expect_no_warning(env_poke(e , nm , NA ))
424+ with_non_utf8_locale({
425+ e <- env(empty_env())
426+ nm <- get_alien_lang_string()
425427
426- skip_if_no_utf8_marker()
427- nms <- env_names(e )
428- expect_equal(Encoding(nms ), " UTF-8" )
429- })
428+ expect_no_warning(env_poke(e , nm , NA ))
429+
430+ skip_if_no_utf8_marker()
431+ nms <- env_names(e )
432+ expect_equal(Encoding(nms ), " UTF-8" )
433+ })
430434})
431435
432436test_that(" new_environment() supports non-list data" , {
You can’t perform that action at this time.
0 commit comments