R Under development (unstable) (2023-06-30 r84625 ucrt) -- "Unsuffered Consequences" Copyright (C) 2023 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") [18:01:57.869] plan(): Setting new future strategy stack: [18:01:57.871] List of future strategies: [18:01:57.871] 1. sequential: [18:01:57.871] - args: function (..., envir = parent.frame()) [18:01:57.871] - tweaked: FALSE [18:01:57.871] - call: future::plan("sequential") [18:01:57.903] plan(): nbrOfWorkers() = 1 > library("listenv") > > message("*** Globals - too large ...") *** Globals - too large ... > > ooptsT <- options(future.globals.maxSize = object.size(1:1000) - 1L) > limit <- getOption("future.globals.maxSize") > cat(sprintf("Max total size of globals: %g bytes\n", limit)) Max total size of globals: 4047 bytes > > plan(multisession) [18:01:57.919] plan(): Setting new future strategy stack: [18:01:57.919] List of future strategies: [18:01:57.919] 1. multisession: [18:01:57.919] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:57.919] - tweaked: FALSE [18:01:57.919] - call: plan(multisession) [18:01:57.943] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:01:57.943] multisession: [18:01:57.943] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:01:57.943] - tweaked: FALSE [18:01:57.943] - call: plan(multisession) [18:01:57.949] getGlobalsAndPackages() ... [18:01:57.950] Not searching for globals [18:01:57.950] - globals: [0] [18:01:57.950] getGlobalsAndPackages() ... DONE [18:01:57.951] [local output] makeClusterPSOCK() ... [18:01:58.016] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:01:58.023] [local output] Base port: 38417 [18:01:58.024] [local output] Getting setup options for 2 cluster nodes ... [18:01:58.024] [local output] - Node 1 of 2 ... [18:01:58.025] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:58.026] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpozIZmy/worker.rank=1.parallelly.parent=36556.8ecc73c134f6.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpozIZmy/worker.rank=1.parallelly.parent=36556.8ecc73c134f6.pid\")"' [18:01:58.460] - Possible to infer worker's PID: TRUE [18:01:58.461] [local output] Rscript port: 38417 [18:01:58.462] [local output] - Node 2 of 2 ... [18:01:58.462] [local output] localMachine=TRUE => revtunnel=FALSE [18:01:58.464] [local output] Rscript port: 38417 [18:01:58.464] [local output] Getting setup options for 2 cluster nodes ... done [18:01:58.464] [local output] - Parallel setup requested for some PSOCK nodes [18:01:58.465] [local output] Setting up PSOCK nodes in parallel [18:01:58.466] List of 36 [18:01:58.466] $ worker : chr "localhost" [18:01:58.466] ..- attr(*, "localhost")= logi TRUE [18:01:58.466] $ master : chr "localhost" [18:01:58.466] $ port : int 38417 [18:01:58.466] $ connectTimeout : num 120 [18:01:58.466] $ timeout : num 120 [18:01:58.466] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:01:58.466] $ homogeneous : logi TRUE [18:01:58.466] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=globals,toolarge.R:36556:CRANWIN"| __truncated__ [18:01:58.466] $ rscript_envs : NULL [18:01:58.466] $ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:58.466] $ rscript_startup : NULL [18:01:58.466] $ rscript_sh : chr "cmd" [18:01:58.466] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:58.466] $ methods : logi TRUE [18:01:58.466] $ socketOptions : chr "no-delay" [18:01:58.466] $ useXDR : logi FALSE [18:01:58.466] $ outfile : chr "/dev/null" [18:01:58.466] $ renice : int NA [18:01:58.466] $ rshcmd : NULL [18:01:58.466] $ user : chr(0) [18:01:58.466] $ revtunnel : logi FALSE [18:01:58.466] $ rshlogfile : NULL [18:01:58.466] $ rshopts : chr(0) [18:01:58.466] $ rank : int 1 [18:01:58.466] $ manual : logi FALSE [18:01:58.466] $ dryrun : logi FALSE [18:01:58.466] $ quiet : logi FALSE [18:01:58.466] $ setup_strategy : chr "parallel" [18:01:58.466] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:58.466] $ pidfile : chr "D:/temp/RtmpozIZmy/worker.rank=1.parallelly.parent=36556.8ecc73c134f6.pid" [18:01:58.466] $ rshcmd_label : NULL [18:01:58.466] $ rsh_call : NULL [18:01:58.466] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:01:58.466] $ localMachine : logi TRUE [18:01:58.466] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:01:58.466] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:01:58.466] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:01:58.466] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:01:58.466] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:01:58.466] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [18:01:58.466] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:01:58.466] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:01:58.466] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:01:58.466] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:01:58.466] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:01:58.466] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:01:58.466] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:01:58.466] $ arguments :List of 28 [18:01:58.466] ..$ worker : chr "localhost" [18:01:58.466] ..$ master : NULL [18:01:58.466] ..$ port : int 38417 [18:01:58.466] ..$ connectTimeout : num 120 [18:01:58.466] ..$ timeout : num 120 [18:01:58.466] ..$ rscript : NULL [18:01:58.466] ..$ homogeneous : NULL [18:01:58.466] ..$ rscript_args : NULL [18:01:58.466] ..$ rscript_envs : NULL [18:01:58.466] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c" "D:/RCompile/recent/R/library" [18:01:58.466] ..$ rscript_startup : NULL [18:01:58.466] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [18:01:58.466] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:01:58.466] ..$ methods : logi TRUE [18:01:58.466] ..$ socketOptions : chr "no-delay" [18:01:58.466] ..$ useXDR : logi FALSE [18:01:58.466] ..$ outfile : chr "/dev/null" [18:01:58.466] ..$ renice : int NA [18:01:58.466] ..$ rshcmd : NULL [18:01:58.466] ..$ user : NULL [18:01:58.466] ..$ revtunnel : logi NA [18:01:58.466] ..$ rshlogfile : NULL [18:01:58.466] ..$ rshopts : NULL [18:01:58.466] ..$ rank : int 1 [18:01:58.466] ..$ manual : logi FALSE [18:01:58.466] ..$ dryrun : logi FALSE [18:01:58.466] ..$ quiet : logi FALSE [18:01:58.466] ..$ setup_strategy : chr "parallel" [18:01:58.466] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:01:58.496] [local output] System call to launch all workers: [18:01:58.496] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=globals,toolarge.R:36556:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpozIZmy/worker.rank=1.parallelly.parent=36556.8ecc73c134f6.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmp67Lu9b/RLIBS_19fe819742e2c\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=38417 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:01:58.497] [local output] Starting PSOCK main server [18:01:58.505] [local output] Workers launched [18:01:58.506] [local output] Waiting for workers to connect back [18:01:58.506] - [local output] 0 workers out of 2 ready [18:01:58.673] - [local output] 0 workers out of 2 ready [18:01:58.673] - [local output] 1 workers out of 2 ready [18:01:58.681] - [local output] 1 workers out of 2 ready [18:01:58.682] - [local output] 2 workers out of 2 ready [18:01:58.682] [local output] Launching of workers completed [18:01:58.682] [local output] Collecting session information from workers [18:01:58.683] [local output] - Worker #1 of 2 [18:01:58.684] [local output] - Worker #2 of 2 [18:01:58.684] [local output] makeClusterPSOCK() ... done [18:01:58.700] Packages needed by the future expression (n = 0): [18:01:58.700] Packages needed by future strategies (n = 0): [18:01:58.701] { [18:01:58.701] { [18:01:58.701] { [18:01:58.701] ...future.startTime <- base::Sys.time() [18:01:58.701] { [18:01:58.701] { [18:01:58.701] { [18:01:58.701] { [18:01:58.701] base::local({ [18:01:58.701] has_future <- base::requireNamespace("future", [18:01:58.701] quietly = TRUE) [18:01:58.701] if (has_future) { [18:01:58.701] ns <- base::getNamespace("future") [18:01:58.701] version <- ns[[".package"]][["version"]] [18:01:58.701] if (is.null(version)) [18:01:58.701] version <- utils::packageVersion("future") [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] version <- NULL [18:01:58.701] } [18:01:58.701] if (!has_future || version < "1.8.0") { [18:01:58.701] info <- base::c(r_version = base::gsub("R version ", [18:01:58.701] "", base::R.version$version.string), [18:01:58.701] platform = base::sprintf("%s (%s-bit)", [18:01:58.701] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:01:58.701] os = base::paste(base::Sys.info()[base::c("sysname", [18:01:58.701] "release", "version")], collapse = " "), [18:01:58.701] hostname = base::Sys.info()[["nodename"]]) [18:01:58.701] info <- base::sprintf("%s: %s", base::names(info), [18:01:58.701] info) [18:01:58.701] info <- base::paste(info, collapse = "; ") [18:01:58.701] if (!has_future) { [18:01:58.701] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:01:58.701] info) [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:01:58.701] info, version) [18:01:58.701] } [18:01:58.701] base::stop(msg) [18:01:58.701] } [18:01:58.701] }) [18:01:58.701] } [18:01:58.701] ...future.mc.cores.old <- base::getOption("mc.cores") [18:01:58.701] base::options(mc.cores = 1L) [18:01:58.701] } [18:01:58.701] options(future.plan = NULL) [18:01:58.701] Sys.unsetenv("R_FUTURE_PLAN") [18:01:58.701] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:01:58.701] } [18:01:58.701] ...future.workdir <- getwd() [18:01:58.701] } [18:01:58.701] ...future.oldOptions <- base::as.list(base::.Options) [18:01:58.701] ...future.oldEnvVars <- base::Sys.getenv() [18:01:58.701] } [18:01:58.701] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:01:58.701] future.globals.maxSize = 4047, future.globals.method = NULL, [18:01:58.701] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:01:58.701] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:01:58.701] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:01:58.701] future.stdout.windows.reencode = NULL, width = 80L) [18:01:58.701] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:01:58.701] base::names(...future.oldOptions)) [18:01:58.701] } [18:01:58.701] if (FALSE) { [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] if (TRUE) { [18:01:58.701] ...future.stdout <- base::rawConnection(base::raw(0L), [18:01:58.701] open = "w") [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:01:58.701] windows = "NUL", "/dev/null"), open = "w") [18:01:58.701] } [18:01:58.701] base::sink(...future.stdout, type = "output", split = FALSE) [18:01:58.701] base::on.exit(if (!base::is.null(...future.stdout)) { [18:01:58.701] base::sink(type = "output", split = FALSE) [18:01:58.701] base::close(...future.stdout) [18:01:58.701] }, add = TRUE) [18:01:58.701] } [18:01:58.701] ...future.frame <- base::sys.nframe() [18:01:58.701] ...future.conditions <- base::list() [18:01:58.701] ...future.rng <- base::globalenv()$.Random.seed [18:01:58.701] if (FALSE) { [18:01:58.701] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:01:58.701] "...future.value", "...future.globalenv.names", ".Random.seed") [18:01:58.701] } [18:01:58.701] ...future.result <- base::tryCatch({ [18:01:58.701] base::withCallingHandlers({ [18:01:58.701] ...future.value <- base::withVisible(base::local({ [18:01:58.701] ...future.makeSendCondition <- local({ [18:01:58.701] sendCondition <- NULL [18:01:58.701] function(frame = 1L) { [18:01:58.701] if (is.function(sendCondition)) [18:01:58.701] return(sendCondition) [18:01:58.701] ns <- getNamespace("parallel") [18:01:58.701] if (exists("sendData", mode = "function", [18:01:58.701] envir = ns)) { [18:01:58.701] parallel_sendData <- get("sendData", mode = "function", [18:01:58.701] envir = ns) [18:01:58.701] envir <- sys.frame(frame) [18:01:58.701] master <- NULL [18:01:58.701] while (!identical(envir, .GlobalEnv) && [18:01:58.701] !identical(envir, emptyenv())) { [18:01:58.701] if (exists("master", mode = "list", envir = envir, [18:01:58.701] inherits = FALSE)) { [18:01:58.701] master <- get("master", mode = "list", [18:01:58.701] envir = envir, inherits = FALSE) [18:01:58.701] if (inherits(master, c("SOCKnode", [18:01:58.701] "SOCK0node"))) { [18:01:58.701] sendCondition <<- function(cond) { [18:01:58.701] data <- list(type = "VALUE", value = cond, [18:01:58.701] success = TRUE) [18:01:58.701] parallel_sendData(master, data) [18:01:58.701] } [18:01:58.701] return(sendCondition) [18:01:58.701] } [18:01:58.701] } [18:01:58.701] frame <- frame + 1L [18:01:58.701] envir <- sys.frame(frame) [18:01:58.701] } [18:01:58.701] } [18:01:58.701] sendCondition <<- function(cond) NULL [18:01:58.701] } [18:01:58.701] }) [18:01:58.701] withCallingHandlers({ [18:01:58.701] NA [18:01:58.701] }, immediateCondition = function(cond) { [18:01:58.701] sendCondition <- ...future.makeSendCondition() [18:01:58.701] sendCondition(cond) [18:01:58.701] muffleCondition <- function (cond, pattern = "^muffle") [18:01:58.701] { [18:01:58.701] inherits <- base::inherits [18:01:58.701] invokeRestart <- base::invokeRestart [18:01:58.701] is.null <- base::is.null [18:01:58.701] muffled <- FALSE [18:01:58.701] if (inherits(cond, "message")) { [18:01:58.701] muffled <- grepl(pattern, "muffleMessage") [18:01:58.701] if (muffled) [18:01:58.701] invokeRestart("muffleMessage") [18:01:58.701] } [18:01:58.701] else if (inherits(cond, "warning")) { [18:01:58.701] muffled <- grepl(pattern, "muffleWarning") [18:01:58.701] if (muffled) [18:01:58.701] invokeRestart("muffleWarning") [18:01:58.701] } [18:01:58.701] else if (inherits(cond, "condition")) { [18:01:58.701] if (!is.null(pattern)) { [18:01:58.701] computeRestarts <- base::computeRestarts [18:01:58.701] grepl <- base::grepl [18:01:58.701] restarts <- computeRestarts(cond) [18:01:58.701] for (restart in restarts) { [18:01:58.701] name <- restart$name [18:01:58.701] if (is.null(name)) [18:01:58.701] next [18:01:58.701] if (!grepl(pattern, name)) [18:01:58.701] next [18:01:58.701] invokeRestart(restart) [18:01:58.701] muffled <- TRUE [18:01:58.701] break [18:01:58.701] } [18:01:58.701] } [18:01:58.701] } [18:01:58.701] invisible(muffled) [18:01:58.701] } [18:01:58.701] muffleCondition(cond) [18:01:58.701] }) [18:01:58.701] })) [18:01:58.701] future::FutureResult(value = ...future.value$value, [18:01:58.701] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:01:58.701] ...future.rng), globalenv = if (FALSE) [18:01:58.701] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:01:58.701] ...future.globalenv.names)) [18:01:58.701] else NULL, started = ...future.startTime, version = "1.8") [18:01:58.701] }, condition = base::local({ [18:01:58.701] c <- base::c [18:01:58.701] inherits <- base::inherits [18:01:58.701] invokeRestart <- base::invokeRestart [18:01:58.701] length <- base::length [18:01:58.701] list <- base::list [18:01:58.701] seq.int <- base::seq.int [18:01:58.701] signalCondition <- base::signalCondition [18:01:58.701] sys.calls <- base::sys.calls [18:01:58.701] `[[` <- base::`[[` [18:01:58.701] `+` <- base::`+` [18:01:58.701] `<<-` <- base::`<<-` [18:01:58.701] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:01:58.701] calls[seq.int(from = from + 12L, to = length(calls) - [18:01:58.701] 3L)] [18:01:58.701] } [18:01:58.701] function(cond) { [18:01:58.701] is_error <- inherits(cond, "error") [18:01:58.701] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:01:58.701] NULL) [18:01:58.701] if (is_error) { [18:01:58.701] sessionInformation <- function() { [18:01:58.701] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:01:58.701] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:01:58.701] search = base::search(), system = base::Sys.info()) [18:01:58.701] } [18:01:58.701] ...future.conditions[[length(...future.conditions) + [18:01:58.701] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:01:58.701] cond$call), session = sessionInformation(), [18:01:58.701] timestamp = base::Sys.time(), signaled = 0L) [18:01:58.701] signalCondition(cond) [18:01:58.701] } [18:01:58.701] else if (!ignore && TRUE && inherits(cond, c("condition", [18:01:58.701] "immediateCondition"))) { [18:01:58.701] signal <- TRUE && inherits(cond, "immediateCondition") [18:01:58.701] ...future.conditions[[length(...future.conditions) + [18:01:58.701] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:01:58.701] if (TRUE && !signal) { [18:01:58.701] muffleCondition <- function (cond, pattern = "^muffle") [18:01:58.701] { [18:01:58.701] inherits <- base::inherits [18:01:58.701] invokeRestart <- base::invokeRestart [18:01:58.701] is.null <- base::is.null [18:01:58.701] muffled <- FALSE [18:01:58.701] if (inherits(cond, "message")) { [18:01:58.701] muffled <- grepl(pattern, "muffleMessage") [18:01:58.701] if (muffled) [18:01:58.701] invokeRestart("muffleMessage") [18:01:58.701] } [18:01:58.701] else if (inherits(cond, "warning")) { [18:01:58.701] muffled <- grepl(pattern, "muffleWarning") [18:01:58.701] if (muffled) [18:01:58.701] invokeRestart("muffleWarning") [18:01:58.701] } [18:01:58.701] else if (inherits(cond, "condition")) { [18:01:58.701] if (!is.null(pattern)) { [18:01:58.701] computeRestarts <- base::computeRestarts [18:01:58.701] grepl <- base::grepl [18:01:58.701] restarts <- computeRestarts(cond) [18:01:58.701] for (restart in restarts) { [18:01:58.701] name <- restart$name [18:01:58.701] if (is.null(name)) [18:01:58.701] next [18:01:58.701] if (!grepl(pattern, name)) [18:01:58.701] next [18:01:58.701] invokeRestart(restart) [18:01:58.701] muffled <- TRUE [18:01:58.701] break [18:01:58.701] } [18:01:58.701] } [18:01:58.701] } [18:01:58.701] invisible(muffled) [18:01:58.701] } [18:01:58.701] muffleCondition(cond, pattern = "^muffle") [18:01:58.701] } [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] if (TRUE) { [18:01:58.701] muffleCondition <- function (cond, pattern = "^muffle") [18:01:58.701] { [18:01:58.701] inherits <- base::inherits [18:01:58.701] invokeRestart <- base::invokeRestart [18:01:58.701] is.null <- base::is.null [18:01:58.701] muffled <- FALSE [18:01:58.701] if (inherits(cond, "message")) { [18:01:58.701] muffled <- grepl(pattern, "muffleMessage") [18:01:58.701] if (muffled) [18:01:58.701] invokeRestart("muffleMessage") [18:01:58.701] } [18:01:58.701] else if (inherits(cond, "warning")) { [18:01:58.701] muffled <- grepl(pattern, "muffleWarning") [18:01:58.701] if (muffled) [18:01:58.701] invokeRestart("muffleWarning") [18:01:58.701] } [18:01:58.701] else if (inherits(cond, "condition")) { [18:01:58.701] if (!is.null(pattern)) { [18:01:58.701] computeRestarts <- base::computeRestarts [18:01:58.701] grepl <- base::grepl [18:01:58.701] restarts <- computeRestarts(cond) [18:01:58.701] for (restart in restarts) { [18:01:58.701] name <- restart$name [18:01:58.701] if (is.null(name)) [18:01:58.701] next [18:01:58.701] if (!grepl(pattern, name)) [18:01:58.701] next [18:01:58.701] invokeRestart(restart) [18:01:58.701] muffled <- TRUE [18:01:58.701] break [18:01:58.701] } [18:01:58.701] } [18:01:58.701] } [18:01:58.701] invisible(muffled) [18:01:58.701] } [18:01:58.701] muffleCondition(cond, pattern = "^muffle") [18:01:58.701] } [18:01:58.701] } [18:01:58.701] } [18:01:58.701] })) [18:01:58.701] }, error = function(ex) { [18:01:58.701] base::structure(base::list(value = NULL, visible = NULL, [18:01:58.701] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:01:58.701] ...future.rng), started = ...future.startTime, [18:01:58.701] finished = Sys.time(), session_uuid = NA_character_, [18:01:58.701] version = "1.8"), class = "FutureResult") [18:01:58.701] }, finally = { [18:01:58.701] if (!identical(...future.workdir, getwd())) [18:01:58.701] setwd(...future.workdir) [18:01:58.701] { [18:01:58.701] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:01:58.701] ...future.oldOptions$nwarnings <- NULL [18:01:58.701] } [18:01:58.701] base::options(...future.oldOptions) [18:01:58.701] if (.Platform$OS.type == "windows") { [18:01:58.701] old_names <- names(...future.oldEnvVars) [18:01:58.701] envs <- base::Sys.getenv() [18:01:58.701] names <- names(envs) [18:01:58.701] common <- intersect(names, old_names) [18:01:58.701] added <- setdiff(names, old_names) [18:01:58.701] removed <- setdiff(old_names, names) [18:01:58.701] changed <- common[...future.oldEnvVars[common] != [18:01:58.701] envs[common]] [18:01:58.701] NAMES <- toupper(changed) [18:01:58.701] args <- list() [18:01:58.701] for (kk in seq_along(NAMES)) { [18:01:58.701] name <- changed[[kk]] [18:01:58.701] NAME <- NAMES[[kk]] [18:01:58.701] if (name != NAME && is.element(NAME, old_names)) [18:01:58.701] next [18:01:58.701] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:58.701] } [18:01:58.701] NAMES <- toupper(added) [18:01:58.701] for (kk in seq_along(NAMES)) { [18:01:58.701] name <- added[[kk]] [18:01:58.701] NAME <- NAMES[[kk]] [18:01:58.701] if (name != NAME && is.element(NAME, old_names)) [18:01:58.701] next [18:01:58.701] args[[name]] <- "" [18:01:58.701] } [18:01:58.701] NAMES <- toupper(removed) [18:01:58.701] for (kk in seq_along(NAMES)) { [18:01:58.701] name <- removed[[kk]] [18:01:58.701] NAME <- NAMES[[kk]] [18:01:58.701] if (name != NAME && is.element(NAME, old_names)) [18:01:58.701] next [18:01:58.701] args[[name]] <- ...future.oldEnvVars[[name]] [18:01:58.701] } [18:01:58.701] if (length(args) > 0) [18:01:58.701] base::do.call(base::Sys.setenv, args = args) [18:01:58.701] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:01:58.701] } [18:01:58.701] { [18:01:58.701] if (base::length(...future.futureOptionsAdded) > [18:01:58.701] 0L) { [18:01:58.701] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:01:58.701] base::names(opts) <- ...future.futureOptionsAdded [18:01:58.701] base::options(opts) [18:01:58.701] } [18:01:58.701] { [18:01:58.701] { [18:01:58.701] base::options(mc.cores = ...future.mc.cores.old) [18:01:58.701] NULL [18:01:58.701] } [18:01:58.701] options(future.plan = NULL) [18:01:58.701] if (is.na(NA_character_)) [18:01:58.701] Sys.unsetenv("R_FUTURE_PLAN") [18:01:58.701] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:01:58.701] future::plan(list(function (..., workers = availableCores(), [18:01:58.701] lazy = FALSE, rscript_libs = .libPaths(), [18:01:58.701] envir = parent.frame()) [18:01:58.701] { [18:01:58.701] if (is.function(workers)) [18:01:58.701] workers <- workers() [18:01:58.701] workers <- structure(as.integer(workers), [18:01:58.701] class = class(workers)) [18:01:58.701] stop_if_not(length(workers) == 1, is.finite(workers), [18:01:58.701] workers >= 1) [18:01:58.701] if (workers == 1L && !inherits(workers, "AsIs")) { [18:01:58.701] return(sequential(..., lazy = TRUE, envir = envir)) [18:01:58.701] } [18:01:58.701] future <- MultisessionFuture(..., workers = workers, [18:01:58.701] lazy = lazy, rscript_libs = rscript_libs, [18:01:58.701] envir = envir) [18:01:58.701] if (!future$lazy) [18:01:58.701] future <- run(future) [18:01:58.701] invisible(future) [18:01:58.701] }), .cleanup = FALSE, .init = FALSE) [18:01:58.701] } [18:01:58.701] } [18:01:58.701] } [18:01:58.701] }) [18:01:58.701] if (TRUE) { [18:01:58.701] base::sink(type = "output", split = FALSE) [18:01:58.701] if (TRUE) { [18:01:58.701] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:01:58.701] } [18:01:58.701] else { [18:01:58.701] ...future.result["stdout"] <- base::list(NULL) [18:01:58.701] } [18:01:58.701] base::close(...future.stdout) [18:01:58.701] ...future.stdout <- NULL [18:01:58.701] } [18:01:58.701] ...future.result$conditions <- ...future.conditions [18:01:58.701] ...future.result$finished <- base::Sys.time() [18:01:58.701] ...future.result [18:01:58.701] } [18:01:58.787] MultisessionFuture started [18:01:58.787] result() for ClusterFuture ... [18:01:58.788] receiveMessageFromWorker() for ClusterFuture ... [18:01:58.788] - Validating connection of MultisessionFuture [18:01:58.846] - received message: FutureResult [18:01:58.846] - Received FutureResult [18:01:58.850] - Erased future from FutureRegistry [18:01:58.850] result() for ClusterFuture ... [18:01:58.850] - result already collected: FutureResult [18:01:58.851] result() for ClusterFuture ... done [18:01:58.851] receiveMessageFromWorker() for ClusterFuture ... done [18:01:58.851] result() for ClusterFuture ... done [18:01:58.851] result() for ClusterFuture ... [18:01:58.851] - result already collected: FutureResult [18:01:58.852] result() for ClusterFuture ... done [18:01:58.852] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:01:58.855] plan(): nbrOfWorkers() = 2 > > exprs <- list( + A = substitute({ a }, env = list()), + B = substitute({ a * b }, env = list()), + C = substitute({ a * b * c }, env = list()), + D = substitute({ a * b * c * d }, env = list()), + E = substitute({ a * b * c * d * e }, env = list()) + ) > > a <- 1:1000 > b <- 1:900 > c <- 1:800 > d <- 1:700 > e <- 1 > > for (name in names(exprs)) { + message(sprintf("Expression %s:", name)) + expr <- exprs[[name]] + print(expr) + res <- tryCatch({ + f <- future(expr, substitute = FALSE) + }, error = function(ex) ex) + print(res) + stopifnot(inherits(res, "error")) + msg <- conditionMessage(res) + stopifnot(grepl("exceeds the maximum allowed size", msg)) + } Expression A: { a } [18:01:58.865] getGlobalsAndPackages() ... [18:01:58.865] Searching for globals... [18:01:58.870] - globals found: [2] '{', 'a' [18:01:58.870] Searching for globals ... DONE [18:01:58.871] Resolving globals: FALSE [18:01:58.872] The total size of the 1 globals is 3.95 KiB (4048 bytes) [18:01:58.873] The total size of the 1 globals exported for future expression ('{; a; }') is 3.95 KiB.. This exceeds the maximum allowed size of 3.95 KiB (option 'future.globals.maxSize'). There is one global: 'a' (3.95 KiB of class 'numeric') Expression B: { a * b } [18:01:58.873] getGlobalsAndPackages() ... [18:01:58.874] Searching for globals... [18:01:58.879] - globals found: [4] '{', '*', 'a', 'b' [18:01:58.879] Searching for globals ... DONE [18:01:58.879] Resolving globals: FALSE [18:01:58.880] The total size of the 2 globals is 7.52 KiB (7696 bytes) [18:01:58.881] The total size of the 2 globals exported for future expression ('{; a * b; }') is 7.52 KiB.. This exceeds the maximum allowed size of 3.95 KiB (option 'future.globals.maxSize'). There are two globals: 'a' (3.95 KiB of class 'numeric') and 'b' (3.56 KiB of class 'numeric') Expression C: { a * b * c } [18:01:58.881] getGlobalsAndPackages() ... [18:01:58.881] Searching for globals... [18:01:58.887] - globals found: [5] '{', '*', 'a', 'b', 'c' [18:01:58.887] Searching for globals ... DONE [18:01:58.887] Resolving globals: FALSE [18:01:58.888] The total size of the 3 globals is 10.69 KiB (10944 bytes) [18:01:58.888] The total size of the 3 globals exported for future expression ('{; a * b * c; }') is 10.69 KiB.. This exceeds the maximum allowed size of 3.95 KiB (option 'future.globals.maxSize'). There are three globals: 'a' (3.95 KiB of class 'numeric'), 'b' (3.56 KiB of class 'numeric') and 'c' (3.17 KiB of class 'numeric') Expression D: { a * b * c * d } [18:01:58.889] getGlobalsAndPackages() ... [18:01:58.889] Searching for globals... [18:01:58.890] - globals found: [6] '{', '*', 'a', 'b', 'c', 'd' [18:01:58.891] Searching for globals ... DONE [18:01:58.891] Resolving globals: FALSE [18:01:58.892] The total size of the 4 globals is 13.47 KiB (13792 bytes) [18:01:58.892] The total size of the 4 globals exported for future expression ('{; a * b * c * d; }') is 13.47 KiB.. This exceeds the maximum allowed size of 3.95 KiB (option 'future.globals.maxSize'). The three largest globals are 'a' (3.95 KiB of class 'numeric'), 'b' (3.56 KiB of class 'numeric') and 'c' (3.17 KiB of class 'numeric') Expression E: { a * b * c * d * e } [18:01:58.893] getGlobalsAndPackages() ... [18:01:58.893] Searching for globals... [18:01:58.894] - globals found: [7] '{', '*', 'a', 'b', 'c', 'd', 'e' [18:01:58.895] Searching for globals ... DONE [18:01:58.895] Resolving globals: FALSE [18:01:58.895] The total size of the 5 globals is 13.52 KiB (13848 bytes) [18:01:58.896] The total size of the 5 globals exported for future expression ('{; a * b * c * d * e; }') is 13.52 KiB.. This exceeds the maximum allowed size of 3.95 KiB (option 'future.globals.maxSize'). The three largest globals are 'a' (3.95 KiB of class 'numeric'), 'b' (3.56 KiB of class 'numeric') and 'c' (3.17 KiB of class 'numeric') > > message("*** Globals - too large ... DONE") *** Globals - too large ... DONE > > source("incl/end.R") [18:01:58.897] plan(): Setting new future strategy stack: [18:01:58.898] List of future strategies: [18:01:58.898] 1. FutureStrategy: [18:01:58.898] - args: function (..., envir = parent.frame()) [18:01:58.898] - tweaked: FALSE [18:01:58.898] - call: future::plan(oplan) [18:01:58.899] plan(): nbrOfWorkers() = 1 Failed to undo environment variables: - Expected environment variables: [n=201] '!ExitCode', 'ALLUSERSPROFILE', 'APPDATA', 'BIBINPUTS', 'BINDIR', 'BSTINPUTS', 'COMMONPROGRAMFILES', 'COMPUTERNAME', 'COMSPEC', 'CURL_CA_BUNDLE', 'CYGWIN', 'CommonProgramFiles(x86)', 'CommonProgramW6432', 'DriverData', 'HOME', 'HOMEDRIVE', 'HOMEPATH', 'JAGS_ROOT', 'JAVA_HOME', 'LANGUAGE', 'LC_COLLATE', 'LC_MONETARY', 'LC_TIME', 'LOCALAPPDATA', 'LOGONSERVER', 'LS_HOME', 'LS_LICENSE_PATH', 'MAKE', 'MAKEFLAGS', 'MAKELEVEL', 'MFLAGS', 'MSMPI_BENCHMARKS', 'MSMPI_BIN', 'MSYS2_ENV_CONV_EXCL', 'NUMBER_OF_PROCESSORS', 'OMP_THREAD_LIMIT', 'OS', 'PATH', 'PATHEXT', 'PROCESSOR_ARCHITECTURE', 'PROCESSOR_IDENTIFIER', 'PROCESSOR_LEVEL', 'PROCESSOR_REVISION', 'PROGRAMFILES', 'PROMPT', 'PSModulePath', 'PUBLIC', 'PWD', 'ProgramData', 'ProgramFiles(x86)', 'ProgramW6432', 'RETICULATE_AUTOCONFIGURE', 'RTOOLS43_HOME', 'R_ARCH', 'R_BROWSER', 'R_BZIPCMD', 'R_CMD', 'R_COMPILED_BY', 'R_CRAN_WEB', 'R_CUSTOM_TOOLS_PATH', 'R_CUSTOM_TOOLS_SOFT', 'R_DOC_DIR', 'R_ENVIRON_USER', 'R_GSCMD', 'R_GZIPCMD', 'R_HOME', 'R_INCLUDE_DIR', 'R_INSTALL_TAR', 'R_LIBS', 'R_LIBS_SITE', 'R_LIBS_USER', 'R_MAX_NUM_DLLS', 'R_OSTYPE', 'R_PAPERSIZE', 'R_PAPERSIZE_USER', 'R_PARALLELLY_MAKENODEPSOCK_AUTOKILL', 'R_PARALLELLY_MAKENODEPSOCK_CONNECTTIMEOUT', 'R_PARALLELLY_MAKENODEPSOCK_RSCRIPT_LABEL', 'R_PARALLELLY_MAKENODEPSOCK_SESSIONINFO_PKGS', 'R_PARALLELLY_MAKENODEPSOCK_TIMEOUT', 'R_PARALLELLY_RANDOM_PORTS', 'R_PARALLEL_PORT', 'R_RD4PDF', 'R_RTOOLS43_PATH', 'R_SCRIPT_LEGACY', 'R_SHARE_DIR', 'R_TESTS', 'R_UNZIPCMD', 'R_USER', 'R_VERSION', 'R_ZIPCMD', 'SED', 'SHLVL', 'SYSTEMDRIVE', 'SYSTEMROOT', 'TAR', 'TAR_OPTIONS', 'TEMP', 'TERM', 'TEXINPUTS', 'TMP', 'TMPDIR', 'USERDOMAIN', 'USERDOMAIN_ROAMINGPROFILE', 'USERNAME', 'USERPROFILE', 'WINDIR', '_', '_R_CHECK_AUTOCONF_', '_R_CHECK_BOGUS_RETURN_', '_R_CHECK_BROWSER_NONINTERACTIVE_', '_R_CHECK_BUILD_VIGNETTES_SEPARATELY_', '_R_CHECK_CODETOOLS_PROFILE_', '_R_CHECK_CODE_ASSIGN_TO_GLOBALENV_', '_R_CHECK_CODE_ATTACH_', '_R_CHECK_CODE_CLASS_IS_STRING_', '_R_CHECK_CODE_DATA_INTO_GLOBALENV_', '_R_CHECK_CODE_USAGE_VIA_NAMESPACES_', '_R_CHECK_CODE_USAGE_WITHOUT_LOADING_', '_R_CHECK_CODE_USAGE_WITH_ONLY_BASE_ATTACHED_', '_R_CHECK_CODOC_VARIABLES_IN_USAGES_', '_R_CHECK_COMPACT_DATA2_', '_R_CHECK_COMPILATION_FLAGS_', '_R_CHECK_CONNECTIONS_LEFT_OPEN_', '_R_CHECK_CRAN_INCOMING_', '_R_CHECK_CRAN_INCOMING_CHECK_FILE_URIS_', '_R_CHECK_CRAN_INCOMING_CHECK_URLS_IN_PARALLEL_', '_R_CHECK_CRAN_INCOMING_NOTE_GNU_MAKE_', '_R_CHECK_CRAN_INCOMING_REMOTE_', '_R_CHECK_CRAN_INCOMING_USE_ASPELL_', '_R_CHECK_DATALIST_', '_R_CHECK_DEPRECATED_DEFUNCT_', '_R_CHECK_DOC_SIZES2_', '_R_CHECK_DOT_FIRSTLIB_', '_R_CHECK_DOT_INTERNAL_', '_R_CHECK_EXAMPLE_TIMING_THRESHOLD_', '_R_CHECK_EXECUTABLES_', '_R_CHECK_EXECUTABLES_EXCLUSIONS_', '_R_CHECK_FF_CALLS_', '_R_CHECK_FF_DUP_', '_R_CHECK_FORCE_SUGGESTS_', '_R_CHECK_FUTURE_FILE_TIMESTAMPS_', '_R_CHECK_FUTURE_FILE_TIMESTAMPS_LEEWAY_', '_R_CHECK_HAVE_MYSQL_', '_R_CHECK_HAVE_ODBC_', '_R_CHECK_HAVE_PERL_', '_R_CHECK_HAVE_POSTGRES_', '_R_CHECK_INSTALL_DEPENDS_', '_R_CHECK_INTERNALS2_', '_R_CHECK_LENGTH_1_CONDITION_', '_R_CHECK_LICENSE_', '_R_CHECK_LIMIT_CORES_', '_R_CHECK_MATRIX_DATA_', '_R_CHECK_NATIVE_ROUTINE_REGISTRATION_', '_R_CHECK_NEWS_IN_PLAIN_TEXT_', '_R_CHECK_NO_RECOMMENDED_', '_R_CHECK_NO_STOP_ON_TEST_ERROR_', '_R_CHECK_ORPHANED_', '_R_CHECK_OVERWRITE_REGISTERED_S3_METHODS_', '_R_CHECK_PACKAGES_USED_IGNORE_UNUSED_IMPORTS_', '_R_CHECK_PACKAGES_USED_IN_TESTS_USE_SUBDIRS_', '_R_CHECK_PACKAGE_DATASETS_SUPPRESS_NOTES_', '_R_CHECK_PACKAGE_NAME_', '_R_CHECK_PKG_SIZES_', '_R_CHECK_PKG_SIZES_THRESHOLD_', '_R_CHECK_PRAGMAS_', '_R_CHECK_RD_EXAMPLES_T_AND_F_', '_R_CHECK_RD_LINE_WIDTHS_', '_R_CHECK_RD_MATH_RENDERING_', '_R_CHECK_RD_VALIDATE_RD2HTML_', '_R_CHECK_REPLACING_IMPORTS_', '_R_CHECK_R_DEPENDS_', '_R_CHECK_S3_METHODS_SHOW_POSSIBLE_ISSUES_', '_R_CHECK_SCREEN_DEVICE_', '_R_CHECK_SERIALIZATION_', '_R_CHECK_SHLIB_OPENMP_FLAGS_', '_R_CHECK_SRC_MINUS_W_IMPLICIT_', '_R_CHECK_SUBDIRS_NOCASE_', '_R_CHECK_SUBDIRS_STRICT_', '_R_CHECK_SUGGESTS_ONLY_', '_R_CHECK_SYSTEM_CLOCK_', '_R_CHECK_TESTS_NLINES_', '_R_CHECK_TEST_TIMING_', '_R_CHECK_TIMINGS_', '_R_CHECK_TOPLEVEL_FILES_', '_R_CHECK_UNDOC_USE_ALL_NAMES_', '_R_CHECK_UNSAFE_CALLS_', '_R_CHECK_URLS_SHOW_301_STATUS_', '_R_CHECK_VC_DIRS_', '_R_CHECK_VIGNETTES_NLINES_', '_R_CHECK_VIGNETTES_SKIP_RUN_MAYBE_', '_R_CHECK_VIGNETTE_TIMING_', '_R_CHECK_VIGNETTE_TITLES_', '_R_CHECK_WINDOWS_DEVICE_', '_R_CHECK_XREFS_USE_ALIASES_FROM_CRAN_', '_R_CLASS_MATRIX_ARRAY_', '_R_INSTALL_TIME_PATCHES_', '_R_S3_METHOD_LOOKUP_BASEENV_AFTER_GLOBALENV_', '_R_SHLIB_BUILD_OBJECTS_SYMBOL_TABLES_', 'maj.version', 'nextArg--timingsnextArg--install' - Environment variables still there: [n=0] - Environment variables missing: [n=1] 'MAKEFLAGS' Differences environment variable by environment variable: List of 3 $ name : chr "MAKEFLAGS" $ expected: 'Dlist' chr "" $ actual : 'Dlist' chr NA > > proc.time() user system elapsed 0.53 0.10 1.36