@@ -170,7 +170,8 @@ skip_on_cran <- function() {
170170
171171# ' @export
172172# ' @param os Character vector of one or more operating systems to skip on.
173- # ' Supported values are `"windows"`, `"mac"`, `"linux"`, and `"solaris"`.
173+ # ' Supported values are `"windows"`, `"mac"`, `"linux"`, `"solaris"`,
174+ # ' and `"emscripten"`.
174175# ' @param arch Character vector of one or more architectures to skip on.
175176# ' Common values include `"i386"` (32 bit), `"x86_64"` (64 bit), and
176177# ' `"aarch64"` (M1 mac). Supplying `arch` makes the test stricter; i.e. both
@@ -179,15 +180,16 @@ skip_on_cran <- function() {
179180skip_on_os <- function (os , arch = NULL ) {
180181 os <- match.arg(
181182 os ,
182- choices = c(" windows" , " mac" , " linux" , " solaris" ),
183+ choices = c(" windows" , " mac" , " linux" , " solaris" , " emscripten " ),
183184 several.ok = TRUE
184185 )
185186
186187 msg <- switch (system_os(),
187188 windows = if (" windows" %in% os ) " On Windows" ,
188189 darwin = if (" mac" %in% os ) " On Mac" ,
189190 linux = if (" linux" %in% os ) " On Linux" ,
190- sunos = if (" solaris" %in% os ) " On Solaris"
191+ sunos = if (" solaris" %in% os ) " On Solaris" ,
192+ emscripten = if (" emscripten" %in% os ) " On Emscripten"
191193 )
192194
193195 if (! is.null(arch ) && ! is.null(msg )) {
0 commit comments