R Under development (unstable) (2024-07-28 r86931 ucrt) -- "Unsuffered Consequences" Copyright (C) 2024 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") [17:27:19.091] plan(): Setting new future strategy stack: [17:27:19.093] List of future strategies: [17:27:19.093] 1. sequential: [17:27:19.093] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.093] - tweaked: FALSE [17:27:19.093] - call: future::plan("sequential") [17:27:19.119] plan(): nbrOfWorkers() = 1 > > message("*** futureAssign() ...") *** futureAssign() ... > > message("*** futureAssign() - sequential w/ lazy evaluation ...") *** futureAssign() - sequential w/ lazy evaluation ... > > delayedAssign("a", { + cat("Delayed assignment evaluated\n") + 1 + }) > > futureAssign("b", { + cat("Future assignment evaluated\n") + 2 + }, lazy = TRUE) [17:27:19.131] getGlobalsAndPackages() ... [17:27:19.132] Searching for globals... [17:27:19.143] - globals found: [2] '{', 'cat' [17:27:19.143] Searching for globals ... DONE [17:27:19.143] Resolving globals: FALSE [17:27:19.144] [17:27:19.145] [17:27:19.145] getGlobalsAndPackages() ... DONE > > ## Because "lazy future" is used, the expression/value > ## for 'b' will not be resolved at the point. For other > ## types of futures, it may already have been resolved > cat(sprintf("b = %s\n", b)) [17:27:19.147] run() for 'Future' ... [17:27:19.147] - state: 'created' [17:27:19.148] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.148] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.149] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.149] - Field: 'label' [17:27:19.149] - Field: 'local' [17:27:19.150] - Field: 'owner' [17:27:19.150] - Field: 'envir' [17:27:19.150] - Field: 'packages' [17:27:19.150] - Field: 'gc' [17:27:19.151] - Field: 'conditions' [17:27:19.151] - Field: 'expr' [17:27:19.151] - Field: 'uuid' [17:27:19.152] - Field: 'seed' [17:27:19.152] - Field: 'version' [17:27:19.152] - Field: 'result' [17:27:19.153] - Field: 'asynchronous' [17:27:19.153] - Field: 'calls' [17:27:19.153] - Field: 'globals' [17:27:19.153] - Field: 'stdout' [17:27:19.154] - Field: 'earlySignal' [17:27:19.154] - Field: 'lazy' [17:27:19.154] - Field: 'state' [17:27:19.155] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.155] - Launch lazy future ... [17:27:19.160] Packages needed by the future expression (n = 0): [17:27:19.160] Packages needed by future strategies (n = 0): [17:27:19.162] { [17:27:19.162] { [17:27:19.162] { [17:27:19.162] ...future.startTime <- base::Sys.time() [17:27:19.162] { [17:27:19.162] { [17:27:19.162] { [17:27:19.162] base::local({ [17:27:19.162] has_future <- base::requireNamespace("future", [17:27:19.162] quietly = TRUE) [17:27:19.162] if (has_future) { [17:27:19.162] ns <- base::getNamespace("future") [17:27:19.162] version <- ns[[".package"]][["version"]] [17:27:19.162] if (is.null(version)) [17:27:19.162] version <- utils::packageVersion("future") [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] version <- NULL [17:27:19.162] } [17:27:19.162] if (!has_future || version < "1.8.0") { [17:27:19.162] info <- base::c(r_version = base::gsub("R version ", [17:27:19.162] "", base::R.version$version.string), [17:27:19.162] platform = base::sprintf("%s (%s-bit)", [17:27:19.162] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.162] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.162] "release", "version")], collapse = " "), [17:27:19.162] hostname = base::Sys.info()[["nodename"]]) [17:27:19.162] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.162] info) [17:27:19.162] info <- base::paste(info, collapse = "; ") [17:27:19.162] if (!has_future) { [17:27:19.162] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.162] info) [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.162] info, version) [17:27:19.162] } [17:27:19.162] base::stop(msg) [17:27:19.162] } [17:27:19.162] }) [17:27:19.162] } [17:27:19.162] ...future.strategy.old <- future::plan("list") [17:27:19.162] options(future.plan = NULL) [17:27:19.162] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.162] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.162] } [17:27:19.162] ...future.workdir <- getwd() [17:27:19.162] } [17:27:19.162] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.162] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.162] } [17:27:19.162] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.162] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.162] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.162] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.162] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.162] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.162] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.162] base::names(...future.oldOptions)) [17:27:19.162] } [17:27:19.162] if (FALSE) { [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] if (TRUE) { [17:27:19.162] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.162] open = "w") [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.162] windows = "NUL", "/dev/null"), open = "w") [17:27:19.162] } [17:27:19.162] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.162] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.162] base::sink(type = "output", split = FALSE) [17:27:19.162] base::close(...future.stdout) [17:27:19.162] }, add = TRUE) [17:27:19.162] } [17:27:19.162] ...future.frame <- base::sys.nframe() [17:27:19.162] ...future.conditions <- base::list() [17:27:19.162] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.162] if (FALSE) { [17:27:19.162] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.162] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.162] } [17:27:19.162] ...future.result <- base::tryCatch({ [17:27:19.162] base::withCallingHandlers({ [17:27:19.162] ...future.value <- base::withVisible(base::local({ [17:27:19.162] cat("Future assignment evaluated\n") [17:27:19.162] 2 [17:27:19.162] })) [17:27:19.162] future::FutureResult(value = ...future.value$value, [17:27:19.162] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.162] ...future.rng), globalenv = if (FALSE) [17:27:19.162] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.162] ...future.globalenv.names)) [17:27:19.162] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.162] }, condition = base::local({ [17:27:19.162] c <- base::c [17:27:19.162] inherits <- base::inherits [17:27:19.162] invokeRestart <- base::invokeRestart [17:27:19.162] length <- base::length [17:27:19.162] list <- base::list [17:27:19.162] seq.int <- base::seq.int [17:27:19.162] signalCondition <- base::signalCondition [17:27:19.162] sys.calls <- base::sys.calls [17:27:19.162] `[[` <- base::`[[` [17:27:19.162] `+` <- base::`+` [17:27:19.162] `<<-` <- base::`<<-` [17:27:19.162] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.162] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.162] 3L)] [17:27:19.162] } [17:27:19.162] function(cond) { [17:27:19.162] is_error <- inherits(cond, "error") [17:27:19.162] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.162] NULL) [17:27:19.162] if (is_error) { [17:27:19.162] sessionInformation <- function() { [17:27:19.162] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.162] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.162] search = base::search(), system = base::Sys.info()) [17:27:19.162] } [17:27:19.162] ...future.conditions[[length(...future.conditions) + [17:27:19.162] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.162] cond$call), session = sessionInformation(), [17:27:19.162] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.162] signalCondition(cond) [17:27:19.162] } [17:27:19.162] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.162] "immediateCondition"))) { [17:27:19.162] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.162] ...future.conditions[[length(...future.conditions) + [17:27:19.162] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.162] if (TRUE && !signal) { [17:27:19.162] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.162] { [17:27:19.162] inherits <- base::inherits [17:27:19.162] invokeRestart <- base::invokeRestart [17:27:19.162] is.null <- base::is.null [17:27:19.162] muffled <- FALSE [17:27:19.162] if (inherits(cond, "message")) { [17:27:19.162] muffled <- grepl(pattern, "muffleMessage") [17:27:19.162] if (muffled) [17:27:19.162] invokeRestart("muffleMessage") [17:27:19.162] } [17:27:19.162] else if (inherits(cond, "warning")) { [17:27:19.162] muffled <- grepl(pattern, "muffleWarning") [17:27:19.162] if (muffled) [17:27:19.162] invokeRestart("muffleWarning") [17:27:19.162] } [17:27:19.162] else if (inherits(cond, "condition")) { [17:27:19.162] if (!is.null(pattern)) { [17:27:19.162] computeRestarts <- base::computeRestarts [17:27:19.162] grepl <- base::grepl [17:27:19.162] restarts <- computeRestarts(cond) [17:27:19.162] for (restart in restarts) { [17:27:19.162] name <- restart$name [17:27:19.162] if (is.null(name)) [17:27:19.162] next [17:27:19.162] if (!grepl(pattern, name)) [17:27:19.162] next [17:27:19.162] invokeRestart(restart) [17:27:19.162] muffled <- TRUE [17:27:19.162] break [17:27:19.162] } [17:27:19.162] } [17:27:19.162] } [17:27:19.162] invisible(muffled) [17:27:19.162] } [17:27:19.162] muffleCondition(cond, pattern = "^muffle") [17:27:19.162] } [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] if (TRUE) { [17:27:19.162] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.162] { [17:27:19.162] inherits <- base::inherits [17:27:19.162] invokeRestart <- base::invokeRestart [17:27:19.162] is.null <- base::is.null [17:27:19.162] muffled <- FALSE [17:27:19.162] if (inherits(cond, "message")) { [17:27:19.162] muffled <- grepl(pattern, "muffleMessage") [17:27:19.162] if (muffled) [17:27:19.162] invokeRestart("muffleMessage") [17:27:19.162] } [17:27:19.162] else if (inherits(cond, "warning")) { [17:27:19.162] muffled <- grepl(pattern, "muffleWarning") [17:27:19.162] if (muffled) [17:27:19.162] invokeRestart("muffleWarning") [17:27:19.162] } [17:27:19.162] else if (inherits(cond, "condition")) { [17:27:19.162] if (!is.null(pattern)) { [17:27:19.162] computeRestarts <- base::computeRestarts [17:27:19.162] grepl <- base::grepl [17:27:19.162] restarts <- computeRestarts(cond) [17:27:19.162] for (restart in restarts) { [17:27:19.162] name <- restart$name [17:27:19.162] if (is.null(name)) [17:27:19.162] next [17:27:19.162] if (!grepl(pattern, name)) [17:27:19.162] next [17:27:19.162] invokeRestart(restart) [17:27:19.162] muffled <- TRUE [17:27:19.162] break [17:27:19.162] } [17:27:19.162] } [17:27:19.162] } [17:27:19.162] invisible(muffled) [17:27:19.162] } [17:27:19.162] muffleCondition(cond, pattern = "^muffle") [17:27:19.162] } [17:27:19.162] } [17:27:19.162] } [17:27:19.162] })) [17:27:19.162] }, error = function(ex) { [17:27:19.162] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.162] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.162] ...future.rng), started = ...future.startTime, [17:27:19.162] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.162] version = "1.8"), class = "FutureResult") [17:27:19.162] }, finally = { [17:27:19.162] if (!identical(...future.workdir, getwd())) [17:27:19.162] setwd(...future.workdir) [17:27:19.162] { [17:27:19.162] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.162] ...future.oldOptions$nwarnings <- NULL [17:27:19.162] } [17:27:19.162] base::options(...future.oldOptions) [17:27:19.162] if (.Platform$OS.type == "windows") { [17:27:19.162] old_names <- names(...future.oldEnvVars) [17:27:19.162] envs <- base::Sys.getenv() [17:27:19.162] names <- names(envs) [17:27:19.162] common <- intersect(names, old_names) [17:27:19.162] added <- setdiff(names, old_names) [17:27:19.162] removed <- setdiff(old_names, names) [17:27:19.162] changed <- common[...future.oldEnvVars[common] != [17:27:19.162] envs[common]] [17:27:19.162] NAMES <- toupper(changed) [17:27:19.162] args <- list() [17:27:19.162] for (kk in seq_along(NAMES)) { [17:27:19.162] name <- changed[[kk]] [17:27:19.162] NAME <- NAMES[[kk]] [17:27:19.162] if (name != NAME && is.element(NAME, old_names)) [17:27:19.162] next [17:27:19.162] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.162] } [17:27:19.162] NAMES <- toupper(added) [17:27:19.162] for (kk in seq_along(NAMES)) { [17:27:19.162] name <- added[[kk]] [17:27:19.162] NAME <- NAMES[[kk]] [17:27:19.162] if (name != NAME && is.element(NAME, old_names)) [17:27:19.162] next [17:27:19.162] args[[name]] <- "" [17:27:19.162] } [17:27:19.162] NAMES <- toupper(removed) [17:27:19.162] for (kk in seq_along(NAMES)) { [17:27:19.162] name <- removed[[kk]] [17:27:19.162] NAME <- NAMES[[kk]] [17:27:19.162] if (name != NAME && is.element(NAME, old_names)) [17:27:19.162] next [17:27:19.162] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.162] } [17:27:19.162] if (length(args) > 0) [17:27:19.162] base::do.call(base::Sys.setenv, args = args) [17:27:19.162] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.162] } [17:27:19.162] { [17:27:19.162] if (base::length(...future.futureOptionsAdded) > [17:27:19.162] 0L) { [17:27:19.162] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.162] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.162] base::options(opts) [17:27:19.162] } [17:27:19.162] { [17:27:19.162] { [17:27:19.162] NULL [17:27:19.162] RNGkind("Mersenne-Twister") [17:27:19.162] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.162] inherits = FALSE) [17:27:19.162] } [17:27:19.162] options(future.plan = NULL) [17:27:19.162] if (is.na(NA_character_)) [17:27:19.162] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.162] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.162] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.162] .init = FALSE) [17:27:19.162] } [17:27:19.162] } [17:27:19.162] } [17:27:19.162] }) [17:27:19.162] if (TRUE) { [17:27:19.162] base::sink(type = "output", split = FALSE) [17:27:19.162] if (TRUE) { [17:27:19.162] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.162] } [17:27:19.162] else { [17:27:19.162] ...future.result["stdout"] <- base::list(NULL) [17:27:19.162] } [17:27:19.162] base::close(...future.stdout) [17:27:19.162] ...future.stdout <- NULL [17:27:19.162] } [17:27:19.162] ...future.result$conditions <- ...future.conditions [17:27:19.162] ...future.result$finished <- base::Sys.time() [17:27:19.162] ...future.result [17:27:19.162] } [17:27:19.168] plan(): Setting new future strategy stack: [17:27:19.168] List of future strategies: [17:27:19.168] 1. sequential: [17:27:19.168] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.168] - tweaked: FALSE [17:27:19.168] - call: NULL [17:27:19.169] plan(): nbrOfWorkers() = 1 [17:27:19.173] plan(): Setting new future strategy stack: [17:27:19.173] List of future strategies: [17:27:19.173] 1. sequential: [17:27:19.173] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.173] - tweaked: FALSE [17:27:19.173] - call: future::plan("sequential") [17:27:19.174] plan(): nbrOfWorkers() = 1 [17:27:19.174] SequentialFuture started (and completed) [17:27:19.175] - Launch lazy future ... done [17:27:19.175] run() for 'SequentialFuture' ... done Future assignment evaluated b = 2 > > ## The expression/value of 'a' is resolved at this point, > ## because a delayed assignment (promise) was used. > cat(sprintf("a = %s\n", a)) Delayed assignment evaluated a = 1 > > stopifnot(identical(a, 1)) > stopifnot(identical(b, 2)) > > message("*** futureAssign() - sequential w/ lazy evaluation ... DONE") *** futureAssign() - sequential w/ lazy evaluation ... DONE > > > message("*** futureAssign() - lazy = TRUE / FALSE ...") *** futureAssign() - lazy = TRUE / FALSE ... > > for (cores in 1:availCores) { + ## Speed up CRAN checks: Skip on CRAN Windows 32-bit + if (!fullTest && isWin32) next + + message(sprintf("Testing with %d cores ...", cores)) + options(mc.cores = cores) + + for (strategy in supportedStrategies(cores)) { + message(sprintf("*** futureAssign() with %s futures ...", sQuote(strategy))) + plan(strategy) + + ## Potential task name clashes + u <- new.env() + v <- new.env() + futureAssign("a", { 2 }, assign.env = u) + futureAssign("a", { 4 }, assign.env = v) + + cat(sprintf("u$a = %s\n", u$a)) + cat(sprintf("v$a = %s\n", v$a)) + + stopifnot(identical(u$a, 2)) + stopifnot(identical(v$a, 4)) + + + ## Global variables + a <- 1 + futureAssign("b", { 2 * a }) + a <- 2 + stopifnot(b == 2) + + ## Explicit lazy evaluation + for (lazy in c(FALSE, TRUE)) { + a <- 1 + f <- futureAssign("b", { 2 * a }, lazy = lazy) + a <- 2 + stopifnot(b == 2) + stopifnot(f$lazy == lazy || (strategy %in% c("multisession", "multicore") && cores == 1L)) + + ## Set 'lazy' via disposable option + options(future.disposable = list(lazy = lazy)) + a <- 1 + f <- futureAssign("b", { 2 * a }) + a <- 2 + stopifnot(b == 2) + stopifnot(f$lazy == lazy || (strategy %in% c("multisession", "multicore") && cores == 1L)) + } + + message(sprintf("*** futureAssign() with %s futures ... DONE", sQuote(strategy))) + } # for (strategy in ...) + + message(sprintf("Testing with %d cores ... DONE", cores)) + } ## for (cores ...) Testing with 1 cores ... *** futureAssign() with 'sequential' futures ... [17:27:19.212] plan(): Setting new future strategy stack: [17:27:19.212] List of future strategies: [17:27:19.212] 1. sequential: [17:27:19.212] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.212] - tweaked: FALSE [17:27:19.212] - call: plan(strategy) [17:27:19.234] plan(): nbrOfWorkers() = 1 [17:27:19.235] getGlobalsAndPackages() ... [17:27:19.235] Searching for globals... [17:27:19.237] - globals found: [1] '{' [17:27:19.238] Searching for globals ... DONE [17:27:19.238] Resolving globals: FALSE [17:27:19.239] [17:27:19.239] [17:27:19.240] getGlobalsAndPackages() ... DONE [17:27:19.240] run() for 'Future' ... [17:27:19.241] - state: 'created' [17:27:19.241] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.242] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.242] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.242] - Field: 'label' [17:27:19.243] - Field: 'local' [17:27:19.243] - Field: 'owner' [17:27:19.243] - Field: 'envir' [17:27:19.244] - Field: 'packages' [17:27:19.244] - Field: 'gc' [17:27:19.244] - Field: 'conditions' [17:27:19.244] - Field: 'expr' [17:27:19.245] - Field: 'uuid' [17:27:19.245] - Field: 'seed' [17:27:19.245] - Field: 'version' [17:27:19.246] - Field: 'result' [17:27:19.246] - Field: 'asynchronous' [17:27:19.246] - Field: 'calls' [17:27:19.246] - Field: 'globals' [17:27:19.247] - Field: 'stdout' [17:27:19.247] - Field: 'earlySignal' [17:27:19.247] - Field: 'lazy' [17:27:19.248] - Field: 'state' [17:27:19.248] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.248] - Launch lazy future ... [17:27:19.249] Packages needed by the future expression (n = 0): [17:27:19.249] Packages needed by future strategies (n = 0): [17:27:19.250] { [17:27:19.250] { [17:27:19.250] { [17:27:19.250] ...future.startTime <- base::Sys.time() [17:27:19.250] { [17:27:19.250] { [17:27:19.250] { [17:27:19.250] base::local({ [17:27:19.250] has_future <- base::requireNamespace("future", [17:27:19.250] quietly = TRUE) [17:27:19.250] if (has_future) { [17:27:19.250] ns <- base::getNamespace("future") [17:27:19.250] version <- ns[[".package"]][["version"]] [17:27:19.250] if (is.null(version)) [17:27:19.250] version <- utils::packageVersion("future") [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] version <- NULL [17:27:19.250] } [17:27:19.250] if (!has_future || version < "1.8.0") { [17:27:19.250] info <- base::c(r_version = base::gsub("R version ", [17:27:19.250] "", base::R.version$version.string), [17:27:19.250] platform = base::sprintf("%s (%s-bit)", [17:27:19.250] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.250] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.250] "release", "version")], collapse = " "), [17:27:19.250] hostname = base::Sys.info()[["nodename"]]) [17:27:19.250] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.250] info) [17:27:19.250] info <- base::paste(info, collapse = "; ") [17:27:19.250] if (!has_future) { [17:27:19.250] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.250] info) [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.250] info, version) [17:27:19.250] } [17:27:19.250] base::stop(msg) [17:27:19.250] } [17:27:19.250] }) [17:27:19.250] } [17:27:19.250] ...future.strategy.old <- future::plan("list") [17:27:19.250] options(future.plan = NULL) [17:27:19.250] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.250] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.250] } [17:27:19.250] ...future.workdir <- getwd() [17:27:19.250] } [17:27:19.250] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.250] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.250] } [17:27:19.250] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.250] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.250] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.250] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.250] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.250] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.250] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.250] base::names(...future.oldOptions)) [17:27:19.250] } [17:27:19.250] if (FALSE) { [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] if (TRUE) { [17:27:19.250] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.250] open = "w") [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.250] windows = "NUL", "/dev/null"), open = "w") [17:27:19.250] } [17:27:19.250] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.250] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.250] base::sink(type = "output", split = FALSE) [17:27:19.250] base::close(...future.stdout) [17:27:19.250] }, add = TRUE) [17:27:19.250] } [17:27:19.250] ...future.frame <- base::sys.nframe() [17:27:19.250] ...future.conditions <- base::list() [17:27:19.250] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.250] if (FALSE) { [17:27:19.250] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.250] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.250] } [17:27:19.250] ...future.result <- base::tryCatch({ [17:27:19.250] base::withCallingHandlers({ [17:27:19.250] ...future.value <- base::withVisible(base::local({ [17:27:19.250] 2 [17:27:19.250] })) [17:27:19.250] future::FutureResult(value = ...future.value$value, [17:27:19.250] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.250] ...future.rng), globalenv = if (FALSE) [17:27:19.250] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.250] ...future.globalenv.names)) [17:27:19.250] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.250] }, condition = base::local({ [17:27:19.250] c <- base::c [17:27:19.250] inherits <- base::inherits [17:27:19.250] invokeRestart <- base::invokeRestart [17:27:19.250] length <- base::length [17:27:19.250] list <- base::list [17:27:19.250] seq.int <- base::seq.int [17:27:19.250] signalCondition <- base::signalCondition [17:27:19.250] sys.calls <- base::sys.calls [17:27:19.250] `[[` <- base::`[[` [17:27:19.250] `+` <- base::`+` [17:27:19.250] `<<-` <- base::`<<-` [17:27:19.250] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.250] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.250] 3L)] [17:27:19.250] } [17:27:19.250] function(cond) { [17:27:19.250] is_error <- inherits(cond, "error") [17:27:19.250] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.250] NULL) [17:27:19.250] if (is_error) { [17:27:19.250] sessionInformation <- function() { [17:27:19.250] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.250] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.250] search = base::search(), system = base::Sys.info()) [17:27:19.250] } [17:27:19.250] ...future.conditions[[length(...future.conditions) + [17:27:19.250] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.250] cond$call), session = sessionInformation(), [17:27:19.250] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.250] signalCondition(cond) [17:27:19.250] } [17:27:19.250] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.250] "immediateCondition"))) { [17:27:19.250] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.250] ...future.conditions[[length(...future.conditions) + [17:27:19.250] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.250] if (TRUE && !signal) { [17:27:19.250] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.250] { [17:27:19.250] inherits <- base::inherits [17:27:19.250] invokeRestart <- base::invokeRestart [17:27:19.250] is.null <- base::is.null [17:27:19.250] muffled <- FALSE [17:27:19.250] if (inherits(cond, "message")) { [17:27:19.250] muffled <- grepl(pattern, "muffleMessage") [17:27:19.250] if (muffled) [17:27:19.250] invokeRestart("muffleMessage") [17:27:19.250] } [17:27:19.250] else if (inherits(cond, "warning")) { [17:27:19.250] muffled <- grepl(pattern, "muffleWarning") [17:27:19.250] if (muffled) [17:27:19.250] invokeRestart("muffleWarning") [17:27:19.250] } [17:27:19.250] else if (inherits(cond, "condition")) { [17:27:19.250] if (!is.null(pattern)) { [17:27:19.250] computeRestarts <- base::computeRestarts [17:27:19.250] grepl <- base::grepl [17:27:19.250] restarts <- computeRestarts(cond) [17:27:19.250] for (restart in restarts) { [17:27:19.250] name <- restart$name [17:27:19.250] if (is.null(name)) [17:27:19.250] next [17:27:19.250] if (!grepl(pattern, name)) [17:27:19.250] next [17:27:19.250] invokeRestart(restart) [17:27:19.250] muffled <- TRUE [17:27:19.250] break [17:27:19.250] } [17:27:19.250] } [17:27:19.250] } [17:27:19.250] invisible(muffled) [17:27:19.250] } [17:27:19.250] muffleCondition(cond, pattern = "^muffle") [17:27:19.250] } [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] if (TRUE) { [17:27:19.250] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.250] { [17:27:19.250] inherits <- base::inherits [17:27:19.250] invokeRestart <- base::invokeRestart [17:27:19.250] is.null <- base::is.null [17:27:19.250] muffled <- FALSE [17:27:19.250] if (inherits(cond, "message")) { [17:27:19.250] muffled <- grepl(pattern, "muffleMessage") [17:27:19.250] if (muffled) [17:27:19.250] invokeRestart("muffleMessage") [17:27:19.250] } [17:27:19.250] else if (inherits(cond, "warning")) { [17:27:19.250] muffled <- grepl(pattern, "muffleWarning") [17:27:19.250] if (muffled) [17:27:19.250] invokeRestart("muffleWarning") [17:27:19.250] } [17:27:19.250] else if (inherits(cond, "condition")) { [17:27:19.250] if (!is.null(pattern)) { [17:27:19.250] computeRestarts <- base::computeRestarts [17:27:19.250] grepl <- base::grepl [17:27:19.250] restarts <- computeRestarts(cond) [17:27:19.250] for (restart in restarts) { [17:27:19.250] name <- restart$name [17:27:19.250] if (is.null(name)) [17:27:19.250] next [17:27:19.250] if (!grepl(pattern, name)) [17:27:19.250] next [17:27:19.250] invokeRestart(restart) [17:27:19.250] muffled <- TRUE [17:27:19.250] break [17:27:19.250] } [17:27:19.250] } [17:27:19.250] } [17:27:19.250] invisible(muffled) [17:27:19.250] } [17:27:19.250] muffleCondition(cond, pattern = "^muffle") [17:27:19.250] } [17:27:19.250] } [17:27:19.250] } [17:27:19.250] })) [17:27:19.250] }, error = function(ex) { [17:27:19.250] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.250] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.250] ...future.rng), started = ...future.startTime, [17:27:19.250] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.250] version = "1.8"), class = "FutureResult") [17:27:19.250] }, finally = { [17:27:19.250] if (!identical(...future.workdir, getwd())) [17:27:19.250] setwd(...future.workdir) [17:27:19.250] { [17:27:19.250] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.250] ...future.oldOptions$nwarnings <- NULL [17:27:19.250] } [17:27:19.250] base::options(...future.oldOptions) [17:27:19.250] if (.Platform$OS.type == "windows") { [17:27:19.250] old_names <- names(...future.oldEnvVars) [17:27:19.250] envs <- base::Sys.getenv() [17:27:19.250] names <- names(envs) [17:27:19.250] common <- intersect(names, old_names) [17:27:19.250] added <- setdiff(names, old_names) [17:27:19.250] removed <- setdiff(old_names, names) [17:27:19.250] changed <- common[...future.oldEnvVars[common] != [17:27:19.250] envs[common]] [17:27:19.250] NAMES <- toupper(changed) [17:27:19.250] args <- list() [17:27:19.250] for (kk in seq_along(NAMES)) { [17:27:19.250] name <- changed[[kk]] [17:27:19.250] NAME <- NAMES[[kk]] [17:27:19.250] if (name != NAME && is.element(NAME, old_names)) [17:27:19.250] next [17:27:19.250] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.250] } [17:27:19.250] NAMES <- toupper(added) [17:27:19.250] for (kk in seq_along(NAMES)) { [17:27:19.250] name <- added[[kk]] [17:27:19.250] NAME <- NAMES[[kk]] [17:27:19.250] if (name != NAME && is.element(NAME, old_names)) [17:27:19.250] next [17:27:19.250] args[[name]] <- "" [17:27:19.250] } [17:27:19.250] NAMES <- toupper(removed) [17:27:19.250] for (kk in seq_along(NAMES)) { [17:27:19.250] name <- removed[[kk]] [17:27:19.250] NAME <- NAMES[[kk]] [17:27:19.250] if (name != NAME && is.element(NAME, old_names)) [17:27:19.250] next [17:27:19.250] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.250] } [17:27:19.250] if (length(args) > 0) [17:27:19.250] base::do.call(base::Sys.setenv, args = args) [17:27:19.250] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.250] } [17:27:19.250] { [17:27:19.250] if (base::length(...future.futureOptionsAdded) > [17:27:19.250] 0L) { [17:27:19.250] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.250] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.250] base::options(opts) [17:27:19.250] } [17:27:19.250] { [17:27:19.250] { [17:27:19.250] NULL [17:27:19.250] RNGkind("Mersenne-Twister") [17:27:19.250] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.250] inherits = FALSE) [17:27:19.250] } [17:27:19.250] options(future.plan = NULL) [17:27:19.250] if (is.na(NA_character_)) [17:27:19.250] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.250] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.250] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.250] .init = FALSE) [17:27:19.250] } [17:27:19.250] } [17:27:19.250] } [17:27:19.250] }) [17:27:19.250] if (TRUE) { [17:27:19.250] base::sink(type = "output", split = FALSE) [17:27:19.250] if (TRUE) { [17:27:19.250] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.250] } [17:27:19.250] else { [17:27:19.250] ...future.result["stdout"] <- base::list(NULL) [17:27:19.250] } [17:27:19.250] base::close(...future.stdout) [17:27:19.250] ...future.stdout <- NULL [17:27:19.250] } [17:27:19.250] ...future.result$conditions <- ...future.conditions [17:27:19.250] ...future.result$finished <- base::Sys.time() [17:27:19.250] ...future.result [17:27:19.250] } [17:27:19.257] plan(): Setting new future strategy stack: [17:27:19.257] List of future strategies: [17:27:19.257] 1. sequential: [17:27:19.257] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.257] - tweaked: FALSE [17:27:19.257] - call: NULL [17:27:19.259] plan(): nbrOfWorkers() = 1 [17:27:19.261] plan(): Setting new future strategy stack: [17:27:19.261] List of future strategies: [17:27:19.261] 1. sequential: [17:27:19.261] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.261] - tweaked: FALSE [17:27:19.261] - call: plan(strategy) [17:27:19.262] plan(): nbrOfWorkers() = 1 [17:27:19.263] SequentialFuture started (and completed) [17:27:19.263] - Launch lazy future ... done [17:27:19.263] run() for 'SequentialFuture' ... done [17:27:19.264] getGlobalsAndPackages() ... [17:27:19.264] Searching for globals... [17:27:19.265] - globals found: [1] '{' [17:27:19.266] Searching for globals ... DONE [17:27:19.266] Resolving globals: FALSE [17:27:19.267] [17:27:19.267] [17:27:19.267] getGlobalsAndPackages() ... DONE [17:27:19.268] run() for 'Future' ... [17:27:19.268] - state: 'created' [17:27:19.269] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.269] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.269] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.270] - Field: 'label' [17:27:19.270] - Field: 'local' [17:27:19.270] - Field: 'owner' [17:27:19.271] - Field: 'envir' [17:27:19.271] - Field: 'packages' [17:27:19.271] - Field: 'gc' [17:27:19.272] - Field: 'conditions' [17:27:19.272] - Field: 'expr' [17:27:19.272] - Field: 'uuid' [17:27:19.272] - Field: 'seed' [17:27:19.273] - Field: 'version' [17:27:19.273] - Field: 'result' [17:27:19.273] - Field: 'asynchronous' [17:27:19.274] - Field: 'calls' [17:27:19.274] - Field: 'globals' [17:27:19.274] - Field: 'stdout' [17:27:19.275] - Field: 'earlySignal' [17:27:19.275] - Field: 'lazy' [17:27:19.275] - Field: 'state' [17:27:19.275] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.276] - Launch lazy future ... [17:27:19.276] Packages needed by the future expression (n = 0): [17:27:19.277] Packages needed by future strategies (n = 0): [17:27:19.278] { [17:27:19.278] { [17:27:19.278] { [17:27:19.278] ...future.startTime <- base::Sys.time() [17:27:19.278] { [17:27:19.278] { [17:27:19.278] { [17:27:19.278] base::local({ [17:27:19.278] has_future <- base::requireNamespace("future", [17:27:19.278] quietly = TRUE) [17:27:19.278] if (has_future) { [17:27:19.278] ns <- base::getNamespace("future") [17:27:19.278] version <- ns[[".package"]][["version"]] [17:27:19.278] if (is.null(version)) [17:27:19.278] version <- utils::packageVersion("future") [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] version <- NULL [17:27:19.278] } [17:27:19.278] if (!has_future || version < "1.8.0") { [17:27:19.278] info <- base::c(r_version = base::gsub("R version ", [17:27:19.278] "", base::R.version$version.string), [17:27:19.278] platform = base::sprintf("%s (%s-bit)", [17:27:19.278] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.278] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.278] "release", "version")], collapse = " "), [17:27:19.278] hostname = base::Sys.info()[["nodename"]]) [17:27:19.278] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.278] info) [17:27:19.278] info <- base::paste(info, collapse = "; ") [17:27:19.278] if (!has_future) { [17:27:19.278] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.278] info) [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.278] info, version) [17:27:19.278] } [17:27:19.278] base::stop(msg) [17:27:19.278] } [17:27:19.278] }) [17:27:19.278] } [17:27:19.278] ...future.strategy.old <- future::plan("list") [17:27:19.278] options(future.plan = NULL) [17:27:19.278] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.278] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.278] } [17:27:19.278] ...future.workdir <- getwd() [17:27:19.278] } [17:27:19.278] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.278] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.278] } [17:27:19.278] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.278] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.278] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.278] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.278] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.278] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.278] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.278] base::names(...future.oldOptions)) [17:27:19.278] } [17:27:19.278] if (FALSE) { [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] if (TRUE) { [17:27:19.278] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.278] open = "w") [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.278] windows = "NUL", "/dev/null"), open = "w") [17:27:19.278] } [17:27:19.278] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.278] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.278] base::sink(type = "output", split = FALSE) [17:27:19.278] base::close(...future.stdout) [17:27:19.278] }, add = TRUE) [17:27:19.278] } [17:27:19.278] ...future.frame <- base::sys.nframe() [17:27:19.278] ...future.conditions <- base::list() [17:27:19.278] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.278] if (FALSE) { [17:27:19.278] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.278] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.278] } [17:27:19.278] ...future.result <- base::tryCatch({ [17:27:19.278] base::withCallingHandlers({ [17:27:19.278] ...future.value <- base::withVisible(base::local({ [17:27:19.278] 4 [17:27:19.278] })) [17:27:19.278] future::FutureResult(value = ...future.value$value, [17:27:19.278] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.278] ...future.rng), globalenv = if (FALSE) [17:27:19.278] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.278] ...future.globalenv.names)) [17:27:19.278] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.278] }, condition = base::local({ [17:27:19.278] c <- base::c [17:27:19.278] inherits <- base::inherits [17:27:19.278] invokeRestart <- base::invokeRestart [17:27:19.278] length <- base::length [17:27:19.278] list <- base::list [17:27:19.278] seq.int <- base::seq.int [17:27:19.278] signalCondition <- base::signalCondition [17:27:19.278] sys.calls <- base::sys.calls [17:27:19.278] `[[` <- base::`[[` [17:27:19.278] `+` <- base::`+` [17:27:19.278] `<<-` <- base::`<<-` [17:27:19.278] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.278] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.278] 3L)] [17:27:19.278] } [17:27:19.278] function(cond) { [17:27:19.278] is_error <- inherits(cond, "error") [17:27:19.278] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.278] NULL) [17:27:19.278] if (is_error) { [17:27:19.278] sessionInformation <- function() { [17:27:19.278] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.278] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.278] search = base::search(), system = base::Sys.info()) [17:27:19.278] } [17:27:19.278] ...future.conditions[[length(...future.conditions) + [17:27:19.278] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.278] cond$call), session = sessionInformation(), [17:27:19.278] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.278] signalCondition(cond) [17:27:19.278] } [17:27:19.278] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.278] "immediateCondition"))) { [17:27:19.278] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.278] ...future.conditions[[length(...future.conditions) + [17:27:19.278] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.278] if (TRUE && !signal) { [17:27:19.278] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.278] { [17:27:19.278] inherits <- base::inherits [17:27:19.278] invokeRestart <- base::invokeRestart [17:27:19.278] is.null <- base::is.null [17:27:19.278] muffled <- FALSE [17:27:19.278] if (inherits(cond, "message")) { [17:27:19.278] muffled <- grepl(pattern, "muffleMessage") [17:27:19.278] if (muffled) [17:27:19.278] invokeRestart("muffleMessage") [17:27:19.278] } [17:27:19.278] else if (inherits(cond, "warning")) { [17:27:19.278] muffled <- grepl(pattern, "muffleWarning") [17:27:19.278] if (muffled) [17:27:19.278] invokeRestart("muffleWarning") [17:27:19.278] } [17:27:19.278] else if (inherits(cond, "condition")) { [17:27:19.278] if (!is.null(pattern)) { [17:27:19.278] computeRestarts <- base::computeRestarts [17:27:19.278] grepl <- base::grepl [17:27:19.278] restarts <- computeRestarts(cond) [17:27:19.278] for (restart in restarts) { [17:27:19.278] name <- restart$name [17:27:19.278] if (is.null(name)) [17:27:19.278] next [17:27:19.278] if (!grepl(pattern, name)) [17:27:19.278] next [17:27:19.278] invokeRestart(restart) [17:27:19.278] muffled <- TRUE [17:27:19.278] break [17:27:19.278] } [17:27:19.278] } [17:27:19.278] } [17:27:19.278] invisible(muffled) [17:27:19.278] } [17:27:19.278] muffleCondition(cond, pattern = "^muffle") [17:27:19.278] } [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] if (TRUE) { [17:27:19.278] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.278] { [17:27:19.278] inherits <- base::inherits [17:27:19.278] invokeRestart <- base::invokeRestart [17:27:19.278] is.null <- base::is.null [17:27:19.278] muffled <- FALSE [17:27:19.278] if (inherits(cond, "message")) { [17:27:19.278] muffled <- grepl(pattern, "muffleMessage") [17:27:19.278] if (muffled) [17:27:19.278] invokeRestart("muffleMessage") [17:27:19.278] } [17:27:19.278] else if (inherits(cond, "warning")) { [17:27:19.278] muffled <- grepl(pattern, "muffleWarning") [17:27:19.278] if (muffled) [17:27:19.278] invokeRestart("muffleWarning") [17:27:19.278] } [17:27:19.278] else if (inherits(cond, "condition")) { [17:27:19.278] if (!is.null(pattern)) { [17:27:19.278] computeRestarts <- base::computeRestarts [17:27:19.278] grepl <- base::grepl [17:27:19.278] restarts <- computeRestarts(cond) [17:27:19.278] for (restart in restarts) { [17:27:19.278] name <- restart$name [17:27:19.278] if (is.null(name)) [17:27:19.278] next [17:27:19.278] if (!grepl(pattern, name)) [17:27:19.278] next [17:27:19.278] invokeRestart(restart) [17:27:19.278] muffled <- TRUE [17:27:19.278] break [17:27:19.278] } [17:27:19.278] } [17:27:19.278] } [17:27:19.278] invisible(muffled) [17:27:19.278] } [17:27:19.278] muffleCondition(cond, pattern = "^muffle") [17:27:19.278] } [17:27:19.278] } [17:27:19.278] } [17:27:19.278] })) [17:27:19.278] }, error = function(ex) { [17:27:19.278] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.278] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.278] ...future.rng), started = ...future.startTime, [17:27:19.278] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.278] version = "1.8"), class = "FutureResult") [17:27:19.278] }, finally = { [17:27:19.278] if (!identical(...future.workdir, getwd())) [17:27:19.278] setwd(...future.workdir) [17:27:19.278] { [17:27:19.278] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.278] ...future.oldOptions$nwarnings <- NULL [17:27:19.278] } [17:27:19.278] base::options(...future.oldOptions) [17:27:19.278] if (.Platform$OS.type == "windows") { [17:27:19.278] old_names <- names(...future.oldEnvVars) [17:27:19.278] envs <- base::Sys.getenv() [17:27:19.278] names <- names(envs) [17:27:19.278] common <- intersect(names, old_names) [17:27:19.278] added <- setdiff(names, old_names) [17:27:19.278] removed <- setdiff(old_names, names) [17:27:19.278] changed <- common[...future.oldEnvVars[common] != [17:27:19.278] envs[common]] [17:27:19.278] NAMES <- toupper(changed) [17:27:19.278] args <- list() [17:27:19.278] for (kk in seq_along(NAMES)) { [17:27:19.278] name <- changed[[kk]] [17:27:19.278] NAME <- NAMES[[kk]] [17:27:19.278] if (name != NAME && is.element(NAME, old_names)) [17:27:19.278] next [17:27:19.278] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.278] } [17:27:19.278] NAMES <- toupper(added) [17:27:19.278] for (kk in seq_along(NAMES)) { [17:27:19.278] name <- added[[kk]] [17:27:19.278] NAME <- NAMES[[kk]] [17:27:19.278] if (name != NAME && is.element(NAME, old_names)) [17:27:19.278] next [17:27:19.278] args[[name]] <- "" [17:27:19.278] } [17:27:19.278] NAMES <- toupper(removed) [17:27:19.278] for (kk in seq_along(NAMES)) { [17:27:19.278] name <- removed[[kk]] [17:27:19.278] NAME <- NAMES[[kk]] [17:27:19.278] if (name != NAME && is.element(NAME, old_names)) [17:27:19.278] next [17:27:19.278] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.278] } [17:27:19.278] if (length(args) > 0) [17:27:19.278] base::do.call(base::Sys.setenv, args = args) [17:27:19.278] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.278] } [17:27:19.278] { [17:27:19.278] if (base::length(...future.futureOptionsAdded) > [17:27:19.278] 0L) { [17:27:19.278] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.278] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.278] base::options(opts) [17:27:19.278] } [17:27:19.278] { [17:27:19.278] { [17:27:19.278] NULL [17:27:19.278] RNGkind("Mersenne-Twister") [17:27:19.278] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.278] inherits = FALSE) [17:27:19.278] } [17:27:19.278] options(future.plan = NULL) [17:27:19.278] if (is.na(NA_character_)) [17:27:19.278] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.278] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.278] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.278] .init = FALSE) [17:27:19.278] } [17:27:19.278] } [17:27:19.278] } [17:27:19.278] }) [17:27:19.278] if (TRUE) { [17:27:19.278] base::sink(type = "output", split = FALSE) [17:27:19.278] if (TRUE) { [17:27:19.278] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.278] } [17:27:19.278] else { [17:27:19.278] ...future.result["stdout"] <- base::list(NULL) [17:27:19.278] } [17:27:19.278] base::close(...future.stdout) [17:27:19.278] ...future.stdout <- NULL [17:27:19.278] } [17:27:19.278] ...future.result$conditions <- ...future.conditions [17:27:19.278] ...future.result$finished <- base::Sys.time() [17:27:19.278] ...future.result [17:27:19.278] } [17:27:19.285] plan(): Setting new future strategy stack: [17:27:19.285] List of future strategies: [17:27:19.285] 1. sequential: [17:27:19.285] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.285] - tweaked: FALSE [17:27:19.285] - call: NULL [17:27:19.286] plan(): nbrOfWorkers() = 1 [17:27:19.289] plan(): Setting new future strategy stack: [17:27:19.289] List of future strategies: [17:27:19.289] 1. sequential: [17:27:19.289] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.289] - tweaked: FALSE [17:27:19.289] - call: plan(strategy) [17:27:19.294] plan(): nbrOfWorkers() = 1 [17:27:19.294] SequentialFuture started (and completed) [17:27:19.295] - Launch lazy future ... done [17:27:19.295] run() for 'SequentialFuture' ... done u$a = 2 v$a = 4 [17:27:19.296] getGlobalsAndPackages() ... [17:27:19.296] Searching for globals... [17:27:19.298] - globals found: [3] '{', '*', 'a' [17:27:19.298] Searching for globals ... DONE [17:27:19.299] Resolving globals: FALSE [17:27:19.300] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:19.301] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:19.301] - globals: [1] 'a' [17:27:19.302] [17:27:19.302] getGlobalsAndPackages() ... DONE [17:27:19.303] run() for 'Future' ... [17:27:19.303] - state: 'created' [17:27:19.303] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.304] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.304] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.305] - Field: 'label' [17:27:19.305] - Field: 'local' [17:27:19.305] - Field: 'owner' [17:27:19.305] - Field: 'envir' [17:27:19.306] - Field: 'packages' [17:27:19.306] - Field: 'gc' [17:27:19.306] - Field: 'conditions' [17:27:19.307] - Field: 'expr' [17:27:19.307] - Field: 'uuid' [17:27:19.307] - Field: 'seed' [17:27:19.308] - Field: 'version' [17:27:19.308] - Field: 'result' [17:27:19.308] - Field: 'asynchronous' [17:27:19.308] - Field: 'calls' [17:27:19.309] - Field: 'globals' [17:27:19.309] - Field: 'stdout' [17:27:19.309] - Field: 'earlySignal' [17:27:19.310] - Field: 'lazy' [17:27:19.310] - Field: 'state' [17:27:19.310] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.310] - Launch lazy future ... [17:27:19.311] Packages needed by the future expression (n = 0): [17:27:19.311] Packages needed by future strategies (n = 0): [17:27:19.312] { [17:27:19.312] { [17:27:19.312] { [17:27:19.312] ...future.startTime <- base::Sys.time() [17:27:19.312] { [17:27:19.312] { [17:27:19.312] { [17:27:19.312] base::local({ [17:27:19.312] has_future <- base::requireNamespace("future", [17:27:19.312] quietly = TRUE) [17:27:19.312] if (has_future) { [17:27:19.312] ns <- base::getNamespace("future") [17:27:19.312] version <- ns[[".package"]][["version"]] [17:27:19.312] if (is.null(version)) [17:27:19.312] version <- utils::packageVersion("future") [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] version <- NULL [17:27:19.312] } [17:27:19.312] if (!has_future || version < "1.8.0") { [17:27:19.312] info <- base::c(r_version = base::gsub("R version ", [17:27:19.312] "", base::R.version$version.string), [17:27:19.312] platform = base::sprintf("%s (%s-bit)", [17:27:19.312] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.312] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.312] "release", "version")], collapse = " "), [17:27:19.312] hostname = base::Sys.info()[["nodename"]]) [17:27:19.312] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.312] info) [17:27:19.312] info <- base::paste(info, collapse = "; ") [17:27:19.312] if (!has_future) { [17:27:19.312] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.312] info) [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.312] info, version) [17:27:19.312] } [17:27:19.312] base::stop(msg) [17:27:19.312] } [17:27:19.312] }) [17:27:19.312] } [17:27:19.312] ...future.strategy.old <- future::plan("list") [17:27:19.312] options(future.plan = NULL) [17:27:19.312] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.312] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.312] } [17:27:19.312] ...future.workdir <- getwd() [17:27:19.312] } [17:27:19.312] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.312] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.312] } [17:27:19.312] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.312] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.312] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.312] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.312] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.312] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.312] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.312] base::names(...future.oldOptions)) [17:27:19.312] } [17:27:19.312] if (FALSE) { [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] if (TRUE) { [17:27:19.312] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.312] open = "w") [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.312] windows = "NUL", "/dev/null"), open = "w") [17:27:19.312] } [17:27:19.312] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.312] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.312] base::sink(type = "output", split = FALSE) [17:27:19.312] base::close(...future.stdout) [17:27:19.312] }, add = TRUE) [17:27:19.312] } [17:27:19.312] ...future.frame <- base::sys.nframe() [17:27:19.312] ...future.conditions <- base::list() [17:27:19.312] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.312] if (FALSE) { [17:27:19.312] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.312] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.312] } [17:27:19.312] ...future.result <- base::tryCatch({ [17:27:19.312] base::withCallingHandlers({ [17:27:19.312] ...future.value <- base::withVisible(base::local({ [17:27:19.312] 2 * a [17:27:19.312] })) [17:27:19.312] future::FutureResult(value = ...future.value$value, [17:27:19.312] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.312] ...future.rng), globalenv = if (FALSE) [17:27:19.312] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.312] ...future.globalenv.names)) [17:27:19.312] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.312] }, condition = base::local({ [17:27:19.312] c <- base::c [17:27:19.312] inherits <- base::inherits [17:27:19.312] invokeRestart <- base::invokeRestart [17:27:19.312] length <- base::length [17:27:19.312] list <- base::list [17:27:19.312] seq.int <- base::seq.int [17:27:19.312] signalCondition <- base::signalCondition [17:27:19.312] sys.calls <- base::sys.calls [17:27:19.312] `[[` <- base::`[[` [17:27:19.312] `+` <- base::`+` [17:27:19.312] `<<-` <- base::`<<-` [17:27:19.312] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.312] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.312] 3L)] [17:27:19.312] } [17:27:19.312] function(cond) { [17:27:19.312] is_error <- inherits(cond, "error") [17:27:19.312] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.312] NULL) [17:27:19.312] if (is_error) { [17:27:19.312] sessionInformation <- function() { [17:27:19.312] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.312] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.312] search = base::search(), system = base::Sys.info()) [17:27:19.312] } [17:27:19.312] ...future.conditions[[length(...future.conditions) + [17:27:19.312] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.312] cond$call), session = sessionInformation(), [17:27:19.312] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.312] signalCondition(cond) [17:27:19.312] } [17:27:19.312] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.312] "immediateCondition"))) { [17:27:19.312] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.312] ...future.conditions[[length(...future.conditions) + [17:27:19.312] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.312] if (TRUE && !signal) { [17:27:19.312] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.312] { [17:27:19.312] inherits <- base::inherits [17:27:19.312] invokeRestart <- base::invokeRestart [17:27:19.312] is.null <- base::is.null [17:27:19.312] muffled <- FALSE [17:27:19.312] if (inherits(cond, "message")) { [17:27:19.312] muffled <- grepl(pattern, "muffleMessage") [17:27:19.312] if (muffled) [17:27:19.312] invokeRestart("muffleMessage") [17:27:19.312] } [17:27:19.312] else if (inherits(cond, "warning")) { [17:27:19.312] muffled <- grepl(pattern, "muffleWarning") [17:27:19.312] if (muffled) [17:27:19.312] invokeRestart("muffleWarning") [17:27:19.312] } [17:27:19.312] else if (inherits(cond, "condition")) { [17:27:19.312] if (!is.null(pattern)) { [17:27:19.312] computeRestarts <- base::computeRestarts [17:27:19.312] grepl <- base::grepl [17:27:19.312] restarts <- computeRestarts(cond) [17:27:19.312] for (restart in restarts) { [17:27:19.312] name <- restart$name [17:27:19.312] if (is.null(name)) [17:27:19.312] next [17:27:19.312] if (!grepl(pattern, name)) [17:27:19.312] next [17:27:19.312] invokeRestart(restart) [17:27:19.312] muffled <- TRUE [17:27:19.312] break [17:27:19.312] } [17:27:19.312] } [17:27:19.312] } [17:27:19.312] invisible(muffled) [17:27:19.312] } [17:27:19.312] muffleCondition(cond, pattern = "^muffle") [17:27:19.312] } [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] if (TRUE) { [17:27:19.312] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.312] { [17:27:19.312] inherits <- base::inherits [17:27:19.312] invokeRestart <- base::invokeRestart [17:27:19.312] is.null <- base::is.null [17:27:19.312] muffled <- FALSE [17:27:19.312] if (inherits(cond, "message")) { [17:27:19.312] muffled <- grepl(pattern, "muffleMessage") [17:27:19.312] if (muffled) [17:27:19.312] invokeRestart("muffleMessage") [17:27:19.312] } [17:27:19.312] else if (inherits(cond, "warning")) { [17:27:19.312] muffled <- grepl(pattern, "muffleWarning") [17:27:19.312] if (muffled) [17:27:19.312] invokeRestart("muffleWarning") [17:27:19.312] } [17:27:19.312] else if (inherits(cond, "condition")) { [17:27:19.312] if (!is.null(pattern)) { [17:27:19.312] computeRestarts <- base::computeRestarts [17:27:19.312] grepl <- base::grepl [17:27:19.312] restarts <- computeRestarts(cond) [17:27:19.312] for (restart in restarts) { [17:27:19.312] name <- restart$name [17:27:19.312] if (is.null(name)) [17:27:19.312] next [17:27:19.312] if (!grepl(pattern, name)) [17:27:19.312] next [17:27:19.312] invokeRestart(restart) [17:27:19.312] muffled <- TRUE [17:27:19.312] break [17:27:19.312] } [17:27:19.312] } [17:27:19.312] } [17:27:19.312] invisible(muffled) [17:27:19.312] } [17:27:19.312] muffleCondition(cond, pattern = "^muffle") [17:27:19.312] } [17:27:19.312] } [17:27:19.312] } [17:27:19.312] })) [17:27:19.312] }, error = function(ex) { [17:27:19.312] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.312] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.312] ...future.rng), started = ...future.startTime, [17:27:19.312] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.312] version = "1.8"), class = "FutureResult") [17:27:19.312] }, finally = { [17:27:19.312] if (!identical(...future.workdir, getwd())) [17:27:19.312] setwd(...future.workdir) [17:27:19.312] { [17:27:19.312] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.312] ...future.oldOptions$nwarnings <- NULL [17:27:19.312] } [17:27:19.312] base::options(...future.oldOptions) [17:27:19.312] if (.Platform$OS.type == "windows") { [17:27:19.312] old_names <- names(...future.oldEnvVars) [17:27:19.312] envs <- base::Sys.getenv() [17:27:19.312] names <- names(envs) [17:27:19.312] common <- intersect(names, old_names) [17:27:19.312] added <- setdiff(names, old_names) [17:27:19.312] removed <- setdiff(old_names, names) [17:27:19.312] changed <- common[...future.oldEnvVars[common] != [17:27:19.312] envs[common]] [17:27:19.312] NAMES <- toupper(changed) [17:27:19.312] args <- list() [17:27:19.312] for (kk in seq_along(NAMES)) { [17:27:19.312] name <- changed[[kk]] [17:27:19.312] NAME <- NAMES[[kk]] [17:27:19.312] if (name != NAME && is.element(NAME, old_names)) [17:27:19.312] next [17:27:19.312] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.312] } [17:27:19.312] NAMES <- toupper(added) [17:27:19.312] for (kk in seq_along(NAMES)) { [17:27:19.312] name <- added[[kk]] [17:27:19.312] NAME <- NAMES[[kk]] [17:27:19.312] if (name != NAME && is.element(NAME, old_names)) [17:27:19.312] next [17:27:19.312] args[[name]] <- "" [17:27:19.312] } [17:27:19.312] NAMES <- toupper(removed) [17:27:19.312] for (kk in seq_along(NAMES)) { [17:27:19.312] name <- removed[[kk]] [17:27:19.312] NAME <- NAMES[[kk]] [17:27:19.312] if (name != NAME && is.element(NAME, old_names)) [17:27:19.312] next [17:27:19.312] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.312] } [17:27:19.312] if (length(args) > 0) [17:27:19.312] base::do.call(base::Sys.setenv, args = args) [17:27:19.312] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.312] } [17:27:19.312] { [17:27:19.312] if (base::length(...future.futureOptionsAdded) > [17:27:19.312] 0L) { [17:27:19.312] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.312] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.312] base::options(opts) [17:27:19.312] } [17:27:19.312] { [17:27:19.312] { [17:27:19.312] NULL [17:27:19.312] RNGkind("Mersenne-Twister") [17:27:19.312] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.312] inherits = FALSE) [17:27:19.312] } [17:27:19.312] options(future.plan = NULL) [17:27:19.312] if (is.na(NA_character_)) [17:27:19.312] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.312] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.312] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.312] .init = FALSE) [17:27:19.312] } [17:27:19.312] } [17:27:19.312] } [17:27:19.312] }) [17:27:19.312] if (TRUE) { [17:27:19.312] base::sink(type = "output", split = FALSE) [17:27:19.312] if (TRUE) { [17:27:19.312] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.312] } [17:27:19.312] else { [17:27:19.312] ...future.result["stdout"] <- base::list(NULL) [17:27:19.312] } [17:27:19.312] base::close(...future.stdout) [17:27:19.312] ...future.stdout <- NULL [17:27:19.312] } [17:27:19.312] ...future.result$conditions <- ...future.conditions [17:27:19.312] ...future.result$finished <- base::Sys.time() [17:27:19.312] ...future.result [17:27:19.312] } [17:27:19.319] assign_globals() ... [17:27:19.319] List of 1 [17:27:19.319] $ a: num 1 [17:27:19.319] - attr(*, "where")=List of 1 [17:27:19.319] ..$ a: [17:27:19.319] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [17:27:19.319] - attr(*, "resolved")= logi FALSE [17:27:19.319] - attr(*, "total_size")= int 39 [17:27:19.319] - attr(*, "already-done")= logi TRUE [17:27:19.328] - copied 'a' to environment [17:27:19.329] assign_globals() ... done [17:27:19.329] plan(): Setting new future strategy stack: [17:27:19.330] List of future strategies: [17:27:19.330] 1. sequential: [17:27:19.330] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.330] - tweaked: FALSE [17:27:19.330] - call: NULL [17:27:19.331] plan(): nbrOfWorkers() = 1 [17:27:19.333] plan(): Setting new future strategy stack: [17:27:19.333] List of future strategies: [17:27:19.333] 1. sequential: [17:27:19.333] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.333] - tweaked: FALSE [17:27:19.333] - call: plan(strategy) [17:27:19.334] plan(): nbrOfWorkers() = 1 [17:27:19.335] SequentialFuture started (and completed) [17:27:19.335] - Launch lazy future ... done [17:27:19.335] run() for 'SequentialFuture' ... done [17:27:19.336] getGlobalsAndPackages() ... [17:27:19.336] Searching for globals... [17:27:19.338] - globals found: [3] '{', '*', 'a' [17:27:19.339] Searching for globals ... DONE [17:27:19.339] Resolving globals: FALSE [17:27:19.340] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:19.341] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:19.341] - globals: [1] 'a' [17:27:19.341] [17:27:19.341] getGlobalsAndPackages() ... DONE [17:27:19.342] run() for 'Future' ... [17:27:19.342] - state: 'created' [17:27:19.343] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.343] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.344] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.344] - Field: 'label' [17:27:19.344] - Field: 'local' [17:27:19.345] - Field: 'owner' [17:27:19.345] - Field: 'envir' [17:27:19.345] - Field: 'packages' [17:27:19.346] - Field: 'gc' [17:27:19.346] - Field: 'conditions' [17:27:19.346] - Field: 'expr' [17:27:19.346] - Field: 'uuid' [17:27:19.347] - Field: 'seed' [17:27:19.347] - Field: 'version' [17:27:19.347] - Field: 'result' [17:27:19.348] - Field: 'asynchronous' [17:27:19.348] - Field: 'calls' [17:27:19.348] - Field: 'globals' [17:27:19.349] - Field: 'stdout' [17:27:19.349] - Field: 'earlySignal' [17:27:19.349] - Field: 'lazy' [17:27:19.349] - Field: 'state' [17:27:19.350] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.350] - Launch lazy future ... [17:27:19.350] Packages needed by the future expression (n = 0): [17:27:19.351] Packages needed by future strategies (n = 0): [17:27:19.352] { [17:27:19.352] { [17:27:19.352] { [17:27:19.352] ...future.startTime <- base::Sys.time() [17:27:19.352] { [17:27:19.352] { [17:27:19.352] { [17:27:19.352] base::local({ [17:27:19.352] has_future <- base::requireNamespace("future", [17:27:19.352] quietly = TRUE) [17:27:19.352] if (has_future) { [17:27:19.352] ns <- base::getNamespace("future") [17:27:19.352] version <- ns[[".package"]][["version"]] [17:27:19.352] if (is.null(version)) [17:27:19.352] version <- utils::packageVersion("future") [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] version <- NULL [17:27:19.352] } [17:27:19.352] if (!has_future || version < "1.8.0") { [17:27:19.352] info <- base::c(r_version = base::gsub("R version ", [17:27:19.352] "", base::R.version$version.string), [17:27:19.352] platform = base::sprintf("%s (%s-bit)", [17:27:19.352] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.352] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.352] "release", "version")], collapse = " "), [17:27:19.352] hostname = base::Sys.info()[["nodename"]]) [17:27:19.352] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.352] info) [17:27:19.352] info <- base::paste(info, collapse = "; ") [17:27:19.352] if (!has_future) { [17:27:19.352] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.352] info) [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.352] info, version) [17:27:19.352] } [17:27:19.352] base::stop(msg) [17:27:19.352] } [17:27:19.352] }) [17:27:19.352] } [17:27:19.352] ...future.strategy.old <- future::plan("list") [17:27:19.352] options(future.plan = NULL) [17:27:19.352] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.352] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.352] } [17:27:19.352] ...future.workdir <- getwd() [17:27:19.352] } [17:27:19.352] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.352] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.352] } [17:27:19.352] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.352] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.352] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.352] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.352] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.352] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.352] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.352] base::names(...future.oldOptions)) [17:27:19.352] } [17:27:19.352] if (FALSE) { [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] if (TRUE) { [17:27:19.352] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.352] open = "w") [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.352] windows = "NUL", "/dev/null"), open = "w") [17:27:19.352] } [17:27:19.352] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.352] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.352] base::sink(type = "output", split = FALSE) [17:27:19.352] base::close(...future.stdout) [17:27:19.352] }, add = TRUE) [17:27:19.352] } [17:27:19.352] ...future.frame <- base::sys.nframe() [17:27:19.352] ...future.conditions <- base::list() [17:27:19.352] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.352] if (FALSE) { [17:27:19.352] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.352] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.352] } [17:27:19.352] ...future.result <- base::tryCatch({ [17:27:19.352] base::withCallingHandlers({ [17:27:19.352] ...future.value <- base::withVisible(base::local({ [17:27:19.352] 2 * a [17:27:19.352] })) [17:27:19.352] future::FutureResult(value = ...future.value$value, [17:27:19.352] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.352] ...future.rng), globalenv = if (FALSE) [17:27:19.352] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.352] ...future.globalenv.names)) [17:27:19.352] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.352] }, condition = base::local({ [17:27:19.352] c <- base::c [17:27:19.352] inherits <- base::inherits [17:27:19.352] invokeRestart <- base::invokeRestart [17:27:19.352] length <- base::length [17:27:19.352] list <- base::list [17:27:19.352] seq.int <- base::seq.int [17:27:19.352] signalCondition <- base::signalCondition [17:27:19.352] sys.calls <- base::sys.calls [17:27:19.352] `[[` <- base::`[[` [17:27:19.352] `+` <- base::`+` [17:27:19.352] `<<-` <- base::`<<-` [17:27:19.352] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.352] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.352] 3L)] [17:27:19.352] } [17:27:19.352] function(cond) { [17:27:19.352] is_error <- inherits(cond, "error") [17:27:19.352] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.352] NULL) [17:27:19.352] if (is_error) { [17:27:19.352] sessionInformation <- function() { [17:27:19.352] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.352] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.352] search = base::search(), system = base::Sys.info()) [17:27:19.352] } [17:27:19.352] ...future.conditions[[length(...future.conditions) + [17:27:19.352] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.352] cond$call), session = sessionInformation(), [17:27:19.352] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.352] signalCondition(cond) [17:27:19.352] } [17:27:19.352] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.352] "immediateCondition"))) { [17:27:19.352] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.352] ...future.conditions[[length(...future.conditions) + [17:27:19.352] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.352] if (TRUE && !signal) { [17:27:19.352] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.352] { [17:27:19.352] inherits <- base::inherits [17:27:19.352] invokeRestart <- base::invokeRestart [17:27:19.352] is.null <- base::is.null [17:27:19.352] muffled <- FALSE [17:27:19.352] if (inherits(cond, "message")) { [17:27:19.352] muffled <- grepl(pattern, "muffleMessage") [17:27:19.352] if (muffled) [17:27:19.352] invokeRestart("muffleMessage") [17:27:19.352] } [17:27:19.352] else if (inherits(cond, "warning")) { [17:27:19.352] muffled <- grepl(pattern, "muffleWarning") [17:27:19.352] if (muffled) [17:27:19.352] invokeRestart("muffleWarning") [17:27:19.352] } [17:27:19.352] else if (inherits(cond, "condition")) { [17:27:19.352] if (!is.null(pattern)) { [17:27:19.352] computeRestarts <- base::computeRestarts [17:27:19.352] grepl <- base::grepl [17:27:19.352] restarts <- computeRestarts(cond) [17:27:19.352] for (restart in restarts) { [17:27:19.352] name <- restart$name [17:27:19.352] if (is.null(name)) [17:27:19.352] next [17:27:19.352] if (!grepl(pattern, name)) [17:27:19.352] next [17:27:19.352] invokeRestart(restart) [17:27:19.352] muffled <- TRUE [17:27:19.352] break [17:27:19.352] } [17:27:19.352] } [17:27:19.352] } [17:27:19.352] invisible(muffled) [17:27:19.352] } [17:27:19.352] muffleCondition(cond, pattern = "^muffle") [17:27:19.352] } [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] if (TRUE) { [17:27:19.352] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.352] { [17:27:19.352] inherits <- base::inherits [17:27:19.352] invokeRestart <- base::invokeRestart [17:27:19.352] is.null <- base::is.null [17:27:19.352] muffled <- FALSE [17:27:19.352] if (inherits(cond, "message")) { [17:27:19.352] muffled <- grepl(pattern, "muffleMessage") [17:27:19.352] if (muffled) [17:27:19.352] invokeRestart("muffleMessage") [17:27:19.352] } [17:27:19.352] else if (inherits(cond, "warning")) { [17:27:19.352] muffled <- grepl(pattern, "muffleWarning") [17:27:19.352] if (muffled) [17:27:19.352] invokeRestart("muffleWarning") [17:27:19.352] } [17:27:19.352] else if (inherits(cond, "condition")) { [17:27:19.352] if (!is.null(pattern)) { [17:27:19.352] computeRestarts <- base::computeRestarts [17:27:19.352] grepl <- base::grepl [17:27:19.352] restarts <- computeRestarts(cond) [17:27:19.352] for (restart in restarts) { [17:27:19.352] name <- restart$name [17:27:19.352] if (is.null(name)) [17:27:19.352] next [17:27:19.352] if (!grepl(pattern, name)) [17:27:19.352] next [17:27:19.352] invokeRestart(restart) [17:27:19.352] muffled <- TRUE [17:27:19.352] break [17:27:19.352] } [17:27:19.352] } [17:27:19.352] } [17:27:19.352] invisible(muffled) [17:27:19.352] } [17:27:19.352] muffleCondition(cond, pattern = "^muffle") [17:27:19.352] } [17:27:19.352] } [17:27:19.352] } [17:27:19.352] })) [17:27:19.352] }, error = function(ex) { [17:27:19.352] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.352] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.352] ...future.rng), started = ...future.startTime, [17:27:19.352] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.352] version = "1.8"), class = "FutureResult") [17:27:19.352] }, finally = { [17:27:19.352] if (!identical(...future.workdir, getwd())) [17:27:19.352] setwd(...future.workdir) [17:27:19.352] { [17:27:19.352] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.352] ...future.oldOptions$nwarnings <- NULL [17:27:19.352] } [17:27:19.352] base::options(...future.oldOptions) [17:27:19.352] if (.Platform$OS.type == "windows") { [17:27:19.352] old_names <- names(...future.oldEnvVars) [17:27:19.352] envs <- base::Sys.getenv() [17:27:19.352] names <- names(envs) [17:27:19.352] common <- intersect(names, old_names) [17:27:19.352] added <- setdiff(names, old_names) [17:27:19.352] removed <- setdiff(old_names, names) [17:27:19.352] changed <- common[...future.oldEnvVars[common] != [17:27:19.352] envs[common]] [17:27:19.352] NAMES <- toupper(changed) [17:27:19.352] args <- list() [17:27:19.352] for (kk in seq_along(NAMES)) { [17:27:19.352] name <- changed[[kk]] [17:27:19.352] NAME <- NAMES[[kk]] [17:27:19.352] if (name != NAME && is.element(NAME, old_names)) [17:27:19.352] next [17:27:19.352] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.352] } [17:27:19.352] NAMES <- toupper(added) [17:27:19.352] for (kk in seq_along(NAMES)) { [17:27:19.352] name <- added[[kk]] [17:27:19.352] NAME <- NAMES[[kk]] [17:27:19.352] if (name != NAME && is.element(NAME, old_names)) [17:27:19.352] next [17:27:19.352] args[[name]] <- "" [17:27:19.352] } [17:27:19.352] NAMES <- toupper(removed) [17:27:19.352] for (kk in seq_along(NAMES)) { [17:27:19.352] name <- removed[[kk]] [17:27:19.352] NAME <- NAMES[[kk]] [17:27:19.352] if (name != NAME && is.element(NAME, old_names)) [17:27:19.352] next [17:27:19.352] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.352] } [17:27:19.352] if (length(args) > 0) [17:27:19.352] base::do.call(base::Sys.setenv, args = args) [17:27:19.352] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.352] } [17:27:19.352] { [17:27:19.352] if (base::length(...future.futureOptionsAdded) > [17:27:19.352] 0L) { [17:27:19.352] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.352] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.352] base::options(opts) [17:27:19.352] } [17:27:19.352] { [17:27:19.352] { [17:27:19.352] NULL [17:27:19.352] RNGkind("Mersenne-Twister") [17:27:19.352] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.352] inherits = FALSE) [17:27:19.352] } [17:27:19.352] options(future.plan = NULL) [17:27:19.352] if (is.na(NA_character_)) [17:27:19.352] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.352] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.352] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.352] .init = FALSE) [17:27:19.352] } [17:27:19.352] } [17:27:19.352] } [17:27:19.352] }) [17:27:19.352] if (TRUE) { [17:27:19.352] base::sink(type = "output", split = FALSE) [17:27:19.352] if (TRUE) { [17:27:19.352] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.352] } [17:27:19.352] else { [17:27:19.352] ...future.result["stdout"] <- base::list(NULL) [17:27:19.352] } [17:27:19.352] base::close(...future.stdout) [17:27:19.352] ...future.stdout <- NULL [17:27:19.352] } [17:27:19.352] ...future.result$conditions <- ...future.conditions [17:27:19.352] ...future.result$finished <- base::Sys.time() [17:27:19.352] ...future.result [17:27:19.352] } [17:27:19.358] assign_globals() ... [17:27:19.359] List of 1 [17:27:19.359] $ a: num 1 [17:27:19.359] - attr(*, "where")=List of 1 [17:27:19.359] ..$ a: [17:27:19.359] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [17:27:19.359] - attr(*, "resolved")= logi FALSE [17:27:19.359] - attr(*, "total_size")= int 39 [17:27:19.359] - attr(*, "already-done")= logi TRUE [17:27:19.368] - copied 'a' to environment [17:27:19.368] assign_globals() ... done [17:27:19.369] plan(): Setting new future strategy stack: [17:27:19.369] List of future strategies: [17:27:19.369] 1. sequential: [17:27:19.369] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.369] - tweaked: FALSE [17:27:19.369] - call: NULL [17:27:19.370] plan(): nbrOfWorkers() = 1 [17:27:19.372] plan(): Setting new future strategy stack: [17:27:19.372] List of future strategies: [17:27:19.372] 1. sequential: [17:27:19.372] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.372] - tweaked: FALSE [17:27:19.372] - call: plan(strategy) [17:27:19.373] plan(): nbrOfWorkers() = 1 [17:27:19.373] SequentialFuture started (and completed) [17:27:19.373] - Launch lazy future ... done [17:27:19.373] run() for 'SequentialFuture' ... done [17:27:19.374] getGlobalsAndPackages() ... [17:27:19.374] Searching for globals... [17:27:19.375] - globals found: [3] '{', '*', 'a' [17:27:19.376] Searching for globals ... DONE [17:27:19.376] Resolving globals: FALSE [17:27:19.377] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:19.378] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:19.378] - globals: [1] 'a' [17:27:19.379] [17:27:19.379] getGlobalsAndPackages() ... DONE [17:27:19.379] run() for 'Future' ... [17:27:19.380] - state: 'created' [17:27:19.380] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.381] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.381] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.382] - Field: 'label' [17:27:19.382] - Field: 'local' [17:27:19.382] - Field: 'owner' [17:27:19.383] - Field: 'envir' [17:27:19.383] - Field: 'packages' [17:27:19.383] - Field: 'gc' [17:27:19.384] - Field: 'conditions' [17:27:19.384] - Field: 'expr' [17:27:19.384] - Field: 'uuid' [17:27:19.384] - Field: 'seed' [17:27:19.385] - Field: 'version' [17:27:19.385] - Field: 'result' [17:27:19.385] - Field: 'asynchronous' [17:27:19.385] - Field: 'calls' [17:27:19.386] - Field: 'globals' [17:27:19.386] - Field: 'stdout' [17:27:19.386] - Field: 'earlySignal' [17:27:19.387] - Field: 'lazy' [17:27:19.387] - Field: 'state' [17:27:19.387] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.388] - Launch lazy future ... [17:27:19.388] Packages needed by the future expression (n = 0): [17:27:19.389] Packages needed by future strategies (n = 0): [17:27:19.390] { [17:27:19.390] { [17:27:19.390] { [17:27:19.390] ...future.startTime <- base::Sys.time() [17:27:19.390] { [17:27:19.390] { [17:27:19.390] { [17:27:19.390] base::local({ [17:27:19.390] has_future <- base::requireNamespace("future", [17:27:19.390] quietly = TRUE) [17:27:19.390] if (has_future) { [17:27:19.390] ns <- base::getNamespace("future") [17:27:19.390] version <- ns[[".package"]][["version"]] [17:27:19.390] if (is.null(version)) [17:27:19.390] version <- utils::packageVersion("future") [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] version <- NULL [17:27:19.390] } [17:27:19.390] if (!has_future || version < "1.8.0") { [17:27:19.390] info <- base::c(r_version = base::gsub("R version ", [17:27:19.390] "", base::R.version$version.string), [17:27:19.390] platform = base::sprintf("%s (%s-bit)", [17:27:19.390] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.390] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.390] "release", "version")], collapse = " "), [17:27:19.390] hostname = base::Sys.info()[["nodename"]]) [17:27:19.390] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.390] info) [17:27:19.390] info <- base::paste(info, collapse = "; ") [17:27:19.390] if (!has_future) { [17:27:19.390] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.390] info) [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.390] info, version) [17:27:19.390] } [17:27:19.390] base::stop(msg) [17:27:19.390] } [17:27:19.390] }) [17:27:19.390] } [17:27:19.390] ...future.strategy.old <- future::plan("list") [17:27:19.390] options(future.plan = NULL) [17:27:19.390] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.390] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.390] } [17:27:19.390] ...future.workdir <- getwd() [17:27:19.390] } [17:27:19.390] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.390] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.390] } [17:27:19.390] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.390] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.390] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.390] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.390] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.390] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.390] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.390] base::names(...future.oldOptions)) [17:27:19.390] } [17:27:19.390] if (FALSE) { [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] if (TRUE) { [17:27:19.390] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.390] open = "w") [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.390] windows = "NUL", "/dev/null"), open = "w") [17:27:19.390] } [17:27:19.390] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.390] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.390] base::sink(type = "output", split = FALSE) [17:27:19.390] base::close(...future.stdout) [17:27:19.390] }, add = TRUE) [17:27:19.390] } [17:27:19.390] ...future.frame <- base::sys.nframe() [17:27:19.390] ...future.conditions <- base::list() [17:27:19.390] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.390] if (FALSE) { [17:27:19.390] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.390] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.390] } [17:27:19.390] ...future.result <- base::tryCatch({ [17:27:19.390] base::withCallingHandlers({ [17:27:19.390] ...future.value <- base::withVisible(base::local({ [17:27:19.390] 2 * a [17:27:19.390] })) [17:27:19.390] future::FutureResult(value = ...future.value$value, [17:27:19.390] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.390] ...future.rng), globalenv = if (FALSE) [17:27:19.390] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.390] ...future.globalenv.names)) [17:27:19.390] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.390] }, condition = base::local({ [17:27:19.390] c <- base::c [17:27:19.390] inherits <- base::inherits [17:27:19.390] invokeRestart <- base::invokeRestart [17:27:19.390] length <- base::length [17:27:19.390] list <- base::list [17:27:19.390] seq.int <- base::seq.int [17:27:19.390] signalCondition <- base::signalCondition [17:27:19.390] sys.calls <- base::sys.calls [17:27:19.390] `[[` <- base::`[[` [17:27:19.390] `+` <- base::`+` [17:27:19.390] `<<-` <- base::`<<-` [17:27:19.390] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.390] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.390] 3L)] [17:27:19.390] } [17:27:19.390] function(cond) { [17:27:19.390] is_error <- inherits(cond, "error") [17:27:19.390] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.390] NULL) [17:27:19.390] if (is_error) { [17:27:19.390] sessionInformation <- function() { [17:27:19.390] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.390] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.390] search = base::search(), system = base::Sys.info()) [17:27:19.390] } [17:27:19.390] ...future.conditions[[length(...future.conditions) + [17:27:19.390] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.390] cond$call), session = sessionInformation(), [17:27:19.390] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.390] signalCondition(cond) [17:27:19.390] } [17:27:19.390] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.390] "immediateCondition"))) { [17:27:19.390] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.390] ...future.conditions[[length(...future.conditions) + [17:27:19.390] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.390] if (TRUE && !signal) { [17:27:19.390] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.390] { [17:27:19.390] inherits <- base::inherits [17:27:19.390] invokeRestart <- base::invokeRestart [17:27:19.390] is.null <- base::is.null [17:27:19.390] muffled <- FALSE [17:27:19.390] if (inherits(cond, "message")) { [17:27:19.390] muffled <- grepl(pattern, "muffleMessage") [17:27:19.390] if (muffled) [17:27:19.390] invokeRestart("muffleMessage") [17:27:19.390] } [17:27:19.390] else if (inherits(cond, "warning")) { [17:27:19.390] muffled <- grepl(pattern, "muffleWarning") [17:27:19.390] if (muffled) [17:27:19.390] invokeRestart("muffleWarning") [17:27:19.390] } [17:27:19.390] else if (inherits(cond, "condition")) { [17:27:19.390] if (!is.null(pattern)) { [17:27:19.390] computeRestarts <- base::computeRestarts [17:27:19.390] grepl <- base::grepl [17:27:19.390] restarts <- computeRestarts(cond) [17:27:19.390] for (restart in restarts) { [17:27:19.390] name <- restart$name [17:27:19.390] if (is.null(name)) [17:27:19.390] next [17:27:19.390] if (!grepl(pattern, name)) [17:27:19.390] next [17:27:19.390] invokeRestart(restart) [17:27:19.390] muffled <- TRUE [17:27:19.390] break [17:27:19.390] } [17:27:19.390] } [17:27:19.390] } [17:27:19.390] invisible(muffled) [17:27:19.390] } [17:27:19.390] muffleCondition(cond, pattern = "^muffle") [17:27:19.390] } [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] if (TRUE) { [17:27:19.390] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.390] { [17:27:19.390] inherits <- base::inherits [17:27:19.390] invokeRestart <- base::invokeRestart [17:27:19.390] is.null <- base::is.null [17:27:19.390] muffled <- FALSE [17:27:19.390] if (inherits(cond, "message")) { [17:27:19.390] muffled <- grepl(pattern, "muffleMessage") [17:27:19.390] if (muffled) [17:27:19.390] invokeRestart("muffleMessage") [17:27:19.390] } [17:27:19.390] else if (inherits(cond, "warning")) { [17:27:19.390] muffled <- grepl(pattern, "muffleWarning") [17:27:19.390] if (muffled) [17:27:19.390] invokeRestart("muffleWarning") [17:27:19.390] } [17:27:19.390] else if (inherits(cond, "condition")) { [17:27:19.390] if (!is.null(pattern)) { [17:27:19.390] computeRestarts <- base::computeRestarts [17:27:19.390] grepl <- base::grepl [17:27:19.390] restarts <- computeRestarts(cond) [17:27:19.390] for (restart in restarts) { [17:27:19.390] name <- restart$name [17:27:19.390] if (is.null(name)) [17:27:19.390] next [17:27:19.390] if (!grepl(pattern, name)) [17:27:19.390] next [17:27:19.390] invokeRestart(restart) [17:27:19.390] muffled <- TRUE [17:27:19.390] break [17:27:19.390] } [17:27:19.390] } [17:27:19.390] } [17:27:19.390] invisible(muffled) [17:27:19.390] } [17:27:19.390] muffleCondition(cond, pattern = "^muffle") [17:27:19.390] } [17:27:19.390] } [17:27:19.390] } [17:27:19.390] })) [17:27:19.390] }, error = function(ex) { [17:27:19.390] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.390] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.390] ...future.rng), started = ...future.startTime, [17:27:19.390] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.390] version = "1.8"), class = "FutureResult") [17:27:19.390] }, finally = { [17:27:19.390] if (!identical(...future.workdir, getwd())) [17:27:19.390] setwd(...future.workdir) [17:27:19.390] { [17:27:19.390] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.390] ...future.oldOptions$nwarnings <- NULL [17:27:19.390] } [17:27:19.390] base::options(...future.oldOptions) [17:27:19.390] if (.Platform$OS.type == "windows") { [17:27:19.390] old_names <- names(...future.oldEnvVars) [17:27:19.390] envs <- base::Sys.getenv() [17:27:19.390] names <- names(envs) [17:27:19.390] common <- intersect(names, old_names) [17:27:19.390] added <- setdiff(names, old_names) [17:27:19.390] removed <- setdiff(old_names, names) [17:27:19.390] changed <- common[...future.oldEnvVars[common] != [17:27:19.390] envs[common]] [17:27:19.390] NAMES <- toupper(changed) [17:27:19.390] args <- list() [17:27:19.390] for (kk in seq_along(NAMES)) { [17:27:19.390] name <- changed[[kk]] [17:27:19.390] NAME <- NAMES[[kk]] [17:27:19.390] if (name != NAME && is.element(NAME, old_names)) [17:27:19.390] next [17:27:19.390] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.390] } [17:27:19.390] NAMES <- toupper(added) [17:27:19.390] for (kk in seq_along(NAMES)) { [17:27:19.390] name <- added[[kk]] [17:27:19.390] NAME <- NAMES[[kk]] [17:27:19.390] if (name != NAME && is.element(NAME, old_names)) [17:27:19.390] next [17:27:19.390] args[[name]] <- "" [17:27:19.390] } [17:27:19.390] NAMES <- toupper(removed) [17:27:19.390] for (kk in seq_along(NAMES)) { [17:27:19.390] name <- removed[[kk]] [17:27:19.390] NAME <- NAMES[[kk]] [17:27:19.390] if (name != NAME && is.element(NAME, old_names)) [17:27:19.390] next [17:27:19.390] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.390] } [17:27:19.390] if (length(args) > 0) [17:27:19.390] base::do.call(base::Sys.setenv, args = args) [17:27:19.390] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.390] } [17:27:19.390] { [17:27:19.390] if (base::length(...future.futureOptionsAdded) > [17:27:19.390] 0L) { [17:27:19.390] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.390] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.390] base::options(opts) [17:27:19.390] } [17:27:19.390] { [17:27:19.390] { [17:27:19.390] NULL [17:27:19.390] RNGkind("Mersenne-Twister") [17:27:19.390] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.390] inherits = FALSE) [17:27:19.390] } [17:27:19.390] options(future.plan = NULL) [17:27:19.390] if (is.na(NA_character_)) [17:27:19.390] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.390] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.390] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.390] .init = FALSE) [17:27:19.390] } [17:27:19.390] } [17:27:19.390] } [17:27:19.390] }) [17:27:19.390] if (TRUE) { [17:27:19.390] base::sink(type = "output", split = FALSE) [17:27:19.390] if (TRUE) { [17:27:19.390] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.390] } [17:27:19.390] else { [17:27:19.390] ...future.result["stdout"] <- base::list(NULL) [17:27:19.390] } [17:27:19.390] base::close(...future.stdout) [17:27:19.390] ...future.stdout <- NULL [17:27:19.390] } [17:27:19.390] ...future.result$conditions <- ...future.conditions [17:27:19.390] ...future.result$finished <- base::Sys.time() [17:27:19.390] ...future.result [17:27:19.390] } [17:27:19.397] assign_globals() ... [17:27:19.397] List of 1 [17:27:19.397] $ a: num 1 [17:27:19.397] - attr(*, "where")=List of 1 [17:27:19.397] ..$ a: [17:27:19.397] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [17:27:19.397] - attr(*, "resolved")= logi FALSE [17:27:19.397] - attr(*, "total_size")= int 39 [17:27:19.397] - attr(*, "already-done")= logi TRUE [17:27:19.403] - copied 'a' to environment [17:27:19.403] assign_globals() ... done [17:27:19.404] plan(): Setting new future strategy stack: [17:27:19.404] List of future strategies: [17:27:19.404] 1. sequential: [17:27:19.404] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.404] - tweaked: FALSE [17:27:19.404] - call: NULL [17:27:19.406] plan(): nbrOfWorkers() = 1 [17:27:19.408] plan(): Setting new future strategy stack: [17:27:19.408] List of future strategies: [17:27:19.408] 1. sequential: [17:27:19.408] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.408] - tweaked: FALSE [17:27:19.408] - call: plan(strategy) [17:27:19.409] plan(): nbrOfWorkers() = 1 [17:27:19.410] SequentialFuture started (and completed) [17:27:19.410] - Launch lazy future ... done [17:27:19.410] run() for 'SequentialFuture' ... done [17:27:19.411] getGlobalsAndPackages() ... [17:27:19.411] Searching for globals... [17:27:19.413] - globals found: [3] '{', '*', 'a' [17:27:19.414] Searching for globals ... DONE [17:27:19.414] Resolving globals: FALSE [17:27:19.415] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:19.415] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:19.416] - globals: [1] 'a' [17:27:19.416] [17:27:19.416] getGlobalsAndPackages() ... DONE [17:27:19.417] run() for 'Future' ... [17:27:19.417] - state: 'created' [17:27:19.418] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.421] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.422] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.422] - Field: 'label' [17:27:19.422] - Field: 'local' [17:27:19.423] - Field: 'owner' [17:27:19.423] - Field: 'envir' [17:27:19.423] - Field: 'packages' [17:27:19.424] - Field: 'gc' [17:27:19.424] - Field: 'conditions' [17:27:19.424] - Field: 'expr' [17:27:19.425] - Field: 'uuid' [17:27:19.425] - Field: 'seed' [17:27:19.425] - Field: 'version' [17:27:19.425] - Field: 'result' [17:27:19.426] - Field: 'asynchronous' [17:27:19.426] - Field: 'calls' [17:27:19.426] - Field: 'globals' [17:27:19.427] - Field: 'stdout' [17:27:19.427] - Field: 'earlySignal' [17:27:19.427] - Field: 'lazy' [17:27:19.428] - Field: 'state' [17:27:19.428] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.428] - Launch lazy future ... [17:27:19.429] Packages needed by the future expression (n = 0): [17:27:19.429] Packages needed by future strategies (n = 0): [17:27:19.430] { [17:27:19.430] { [17:27:19.430] { [17:27:19.430] ...future.startTime <- base::Sys.time() [17:27:19.430] { [17:27:19.430] { [17:27:19.430] { [17:27:19.430] base::local({ [17:27:19.430] has_future <- base::requireNamespace("future", [17:27:19.430] quietly = TRUE) [17:27:19.430] if (has_future) { [17:27:19.430] ns <- base::getNamespace("future") [17:27:19.430] version <- ns[[".package"]][["version"]] [17:27:19.430] if (is.null(version)) [17:27:19.430] version <- utils::packageVersion("future") [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] version <- NULL [17:27:19.430] } [17:27:19.430] if (!has_future || version < "1.8.0") { [17:27:19.430] info <- base::c(r_version = base::gsub("R version ", [17:27:19.430] "", base::R.version$version.string), [17:27:19.430] platform = base::sprintf("%s (%s-bit)", [17:27:19.430] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.430] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.430] "release", "version")], collapse = " "), [17:27:19.430] hostname = base::Sys.info()[["nodename"]]) [17:27:19.430] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.430] info) [17:27:19.430] info <- base::paste(info, collapse = "; ") [17:27:19.430] if (!has_future) { [17:27:19.430] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.430] info) [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.430] info, version) [17:27:19.430] } [17:27:19.430] base::stop(msg) [17:27:19.430] } [17:27:19.430] }) [17:27:19.430] } [17:27:19.430] ...future.strategy.old <- future::plan("list") [17:27:19.430] options(future.plan = NULL) [17:27:19.430] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.430] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.430] } [17:27:19.430] ...future.workdir <- getwd() [17:27:19.430] } [17:27:19.430] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.430] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.430] } [17:27:19.430] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.430] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.430] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.430] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.430] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.430] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.430] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.430] base::names(...future.oldOptions)) [17:27:19.430] } [17:27:19.430] if (FALSE) { [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] if (TRUE) { [17:27:19.430] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.430] open = "w") [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.430] windows = "NUL", "/dev/null"), open = "w") [17:27:19.430] } [17:27:19.430] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.430] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.430] base::sink(type = "output", split = FALSE) [17:27:19.430] base::close(...future.stdout) [17:27:19.430] }, add = TRUE) [17:27:19.430] } [17:27:19.430] ...future.frame <- base::sys.nframe() [17:27:19.430] ...future.conditions <- base::list() [17:27:19.430] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.430] if (FALSE) { [17:27:19.430] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.430] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.430] } [17:27:19.430] ...future.result <- base::tryCatch({ [17:27:19.430] base::withCallingHandlers({ [17:27:19.430] ...future.value <- base::withVisible(base::local({ [17:27:19.430] 2 * a [17:27:19.430] })) [17:27:19.430] future::FutureResult(value = ...future.value$value, [17:27:19.430] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.430] ...future.rng), globalenv = if (FALSE) [17:27:19.430] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.430] ...future.globalenv.names)) [17:27:19.430] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.430] }, condition = base::local({ [17:27:19.430] c <- base::c [17:27:19.430] inherits <- base::inherits [17:27:19.430] invokeRestart <- base::invokeRestart [17:27:19.430] length <- base::length [17:27:19.430] list <- base::list [17:27:19.430] seq.int <- base::seq.int [17:27:19.430] signalCondition <- base::signalCondition [17:27:19.430] sys.calls <- base::sys.calls [17:27:19.430] `[[` <- base::`[[` [17:27:19.430] `+` <- base::`+` [17:27:19.430] `<<-` <- base::`<<-` [17:27:19.430] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.430] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.430] 3L)] [17:27:19.430] } [17:27:19.430] function(cond) { [17:27:19.430] is_error <- inherits(cond, "error") [17:27:19.430] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.430] NULL) [17:27:19.430] if (is_error) { [17:27:19.430] sessionInformation <- function() { [17:27:19.430] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.430] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.430] search = base::search(), system = base::Sys.info()) [17:27:19.430] } [17:27:19.430] ...future.conditions[[length(...future.conditions) + [17:27:19.430] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.430] cond$call), session = sessionInformation(), [17:27:19.430] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.430] signalCondition(cond) [17:27:19.430] } [17:27:19.430] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.430] "immediateCondition"))) { [17:27:19.430] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.430] ...future.conditions[[length(...future.conditions) + [17:27:19.430] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.430] if (TRUE && !signal) { [17:27:19.430] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.430] { [17:27:19.430] inherits <- base::inherits [17:27:19.430] invokeRestart <- base::invokeRestart [17:27:19.430] is.null <- base::is.null [17:27:19.430] muffled <- FALSE [17:27:19.430] if (inherits(cond, "message")) { [17:27:19.430] muffled <- grepl(pattern, "muffleMessage") [17:27:19.430] if (muffled) [17:27:19.430] invokeRestart("muffleMessage") [17:27:19.430] } [17:27:19.430] else if (inherits(cond, "warning")) { [17:27:19.430] muffled <- grepl(pattern, "muffleWarning") [17:27:19.430] if (muffled) [17:27:19.430] invokeRestart("muffleWarning") [17:27:19.430] } [17:27:19.430] else if (inherits(cond, "condition")) { [17:27:19.430] if (!is.null(pattern)) { [17:27:19.430] computeRestarts <- base::computeRestarts [17:27:19.430] grepl <- base::grepl [17:27:19.430] restarts <- computeRestarts(cond) [17:27:19.430] for (restart in restarts) { [17:27:19.430] name <- restart$name [17:27:19.430] if (is.null(name)) [17:27:19.430] next [17:27:19.430] if (!grepl(pattern, name)) [17:27:19.430] next [17:27:19.430] invokeRestart(restart) [17:27:19.430] muffled <- TRUE [17:27:19.430] break [17:27:19.430] } [17:27:19.430] } [17:27:19.430] } [17:27:19.430] invisible(muffled) [17:27:19.430] } [17:27:19.430] muffleCondition(cond, pattern = "^muffle") [17:27:19.430] } [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] if (TRUE) { [17:27:19.430] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.430] { [17:27:19.430] inherits <- base::inherits [17:27:19.430] invokeRestart <- base::invokeRestart [17:27:19.430] is.null <- base::is.null [17:27:19.430] muffled <- FALSE [17:27:19.430] if (inherits(cond, "message")) { [17:27:19.430] muffled <- grepl(pattern, "muffleMessage") [17:27:19.430] if (muffled) [17:27:19.430] invokeRestart("muffleMessage") [17:27:19.430] } [17:27:19.430] else if (inherits(cond, "warning")) { [17:27:19.430] muffled <- grepl(pattern, "muffleWarning") [17:27:19.430] if (muffled) [17:27:19.430] invokeRestart("muffleWarning") [17:27:19.430] } [17:27:19.430] else if (inherits(cond, "condition")) { [17:27:19.430] if (!is.null(pattern)) { [17:27:19.430] computeRestarts <- base::computeRestarts [17:27:19.430] grepl <- base::grepl [17:27:19.430] restarts <- computeRestarts(cond) [17:27:19.430] for (restart in restarts) { [17:27:19.430] name <- restart$name [17:27:19.430] if (is.null(name)) [17:27:19.430] next [17:27:19.430] if (!grepl(pattern, name)) [17:27:19.430] next [17:27:19.430] invokeRestart(restart) [17:27:19.430] muffled <- TRUE [17:27:19.430] break [17:27:19.430] } [17:27:19.430] } [17:27:19.430] } [17:27:19.430] invisible(muffled) [17:27:19.430] } [17:27:19.430] muffleCondition(cond, pattern = "^muffle") [17:27:19.430] } [17:27:19.430] } [17:27:19.430] } [17:27:19.430] })) [17:27:19.430] }, error = function(ex) { [17:27:19.430] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.430] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.430] ...future.rng), started = ...future.startTime, [17:27:19.430] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.430] version = "1.8"), class = "FutureResult") [17:27:19.430] }, finally = { [17:27:19.430] if (!identical(...future.workdir, getwd())) [17:27:19.430] setwd(...future.workdir) [17:27:19.430] { [17:27:19.430] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.430] ...future.oldOptions$nwarnings <- NULL [17:27:19.430] } [17:27:19.430] base::options(...future.oldOptions) [17:27:19.430] if (.Platform$OS.type == "windows") { [17:27:19.430] old_names <- names(...future.oldEnvVars) [17:27:19.430] envs <- base::Sys.getenv() [17:27:19.430] names <- names(envs) [17:27:19.430] common <- intersect(names, old_names) [17:27:19.430] added <- setdiff(names, old_names) [17:27:19.430] removed <- setdiff(old_names, names) [17:27:19.430] changed <- common[...future.oldEnvVars[common] != [17:27:19.430] envs[common]] [17:27:19.430] NAMES <- toupper(changed) [17:27:19.430] args <- list() [17:27:19.430] for (kk in seq_along(NAMES)) { [17:27:19.430] name <- changed[[kk]] [17:27:19.430] NAME <- NAMES[[kk]] [17:27:19.430] if (name != NAME && is.element(NAME, old_names)) [17:27:19.430] next [17:27:19.430] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.430] } [17:27:19.430] NAMES <- toupper(added) [17:27:19.430] for (kk in seq_along(NAMES)) { [17:27:19.430] name <- added[[kk]] [17:27:19.430] NAME <- NAMES[[kk]] [17:27:19.430] if (name != NAME && is.element(NAME, old_names)) [17:27:19.430] next [17:27:19.430] args[[name]] <- "" [17:27:19.430] } [17:27:19.430] NAMES <- toupper(removed) [17:27:19.430] for (kk in seq_along(NAMES)) { [17:27:19.430] name <- removed[[kk]] [17:27:19.430] NAME <- NAMES[[kk]] [17:27:19.430] if (name != NAME && is.element(NAME, old_names)) [17:27:19.430] next [17:27:19.430] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.430] } [17:27:19.430] if (length(args) > 0) [17:27:19.430] base::do.call(base::Sys.setenv, args = args) [17:27:19.430] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.430] } [17:27:19.430] { [17:27:19.430] if (base::length(...future.futureOptionsAdded) > [17:27:19.430] 0L) { [17:27:19.430] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.430] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.430] base::options(opts) [17:27:19.430] } [17:27:19.430] { [17:27:19.430] { [17:27:19.430] NULL [17:27:19.430] RNGkind("Mersenne-Twister") [17:27:19.430] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.430] inherits = FALSE) [17:27:19.430] } [17:27:19.430] options(future.plan = NULL) [17:27:19.430] if (is.na(NA_character_)) [17:27:19.430] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.430] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.430] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.430] .init = FALSE) [17:27:19.430] } [17:27:19.430] } [17:27:19.430] } [17:27:19.430] }) [17:27:19.430] if (TRUE) { [17:27:19.430] base::sink(type = "output", split = FALSE) [17:27:19.430] if (TRUE) { [17:27:19.430] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.430] } [17:27:19.430] else { [17:27:19.430] ...future.result["stdout"] <- base::list(NULL) [17:27:19.430] } [17:27:19.430] base::close(...future.stdout) [17:27:19.430] ...future.stdout <- NULL [17:27:19.430] } [17:27:19.430] ...future.result$conditions <- ...future.conditions [17:27:19.430] ...future.result$finished <- base::Sys.time() [17:27:19.430] ...future.result [17:27:19.430] } [17:27:19.436] assign_globals() ... [17:27:19.436] List of 1 [17:27:19.436] $ a: num 1 [17:27:19.436] - attr(*, "where")=List of 1 [17:27:19.436] ..$ a: [17:27:19.436] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [17:27:19.436] - attr(*, "resolved")= logi FALSE [17:27:19.436] - attr(*, "total_size")= int 39 [17:27:19.436] - attr(*, "already-done")= logi TRUE [17:27:19.444] - copied 'a' to environment [17:27:19.444] assign_globals() ... done [17:27:19.445] plan(): Setting new future strategy stack: [17:27:19.445] List of future strategies: [17:27:19.445] 1. sequential: [17:27:19.445] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.445] - tweaked: FALSE [17:27:19.445] - call: NULL [17:27:19.446] plan(): nbrOfWorkers() = 1 [17:27:19.448] plan(): Setting new future strategy stack: [17:27:19.449] List of future strategies: [17:27:19.449] 1. sequential: [17:27:19.449] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.449] - tweaked: FALSE [17:27:19.449] - call: plan(strategy) [17:27:19.451] plan(): nbrOfWorkers() = 1 [17:27:19.452] SequentialFuture started (and completed) [17:27:19.452] - Launch lazy future ... done [17:27:19.452] run() for 'SequentialFuture' ... done [17:27:19.453] getGlobalsAndPackages() ... [17:27:19.453] Searching for globals... [17:27:19.456] - globals found: [3] '{', '*', 'a' [17:27:19.456] Searching for globals ... DONE [17:27:19.457] Resolving globals: FALSE [17:27:19.458] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:19.459] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:19.459] - globals: [1] 'a' [17:27:19.460] [17:27:19.460] getGlobalsAndPackages() ... DONE [17:27:19.461] run() for 'Future' ... [17:27:19.461] - state: 'created' [17:27:19.462] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [17:27:19.462] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [17:27:19.463] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [17:27:19.463] - Field: 'label' [17:27:19.463] - Field: 'local' [17:27:19.464] - Field: 'owner' [17:27:19.464] - Field: 'envir' [17:27:19.464] - Field: 'packages' [17:27:19.465] - Field: 'gc' [17:27:19.465] - Field: 'conditions' [17:27:19.466] - Field: 'expr' [17:27:19.466] - Field: 'uuid' [17:27:19.466] - Field: 'seed' [17:27:19.467] - Field: 'version' [17:27:19.467] - Field: 'result' [17:27:19.467] - Field: 'asynchronous' [17:27:19.468] - Field: 'calls' [17:27:19.468] - Field: 'globals' [17:27:19.468] - Field: 'stdout' [17:27:19.469] - Field: 'earlySignal' [17:27:19.469] - Field: 'lazy' [17:27:19.470] - Field: 'state' [17:27:19.470] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [17:27:19.470] - Launch lazy future ... [17:27:19.471] Packages needed by the future expression (n = 0): [17:27:19.471] Packages needed by future strategies (n = 0): [17:27:19.472] { [17:27:19.472] { [17:27:19.472] { [17:27:19.472] ...future.startTime <- base::Sys.time() [17:27:19.472] { [17:27:19.472] { [17:27:19.472] { [17:27:19.472] base::local({ [17:27:19.472] has_future <- base::requireNamespace("future", [17:27:19.472] quietly = TRUE) [17:27:19.472] if (has_future) { [17:27:19.472] ns <- base::getNamespace("future") [17:27:19.472] version <- ns[[".package"]][["version"]] [17:27:19.472] if (is.null(version)) [17:27:19.472] version <- utils::packageVersion("future") [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] version <- NULL [17:27:19.472] } [17:27:19.472] if (!has_future || version < "1.8.0") { [17:27:19.472] info <- base::c(r_version = base::gsub("R version ", [17:27:19.472] "", base::R.version$version.string), [17:27:19.472] platform = base::sprintf("%s (%s-bit)", [17:27:19.472] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:19.472] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:19.472] "release", "version")], collapse = " "), [17:27:19.472] hostname = base::Sys.info()[["nodename"]]) [17:27:19.472] info <- base::sprintf("%s: %s", base::names(info), [17:27:19.472] info) [17:27:19.472] info <- base::paste(info, collapse = "; ") [17:27:19.472] if (!has_future) { [17:27:19.472] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:19.472] info) [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:19.472] info, version) [17:27:19.472] } [17:27:19.472] base::stop(msg) [17:27:19.472] } [17:27:19.472] }) [17:27:19.472] } [17:27:19.472] ...future.strategy.old <- future::plan("list") [17:27:19.472] options(future.plan = NULL) [17:27:19.472] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.472] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:19.472] } [17:27:19.472] ...future.workdir <- getwd() [17:27:19.472] } [17:27:19.472] ...future.oldOptions <- base::as.list(base::.Options) [17:27:19.472] ...future.oldEnvVars <- base::Sys.getenv() [17:27:19.472] } [17:27:19.472] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:19.472] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:19.472] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:19.472] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:19.472] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:19.472] future.stdout.windows.reencode = NULL, width = 80L) [17:27:19.472] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:19.472] base::names(...future.oldOptions)) [17:27:19.472] } [17:27:19.472] if (FALSE) { [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] if (TRUE) { [17:27:19.472] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:19.472] open = "w") [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:19.472] windows = "NUL", "/dev/null"), open = "w") [17:27:19.472] } [17:27:19.472] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:19.472] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:19.472] base::sink(type = "output", split = FALSE) [17:27:19.472] base::close(...future.stdout) [17:27:19.472] }, add = TRUE) [17:27:19.472] } [17:27:19.472] ...future.frame <- base::sys.nframe() [17:27:19.472] ...future.conditions <- base::list() [17:27:19.472] ...future.rng <- base::globalenv()$.Random.seed [17:27:19.472] if (FALSE) { [17:27:19.472] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:19.472] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:19.472] } [17:27:19.472] ...future.result <- base::tryCatch({ [17:27:19.472] base::withCallingHandlers({ [17:27:19.472] ...future.value <- base::withVisible(base::local({ [17:27:19.472] 2 * a [17:27:19.472] })) [17:27:19.472] future::FutureResult(value = ...future.value$value, [17:27:19.472] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.472] ...future.rng), globalenv = if (FALSE) [17:27:19.472] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:19.472] ...future.globalenv.names)) [17:27:19.472] else NULL, started = ...future.startTime, version = "1.8") [17:27:19.472] }, condition = base::local({ [17:27:19.472] c <- base::c [17:27:19.472] inherits <- base::inherits [17:27:19.472] invokeRestart <- base::invokeRestart [17:27:19.472] length <- base::length [17:27:19.472] list <- base::list [17:27:19.472] seq.int <- base::seq.int [17:27:19.472] signalCondition <- base::signalCondition [17:27:19.472] sys.calls <- base::sys.calls [17:27:19.472] `[[` <- base::`[[` [17:27:19.472] `+` <- base::`+` [17:27:19.472] `<<-` <- base::`<<-` [17:27:19.472] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:19.472] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:19.472] 3L)] [17:27:19.472] } [17:27:19.472] function(cond) { [17:27:19.472] is_error <- inherits(cond, "error") [17:27:19.472] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:19.472] NULL) [17:27:19.472] if (is_error) { [17:27:19.472] sessionInformation <- function() { [17:27:19.472] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:19.472] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:19.472] search = base::search(), system = base::Sys.info()) [17:27:19.472] } [17:27:19.472] ...future.conditions[[length(...future.conditions) + [17:27:19.472] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:19.472] cond$call), session = sessionInformation(), [17:27:19.472] timestamp = base::Sys.time(), signaled = 0L) [17:27:19.472] signalCondition(cond) [17:27:19.472] } [17:27:19.472] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:19.472] "immediateCondition"))) { [17:27:19.472] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:19.472] ...future.conditions[[length(...future.conditions) + [17:27:19.472] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:19.472] if (TRUE && !signal) { [17:27:19.472] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.472] { [17:27:19.472] inherits <- base::inherits [17:27:19.472] invokeRestart <- base::invokeRestart [17:27:19.472] is.null <- base::is.null [17:27:19.472] muffled <- FALSE [17:27:19.472] if (inherits(cond, "message")) { [17:27:19.472] muffled <- grepl(pattern, "muffleMessage") [17:27:19.472] if (muffled) [17:27:19.472] invokeRestart("muffleMessage") [17:27:19.472] } [17:27:19.472] else if (inherits(cond, "warning")) { [17:27:19.472] muffled <- grepl(pattern, "muffleWarning") [17:27:19.472] if (muffled) [17:27:19.472] invokeRestart("muffleWarning") [17:27:19.472] } [17:27:19.472] else if (inherits(cond, "condition")) { [17:27:19.472] if (!is.null(pattern)) { [17:27:19.472] computeRestarts <- base::computeRestarts [17:27:19.472] grepl <- base::grepl [17:27:19.472] restarts <- computeRestarts(cond) [17:27:19.472] for (restart in restarts) { [17:27:19.472] name <- restart$name [17:27:19.472] if (is.null(name)) [17:27:19.472] next [17:27:19.472] if (!grepl(pattern, name)) [17:27:19.472] next [17:27:19.472] invokeRestart(restart) [17:27:19.472] muffled <- TRUE [17:27:19.472] break [17:27:19.472] } [17:27:19.472] } [17:27:19.472] } [17:27:19.472] invisible(muffled) [17:27:19.472] } [17:27:19.472] muffleCondition(cond, pattern = "^muffle") [17:27:19.472] } [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] if (TRUE) { [17:27:19.472] muffleCondition <- function (cond, pattern = "^muffle") [17:27:19.472] { [17:27:19.472] inherits <- base::inherits [17:27:19.472] invokeRestart <- base::invokeRestart [17:27:19.472] is.null <- base::is.null [17:27:19.472] muffled <- FALSE [17:27:19.472] if (inherits(cond, "message")) { [17:27:19.472] muffled <- grepl(pattern, "muffleMessage") [17:27:19.472] if (muffled) [17:27:19.472] invokeRestart("muffleMessage") [17:27:19.472] } [17:27:19.472] else if (inherits(cond, "warning")) { [17:27:19.472] muffled <- grepl(pattern, "muffleWarning") [17:27:19.472] if (muffled) [17:27:19.472] invokeRestart("muffleWarning") [17:27:19.472] } [17:27:19.472] else if (inherits(cond, "condition")) { [17:27:19.472] if (!is.null(pattern)) { [17:27:19.472] computeRestarts <- base::computeRestarts [17:27:19.472] grepl <- base::grepl [17:27:19.472] restarts <- computeRestarts(cond) [17:27:19.472] for (restart in restarts) { [17:27:19.472] name <- restart$name [17:27:19.472] if (is.null(name)) [17:27:19.472] next [17:27:19.472] if (!grepl(pattern, name)) [17:27:19.472] next [17:27:19.472] invokeRestart(restart) [17:27:19.472] muffled <- TRUE [17:27:19.472] break [17:27:19.472] } [17:27:19.472] } [17:27:19.472] } [17:27:19.472] invisible(muffled) [17:27:19.472] } [17:27:19.472] muffleCondition(cond, pattern = "^muffle") [17:27:19.472] } [17:27:19.472] } [17:27:19.472] } [17:27:19.472] })) [17:27:19.472] }, error = function(ex) { [17:27:19.472] base::structure(base::list(value = NULL, visible = NULL, [17:27:19.472] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:19.472] ...future.rng), started = ...future.startTime, [17:27:19.472] finished = Sys.time(), session_uuid = NA_character_, [17:27:19.472] version = "1.8"), class = "FutureResult") [17:27:19.472] }, finally = { [17:27:19.472] if (!identical(...future.workdir, getwd())) [17:27:19.472] setwd(...future.workdir) [17:27:19.472] { [17:27:19.472] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:19.472] ...future.oldOptions$nwarnings <- NULL [17:27:19.472] } [17:27:19.472] base::options(...future.oldOptions) [17:27:19.472] if (.Platform$OS.type == "windows") { [17:27:19.472] old_names <- names(...future.oldEnvVars) [17:27:19.472] envs <- base::Sys.getenv() [17:27:19.472] names <- names(envs) [17:27:19.472] common <- intersect(names, old_names) [17:27:19.472] added <- setdiff(names, old_names) [17:27:19.472] removed <- setdiff(old_names, names) [17:27:19.472] changed <- common[...future.oldEnvVars[common] != [17:27:19.472] envs[common]] [17:27:19.472] NAMES <- toupper(changed) [17:27:19.472] args <- list() [17:27:19.472] for (kk in seq_along(NAMES)) { [17:27:19.472] name <- changed[[kk]] [17:27:19.472] NAME <- NAMES[[kk]] [17:27:19.472] if (name != NAME && is.element(NAME, old_names)) [17:27:19.472] next [17:27:19.472] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.472] } [17:27:19.472] NAMES <- toupper(added) [17:27:19.472] for (kk in seq_along(NAMES)) { [17:27:19.472] name <- added[[kk]] [17:27:19.472] NAME <- NAMES[[kk]] [17:27:19.472] if (name != NAME && is.element(NAME, old_names)) [17:27:19.472] next [17:27:19.472] args[[name]] <- "" [17:27:19.472] } [17:27:19.472] NAMES <- toupper(removed) [17:27:19.472] for (kk in seq_along(NAMES)) { [17:27:19.472] name <- removed[[kk]] [17:27:19.472] NAME <- NAMES[[kk]] [17:27:19.472] if (name != NAME && is.element(NAME, old_names)) [17:27:19.472] next [17:27:19.472] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:19.472] } [17:27:19.472] if (length(args) > 0) [17:27:19.472] base::do.call(base::Sys.setenv, args = args) [17:27:19.472] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:19.472] } [17:27:19.472] { [17:27:19.472] if (base::length(...future.futureOptionsAdded) > [17:27:19.472] 0L) { [17:27:19.472] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:19.472] base::names(opts) <- ...future.futureOptionsAdded [17:27:19.472] base::options(opts) [17:27:19.472] } [17:27:19.472] { [17:27:19.472] { [17:27:19.472] NULL [17:27:19.472] RNGkind("Mersenne-Twister") [17:27:19.472] base::rm(list = ".Random.seed", envir = base::globalenv(), [17:27:19.472] inherits = FALSE) [17:27:19.472] } [17:27:19.472] options(future.plan = NULL) [17:27:19.472] if (is.na(NA_character_)) [17:27:19.472] Sys.unsetenv("R_FUTURE_PLAN") [17:27:19.472] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:19.472] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:19.472] .init = FALSE) [17:27:19.472] } [17:27:19.472] } [17:27:19.472] } [17:27:19.472] }) [17:27:19.472] if (TRUE) { [17:27:19.472] base::sink(type = "output", split = FALSE) [17:27:19.472] if (TRUE) { [17:27:19.472] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:19.472] } [17:27:19.472] else { [17:27:19.472] ...future.result["stdout"] <- base::list(NULL) [17:27:19.472] } [17:27:19.472] base::close(...future.stdout) [17:27:19.472] ...future.stdout <- NULL [17:27:19.472] } [17:27:19.472] ...future.result$conditions <- ...future.conditions [17:27:19.472] ...future.result$finished <- base::Sys.time() [17:27:19.472] ...future.result [17:27:19.472] } [17:27:19.479] assign_globals() ... [17:27:19.480] List of 1 [17:27:19.480] $ a: num 1 [17:27:19.480] - attr(*, "where")=List of 1 [17:27:19.480] ..$ a: [17:27:19.480] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [17:27:19.480] - attr(*, "resolved")= logi FALSE [17:27:19.480] - attr(*, "total_size")= int 39 [17:27:19.480] - attr(*, "already-done")= logi TRUE [17:27:19.486] - copied 'a' to environment [17:27:19.486] assign_globals() ... done [17:27:19.487] plan(): Setting new future strategy stack: [17:27:19.487] List of future strategies: [17:27:19.487] 1. sequential: [17:27:19.487] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.487] - tweaked: FALSE [17:27:19.487] - call: NULL [17:27:19.489] plan(): nbrOfWorkers() = 1 [17:27:19.495] plan(): Setting new future strategy stack: [17:27:19.495] List of future strategies: [17:27:19.495] 1. sequential: [17:27:19.495] - args: function (..., envir = parent.frame(), workers = "") [17:27:19.495] - tweaked: FALSE [17:27:19.495] - call: plan(strategy) [17:27:19.496] plan(): nbrOfWorkers() = 1 [17:27:19.497] SequentialFuture started (and completed) [17:27:19.497] - Launch lazy future ... done [17:27:19.498] run() for 'SequentialFuture' ... done *** futureAssign() with 'sequential' futures ... DONE Testing with 1 cores ... DONE Testing with 2 cores ... *** futureAssign() with 'multisession' futures ... [17:27:19.510] plan(): Setting new future strategy stack: [17:27:19.510] List of future strategies: [17:27:19.510] 1. multisession: [17:27:19.510] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:19.510] - tweaked: FALSE [17:27:19.510] - call: plan(strategy) [17:27:19.511] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [17:27:19.511] multisession: [17:27:19.511] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [17:27:19.511] - tweaked: FALSE [17:27:19.511] - call: plan(strategy) [17:27:19.517] getGlobalsAndPackages() ... [17:27:19.517] Not searching for globals [17:27:19.518] - globals: [0] [17:27:19.518] getGlobalsAndPackages() ... DONE [17:27:19.519] [local output] makeClusterPSOCK() ... [17:27:19.587] [local output] Workers: [n = 2] 'localhost', 'localhost' [17:27:19.595] [local output] Base port: 24266 [17:27:19.596] [local output] Getting setup options for 2 cluster nodes ... [17:27:19.596] [local output] - Node #1 of 2 ... [17:27:19.597] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:19.599] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpykI43s/worker.rank=1.parallelly.parent=32444.7ebc5e4f17f6.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpykI43s/worker.rank=1.parallelly.parent=32444.7ebc5e4f17f6.pid\")"' [17:27:19.939] - Possible to infer worker's PID: TRUE [17:27:19.940] [local output] Rscript port: 24266 [17:27:19.941] [local output] - Node #2 of 2 ... [17:27:19.942] [local output] localMachine=TRUE => revtunnel=FALSE [17:27:19.944] [local output] Rscript port: 24266 [17:27:19.945] [local output] Getting setup options for 2 cluster nodes ... done [17:27:19.945] [local output] - Parallel setup requested for some PSOCK nodes [17:27:19.946] [local output] Setting up PSOCK nodes in parallel [17:27:19.947] List of 36 [17:27:19.947] $ worker : chr "localhost" [17:27:19.947] ..- attr(*, "localhost")= logi TRUE [17:27:19.947] $ master : chr "localhost" [17:27:19.947] $ port : int 24266 [17:27:19.947] $ connectTimeout : num 120 [17:27:19.947] $ timeout : num 120 [17:27:19.947] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [17:27:19.947] $ homogeneous : logi TRUE [17:27:19.947] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=futureAssign.R:32444:CRANWIN3:CR"| __truncated__ [17:27:19.947] $ rscript_envs : NULL [17:27:19.947] $ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:19.947] $ rscript_startup : NULL [17:27:19.947] $ rscript_sh : chr [1:2] "cmd" "cmd" [17:27:19.947] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:19.947] $ methods : logi TRUE [17:27:19.947] $ socketOptions : chr "no-delay" [17:27:19.947] $ useXDR : logi FALSE [17:27:19.947] $ outfile : chr "/dev/null" [17:27:19.947] $ renice : int NA [17:27:19.947] $ rshcmd : NULL [17:27:19.947] $ user : chr(0) [17:27:19.947] $ revtunnel : logi FALSE [17:27:19.947] $ rshlogfile : NULL [17:27:19.947] $ rshopts : chr(0) [17:27:19.947] $ rank : int 1 [17:27:19.947] $ manual : logi FALSE [17:27:19.947] $ dryrun : logi FALSE [17:27:19.947] $ quiet : logi FALSE [17:27:19.947] $ setup_strategy : chr "parallel" [17:27:19.947] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:19.947] $ pidfile : chr "D:/temp/RtmpykI43s/worker.rank=1.parallelly.parent=32444.7ebc5e4f17f6.pid" [17:27:19.947] $ rshcmd_label : NULL [17:27:19.947] $ rsh_call : NULL [17:27:19.947] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [17:27:19.947] $ localMachine : logi TRUE [17:27:19.947] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [17:27:19.947] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [17:27:19.947] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [17:27:19.947] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [17:27:19.947] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [17:27:19.947] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [17:27:19.947] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [17:27:19.947] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [17:27:19.947] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [17:27:19.947] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [17:27:19.947] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [17:27:19.947] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [17:27:19.947] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [17:27:19.947] "parallel"), action = c("launch", "options"), verbose = FALSE) [17:27:19.947] $ arguments :List of 28 [17:27:19.947] ..$ worker : chr "localhost" [17:27:19.947] ..$ master : NULL [17:27:19.947] ..$ port : int 24266 [17:27:19.947] ..$ connectTimeout : num 120 [17:27:19.947] ..$ timeout : num 120 [17:27:19.947] ..$ rscript : NULL [17:27:19.947] ..$ homogeneous : NULL [17:27:19.947] ..$ rscript_args : NULL [17:27:19.947] ..$ rscript_envs : NULL [17:27:19.947] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda" "D:/RCompile/recent/R/library" [17:27:19.947] ..$ rscript_startup : NULL [17:27:19.947] ..$ rscript_sh : chr "auto" [17:27:19.947] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [17:27:19.947] ..$ methods : logi TRUE [17:27:19.947] ..$ socketOptions : chr "no-delay" [17:27:19.947] ..$ useXDR : logi FALSE [17:27:19.947] ..$ outfile : chr "/dev/null" [17:27:19.947] ..$ renice : int NA [17:27:19.947] ..$ rshcmd : NULL [17:27:19.947] ..$ user : NULL [17:27:19.947] ..$ revtunnel : logi NA [17:27:19.947] ..$ rshlogfile : NULL [17:27:19.947] ..$ rshopts : NULL [17:27:19.947] ..$ rank : int 1 [17:27:19.947] ..$ manual : logi FALSE [17:27:19.947] ..$ dryrun : logi FALSE [17:27:19.947] ..$ quiet : logi FALSE [17:27:19.947] ..$ setup_strategy : chr "parallel" [17:27:19.947] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [17:27:19.984] [local output] System call to launch all workers: [17:27:19.984] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=futureAssign.R:32444:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpykI43s/worker.rank=1.parallelly.parent=32444.7ebc5e4f17f6.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpsXpk4j/RLIBS_1097c668d2fda\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=24266 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [17:27:19.985] [local output] Starting PSOCK main server [17:27:19.995] [local output] Workers launched [17:27:19.995] [local output] Waiting for workers to connect back [17:27:19.995] - [local output] 0 workers out of 2 ready [17:27:20.293] - [local output] 0 workers out of 2 ready [17:27:20.294] - [local output] 1 workers out of 2 ready [17:27:20.295] - [local output] 2 workers out of 2 ready [17:27:20.295] [local output] Launching of 2 workers completed [17:27:20.295] [local output] Number of nodes in cluster: 2 [17:27:20.296] [local output] Collecting session information from 2 workers [17:27:20.297] [local output] - Worker #1 of 2 [17:27:20.298] [local output] - Worker #2 of 2 [17:27:20.298] [local output] makeClusterPSOCK() ... done [17:27:20.314] Packages needed by the future expression (n = 0): [17:27:20.315] Packages needed by future strategies (n = 0): [17:27:20.316] { [17:27:20.316] { [17:27:20.316] { [17:27:20.316] ...future.startTime <- base::Sys.time() [17:27:20.316] { [17:27:20.316] { [17:27:20.316] { [17:27:20.316] { [17:27:20.316] base::local({ [17:27:20.316] has_future <- base::requireNamespace("future", [17:27:20.316] quietly = TRUE) [17:27:20.316] if (has_future) { [17:27:20.316] ns <- base::getNamespace("future") [17:27:20.316] version <- ns[[".package"]][["version"]] [17:27:20.316] if (is.null(version)) [17:27:20.316] version <- utils::packageVersion("future") [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] version <- NULL [17:27:20.316] } [17:27:20.316] if (!has_future || version < "1.8.0") { [17:27:20.316] info <- base::c(r_version = base::gsub("R version ", [17:27:20.316] "", base::R.version$version.string), [17:27:20.316] platform = base::sprintf("%s (%s-bit)", [17:27:20.316] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:20.316] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:20.316] "release", "version")], collapse = " "), [17:27:20.316] hostname = base::Sys.info()[["nodename"]]) [17:27:20.316] info <- base::sprintf("%s: %s", base::names(info), [17:27:20.316] info) [17:27:20.316] info <- base::paste(info, collapse = "; ") [17:27:20.316] if (!has_future) { [17:27:20.316] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:20.316] info) [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:20.316] info, version) [17:27:20.316] } [17:27:20.316] base::stop(msg) [17:27:20.316] } [17:27:20.316] }) [17:27:20.316] } [17:27:20.316] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:20.316] base::options(mc.cores = 1L) [17:27:20.316] } [17:27:20.316] ...future.strategy.old <- future::plan("list") [17:27:20.316] options(future.plan = NULL) [17:27:20.316] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.316] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:20.316] } [17:27:20.316] ...future.workdir <- getwd() [17:27:20.316] } [17:27:20.316] ...future.oldOptions <- base::as.list(base::.Options) [17:27:20.316] ...future.oldEnvVars <- base::Sys.getenv() [17:27:20.316] } [17:27:20.316] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:20.316] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:20.316] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:20.316] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:20.316] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:20.316] future.stdout.windows.reencode = NULL, width = 80L) [17:27:20.316] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:20.316] base::names(...future.oldOptions)) [17:27:20.316] } [17:27:20.316] if (FALSE) { [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] if (TRUE) { [17:27:20.316] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:20.316] open = "w") [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:20.316] windows = "NUL", "/dev/null"), open = "w") [17:27:20.316] } [17:27:20.316] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:20.316] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:20.316] base::sink(type = "output", split = FALSE) [17:27:20.316] base::close(...future.stdout) [17:27:20.316] }, add = TRUE) [17:27:20.316] } [17:27:20.316] ...future.frame <- base::sys.nframe() [17:27:20.316] ...future.conditions <- base::list() [17:27:20.316] ...future.rng <- base::globalenv()$.Random.seed [17:27:20.316] if (FALSE) { [17:27:20.316] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:20.316] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:20.316] } [17:27:20.316] ...future.result <- base::tryCatch({ [17:27:20.316] base::withCallingHandlers({ [17:27:20.316] ...future.value <- base::withVisible(base::local({ [17:27:20.316] ...future.makeSendCondition <- base::local({ [17:27:20.316] sendCondition <- NULL [17:27:20.316] function(frame = 1L) { [17:27:20.316] if (is.function(sendCondition)) [17:27:20.316] return(sendCondition) [17:27:20.316] ns <- getNamespace("parallel") [17:27:20.316] if (exists("sendData", mode = "function", [17:27:20.316] envir = ns)) { [17:27:20.316] parallel_sendData <- get("sendData", mode = "function", [17:27:20.316] envir = ns) [17:27:20.316] envir <- sys.frame(frame) [17:27:20.316] master <- NULL [17:27:20.316] while (!identical(envir, .GlobalEnv) && [17:27:20.316] !identical(envir, emptyenv())) { [17:27:20.316] if (exists("master", mode = "list", envir = envir, [17:27:20.316] inherits = FALSE)) { [17:27:20.316] master <- get("master", mode = "list", [17:27:20.316] envir = envir, inherits = FALSE) [17:27:20.316] if (inherits(master, c("SOCKnode", [17:27:20.316] "SOCK0node"))) { [17:27:20.316] sendCondition <<- function(cond) { [17:27:20.316] data <- list(type = "VALUE", value = cond, [17:27:20.316] success = TRUE) [17:27:20.316] parallel_sendData(master, data) [17:27:20.316] } [17:27:20.316] return(sendCondition) [17:27:20.316] } [17:27:20.316] } [17:27:20.316] frame <- frame + 1L [17:27:20.316] envir <- sys.frame(frame) [17:27:20.316] } [17:27:20.316] } [17:27:20.316] sendCondition <<- function(cond) NULL [17:27:20.316] } [17:27:20.316] }) [17:27:20.316] withCallingHandlers({ [17:27:20.316] NA [17:27:20.316] }, immediateCondition = function(cond) { [17:27:20.316] sendCondition <- ...future.makeSendCondition() [17:27:20.316] sendCondition(cond) [17:27:20.316] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.316] { [17:27:20.316] inherits <- base::inherits [17:27:20.316] invokeRestart <- base::invokeRestart [17:27:20.316] is.null <- base::is.null [17:27:20.316] muffled <- FALSE [17:27:20.316] if (inherits(cond, "message")) { [17:27:20.316] muffled <- grepl(pattern, "muffleMessage") [17:27:20.316] if (muffled) [17:27:20.316] invokeRestart("muffleMessage") [17:27:20.316] } [17:27:20.316] else if (inherits(cond, "warning")) { [17:27:20.316] muffled <- grepl(pattern, "muffleWarning") [17:27:20.316] if (muffled) [17:27:20.316] invokeRestart("muffleWarning") [17:27:20.316] } [17:27:20.316] else if (inherits(cond, "condition")) { [17:27:20.316] if (!is.null(pattern)) { [17:27:20.316] computeRestarts <- base::computeRestarts [17:27:20.316] grepl <- base::grepl [17:27:20.316] restarts <- computeRestarts(cond) [17:27:20.316] for (restart in restarts) { [17:27:20.316] name <- restart$name [17:27:20.316] if (is.null(name)) [17:27:20.316] next [17:27:20.316] if (!grepl(pattern, name)) [17:27:20.316] next [17:27:20.316] invokeRestart(restart) [17:27:20.316] muffled <- TRUE [17:27:20.316] break [17:27:20.316] } [17:27:20.316] } [17:27:20.316] } [17:27:20.316] invisible(muffled) [17:27:20.316] } [17:27:20.316] muffleCondition(cond) [17:27:20.316] }) [17:27:20.316] })) [17:27:20.316] future::FutureResult(value = ...future.value$value, [17:27:20.316] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.316] ...future.rng), globalenv = if (FALSE) [17:27:20.316] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:20.316] ...future.globalenv.names)) [17:27:20.316] else NULL, started = ...future.startTime, version = "1.8") [17:27:20.316] }, condition = base::local({ [17:27:20.316] c <- base::c [17:27:20.316] inherits <- base::inherits [17:27:20.316] invokeRestart <- base::invokeRestart [17:27:20.316] length <- base::length [17:27:20.316] list <- base::list [17:27:20.316] seq.int <- base::seq.int [17:27:20.316] signalCondition <- base::signalCondition [17:27:20.316] sys.calls <- base::sys.calls [17:27:20.316] `[[` <- base::`[[` [17:27:20.316] `+` <- base::`+` [17:27:20.316] `<<-` <- base::`<<-` [17:27:20.316] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:20.316] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:20.316] 3L)] [17:27:20.316] } [17:27:20.316] function(cond) { [17:27:20.316] is_error <- inherits(cond, "error") [17:27:20.316] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:20.316] NULL) [17:27:20.316] if (is_error) { [17:27:20.316] sessionInformation <- function() { [17:27:20.316] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:20.316] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:20.316] search = base::search(), system = base::Sys.info()) [17:27:20.316] } [17:27:20.316] ...future.conditions[[length(...future.conditions) + [17:27:20.316] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:20.316] cond$call), session = sessionInformation(), [17:27:20.316] timestamp = base::Sys.time(), signaled = 0L) [17:27:20.316] signalCondition(cond) [17:27:20.316] } [17:27:20.316] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:20.316] "immediateCondition"))) { [17:27:20.316] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:20.316] ...future.conditions[[length(...future.conditions) + [17:27:20.316] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:20.316] if (TRUE && !signal) { [17:27:20.316] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.316] { [17:27:20.316] inherits <- base::inherits [17:27:20.316] invokeRestart <- base::invokeRestart [17:27:20.316] is.null <- base::is.null [17:27:20.316] muffled <- FALSE [17:27:20.316] if (inherits(cond, "message")) { [17:27:20.316] muffled <- grepl(pattern, "muffleMessage") [17:27:20.316] if (muffled) [17:27:20.316] invokeRestart("muffleMessage") [17:27:20.316] } [17:27:20.316] else if (inherits(cond, "warning")) { [17:27:20.316] muffled <- grepl(pattern, "muffleWarning") [17:27:20.316] if (muffled) [17:27:20.316] invokeRestart("muffleWarning") [17:27:20.316] } [17:27:20.316] else if (inherits(cond, "condition")) { [17:27:20.316] if (!is.null(pattern)) { [17:27:20.316] computeRestarts <- base::computeRestarts [17:27:20.316] grepl <- base::grepl [17:27:20.316] restarts <- computeRestarts(cond) [17:27:20.316] for (restart in restarts) { [17:27:20.316] name <- restart$name [17:27:20.316] if (is.null(name)) [17:27:20.316] next [17:27:20.316] if (!grepl(pattern, name)) [17:27:20.316] next [17:27:20.316] invokeRestart(restart) [17:27:20.316] muffled <- TRUE [17:27:20.316] break [17:27:20.316] } [17:27:20.316] } [17:27:20.316] } [17:27:20.316] invisible(muffled) [17:27:20.316] } [17:27:20.316] muffleCondition(cond, pattern = "^muffle") [17:27:20.316] } [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] if (TRUE) { [17:27:20.316] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.316] { [17:27:20.316] inherits <- base::inherits [17:27:20.316] invokeRestart <- base::invokeRestart [17:27:20.316] is.null <- base::is.null [17:27:20.316] muffled <- FALSE [17:27:20.316] if (inherits(cond, "message")) { [17:27:20.316] muffled <- grepl(pattern, "muffleMessage") [17:27:20.316] if (muffled) [17:27:20.316] invokeRestart("muffleMessage") [17:27:20.316] } [17:27:20.316] else if (inherits(cond, "warning")) { [17:27:20.316] muffled <- grepl(pattern, "muffleWarning") [17:27:20.316] if (muffled) [17:27:20.316] invokeRestart("muffleWarning") [17:27:20.316] } [17:27:20.316] else if (inherits(cond, "condition")) { [17:27:20.316] if (!is.null(pattern)) { [17:27:20.316] computeRestarts <- base::computeRestarts [17:27:20.316] grepl <- base::grepl [17:27:20.316] restarts <- computeRestarts(cond) [17:27:20.316] for (restart in restarts) { [17:27:20.316] name <- restart$name [17:27:20.316] if (is.null(name)) [17:27:20.316] next [17:27:20.316] if (!grepl(pattern, name)) [17:27:20.316] next [17:27:20.316] invokeRestart(restart) [17:27:20.316] muffled <- TRUE [17:27:20.316] break [17:27:20.316] } [17:27:20.316] } [17:27:20.316] } [17:27:20.316] invisible(muffled) [17:27:20.316] } [17:27:20.316] muffleCondition(cond, pattern = "^muffle") [17:27:20.316] } [17:27:20.316] } [17:27:20.316] } [17:27:20.316] })) [17:27:20.316] }, error = function(ex) { [17:27:20.316] base::structure(base::list(value = NULL, visible = NULL, [17:27:20.316] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.316] ...future.rng), started = ...future.startTime, [17:27:20.316] finished = Sys.time(), session_uuid = NA_character_, [17:27:20.316] version = "1.8"), class = "FutureResult") [17:27:20.316] }, finally = { [17:27:20.316] if (!identical(...future.workdir, getwd())) [17:27:20.316] setwd(...future.workdir) [17:27:20.316] { [17:27:20.316] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:20.316] ...future.oldOptions$nwarnings <- NULL [17:27:20.316] } [17:27:20.316] base::options(...future.oldOptions) [17:27:20.316] if (.Platform$OS.type == "windows") { [17:27:20.316] old_names <- names(...future.oldEnvVars) [17:27:20.316] envs <- base::Sys.getenv() [17:27:20.316] names <- names(envs) [17:27:20.316] common <- intersect(names, old_names) [17:27:20.316] added <- setdiff(names, old_names) [17:27:20.316] removed <- setdiff(old_names, names) [17:27:20.316] changed <- common[...future.oldEnvVars[common] != [17:27:20.316] envs[common]] [17:27:20.316] NAMES <- toupper(changed) [17:27:20.316] args <- list() [17:27:20.316] for (kk in seq_along(NAMES)) { [17:27:20.316] name <- changed[[kk]] [17:27:20.316] NAME <- NAMES[[kk]] [17:27:20.316] if (name != NAME && is.element(NAME, old_names)) [17:27:20.316] next [17:27:20.316] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.316] } [17:27:20.316] NAMES <- toupper(added) [17:27:20.316] for (kk in seq_along(NAMES)) { [17:27:20.316] name <- added[[kk]] [17:27:20.316] NAME <- NAMES[[kk]] [17:27:20.316] if (name != NAME && is.element(NAME, old_names)) [17:27:20.316] next [17:27:20.316] args[[name]] <- "" [17:27:20.316] } [17:27:20.316] NAMES <- toupper(removed) [17:27:20.316] for (kk in seq_along(NAMES)) { [17:27:20.316] name <- removed[[kk]] [17:27:20.316] NAME <- NAMES[[kk]] [17:27:20.316] if (name != NAME && is.element(NAME, old_names)) [17:27:20.316] next [17:27:20.316] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.316] } [17:27:20.316] if (length(args) > 0) [17:27:20.316] base::do.call(base::Sys.setenv, args = args) [17:27:20.316] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:20.316] } [17:27:20.316] { [17:27:20.316] if (base::length(...future.futureOptionsAdded) > [17:27:20.316] 0L) { [17:27:20.316] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:20.316] base::names(opts) <- ...future.futureOptionsAdded [17:27:20.316] base::options(opts) [17:27:20.316] } [17:27:20.316] { [17:27:20.316] { [17:27:20.316] base::options(mc.cores = ...future.mc.cores.old) [17:27:20.316] NULL [17:27:20.316] } [17:27:20.316] options(future.plan = NULL) [17:27:20.316] if (is.na(NA_character_)) [17:27:20.316] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.316] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:20.316] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:20.316] .init = FALSE) [17:27:20.316] } [17:27:20.316] } [17:27:20.316] } [17:27:20.316] }) [17:27:20.316] if (TRUE) { [17:27:20.316] base::sink(type = "output", split = FALSE) [17:27:20.316] if (TRUE) { [17:27:20.316] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:20.316] } [17:27:20.316] else { [17:27:20.316] ...future.result["stdout"] <- base::list(NULL) [17:27:20.316] } [17:27:20.316] base::close(...future.stdout) [17:27:20.316] ...future.stdout <- NULL [17:27:20.316] } [17:27:20.316] ...future.result$conditions <- ...future.conditions [17:27:20.316] ...future.result$finished <- base::Sys.time() [17:27:20.316] ...future.result [17:27:20.316] } [17:27:20.442] MultisessionFuture started [17:27:20.443] result() for ClusterFuture ... [17:27:20.444] receiveMessageFromWorker() for ClusterFuture ... [17:27:20.444] - Validating connection of MultisessionFuture [17:27:20.529] - received message: FutureResult [17:27:20.530] - Received FutureResult [17:27:20.535] - Erased future from FutureRegistry [17:27:20.535] result() for ClusterFuture ... [17:27:20.535] - result already collected: FutureResult [17:27:20.536] result() for ClusterFuture ... done [17:27:20.536] receiveMessageFromWorker() for ClusterFuture ... done [17:27:20.536] result() for ClusterFuture ... done [17:27:20.536] result() for ClusterFuture ... [17:27:20.537] - result already collected: FutureResult [17:27:20.537] result() for ClusterFuture ... done [17:27:20.537] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [17:27:20.540] plan(): nbrOfWorkers() = 2 [17:27:20.540] getGlobalsAndPackages() ... [17:27:20.541] Searching for globals... [17:27:20.542] - globals found: [1] '{' [17:27:20.542] Searching for globals ... DONE [17:27:20.542] Resolving globals: FALSE [17:27:20.542] [17:27:20.543] [17:27:20.543] getGlobalsAndPackages() ... DONE [17:27:20.544] run() for 'Future' ... [17:27:20.544] - state: 'created' [17:27:20.545] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:20.566] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:20.566] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:20.566] - Field: 'node' [17:27:20.566] - Field: 'label' [17:27:20.567] - Field: 'local' [17:27:20.567] - Field: 'owner' [17:27:20.567] - Field: 'envir' [17:27:20.567] - Field: 'workers' [17:27:20.567] - Field: 'packages' [17:27:20.568] - Field: 'gc' [17:27:20.568] - Field: 'conditions' [17:27:20.568] - Field: 'persistent' [17:27:20.568] - Field: 'expr' [17:27:20.568] - Field: 'uuid' [17:27:20.569] - Field: 'seed' [17:27:20.569] - Field: 'version' [17:27:20.569] - Field: 'result' [17:27:20.569] - Field: 'asynchronous' [17:27:20.569] - Field: 'calls' [17:27:20.570] - Field: 'globals' [17:27:20.570] - Field: 'stdout' [17:27:20.570] - Field: 'earlySignal' [17:27:20.570] - Field: 'lazy' [17:27:20.571] - Field: 'state' [17:27:20.571] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:20.571] - Launch lazy future ... [17:27:20.571] Packages needed by the future expression (n = 0): [17:27:20.572] Packages needed by future strategies (n = 0): [17:27:20.572] { [17:27:20.572] { [17:27:20.572] { [17:27:20.572] ...future.startTime <- base::Sys.time() [17:27:20.572] { [17:27:20.572] { [17:27:20.572] { [17:27:20.572] { [17:27:20.572] base::local({ [17:27:20.572] has_future <- base::requireNamespace("future", [17:27:20.572] quietly = TRUE) [17:27:20.572] if (has_future) { [17:27:20.572] ns <- base::getNamespace("future") [17:27:20.572] version <- ns[[".package"]][["version"]] [17:27:20.572] if (is.null(version)) [17:27:20.572] version <- utils::packageVersion("future") [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] version <- NULL [17:27:20.572] } [17:27:20.572] if (!has_future || version < "1.8.0") { [17:27:20.572] info <- base::c(r_version = base::gsub("R version ", [17:27:20.572] "", base::R.version$version.string), [17:27:20.572] platform = base::sprintf("%s (%s-bit)", [17:27:20.572] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:20.572] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:20.572] "release", "version")], collapse = " "), [17:27:20.572] hostname = base::Sys.info()[["nodename"]]) [17:27:20.572] info <- base::sprintf("%s: %s", base::names(info), [17:27:20.572] info) [17:27:20.572] info <- base::paste(info, collapse = "; ") [17:27:20.572] if (!has_future) { [17:27:20.572] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:20.572] info) [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:20.572] info, version) [17:27:20.572] } [17:27:20.572] base::stop(msg) [17:27:20.572] } [17:27:20.572] }) [17:27:20.572] } [17:27:20.572] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:20.572] base::options(mc.cores = 1L) [17:27:20.572] } [17:27:20.572] ...future.strategy.old <- future::plan("list") [17:27:20.572] options(future.plan = NULL) [17:27:20.572] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.572] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:20.572] } [17:27:20.572] ...future.workdir <- getwd() [17:27:20.572] } [17:27:20.572] ...future.oldOptions <- base::as.list(base::.Options) [17:27:20.572] ...future.oldEnvVars <- base::Sys.getenv() [17:27:20.572] } [17:27:20.572] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:20.572] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:20.572] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:20.572] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:20.572] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:20.572] future.stdout.windows.reencode = NULL, width = 80L) [17:27:20.572] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:20.572] base::names(...future.oldOptions)) [17:27:20.572] } [17:27:20.572] if (FALSE) { [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] if (TRUE) { [17:27:20.572] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:20.572] open = "w") [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:20.572] windows = "NUL", "/dev/null"), open = "w") [17:27:20.572] } [17:27:20.572] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:20.572] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:20.572] base::sink(type = "output", split = FALSE) [17:27:20.572] base::close(...future.stdout) [17:27:20.572] }, add = TRUE) [17:27:20.572] } [17:27:20.572] ...future.frame <- base::sys.nframe() [17:27:20.572] ...future.conditions <- base::list() [17:27:20.572] ...future.rng <- base::globalenv()$.Random.seed [17:27:20.572] if (FALSE) { [17:27:20.572] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:20.572] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:20.572] } [17:27:20.572] ...future.result <- base::tryCatch({ [17:27:20.572] base::withCallingHandlers({ [17:27:20.572] ...future.value <- base::withVisible(base::local({ [17:27:20.572] ...future.makeSendCondition <- base::local({ [17:27:20.572] sendCondition <- NULL [17:27:20.572] function(frame = 1L) { [17:27:20.572] if (is.function(sendCondition)) [17:27:20.572] return(sendCondition) [17:27:20.572] ns <- getNamespace("parallel") [17:27:20.572] if (exists("sendData", mode = "function", [17:27:20.572] envir = ns)) { [17:27:20.572] parallel_sendData <- get("sendData", mode = "function", [17:27:20.572] envir = ns) [17:27:20.572] envir <- sys.frame(frame) [17:27:20.572] master <- NULL [17:27:20.572] while (!identical(envir, .GlobalEnv) && [17:27:20.572] !identical(envir, emptyenv())) { [17:27:20.572] if (exists("master", mode = "list", envir = envir, [17:27:20.572] inherits = FALSE)) { [17:27:20.572] master <- get("master", mode = "list", [17:27:20.572] envir = envir, inherits = FALSE) [17:27:20.572] if (inherits(master, c("SOCKnode", [17:27:20.572] "SOCK0node"))) { [17:27:20.572] sendCondition <<- function(cond) { [17:27:20.572] data <- list(type = "VALUE", value = cond, [17:27:20.572] success = TRUE) [17:27:20.572] parallel_sendData(master, data) [17:27:20.572] } [17:27:20.572] return(sendCondition) [17:27:20.572] } [17:27:20.572] } [17:27:20.572] frame <- frame + 1L [17:27:20.572] envir <- sys.frame(frame) [17:27:20.572] } [17:27:20.572] } [17:27:20.572] sendCondition <<- function(cond) NULL [17:27:20.572] } [17:27:20.572] }) [17:27:20.572] withCallingHandlers({ [17:27:20.572] { [17:27:20.572] 2 [17:27:20.572] } [17:27:20.572] }, immediateCondition = function(cond) { [17:27:20.572] sendCondition <- ...future.makeSendCondition() [17:27:20.572] sendCondition(cond) [17:27:20.572] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.572] { [17:27:20.572] inherits <- base::inherits [17:27:20.572] invokeRestart <- base::invokeRestart [17:27:20.572] is.null <- base::is.null [17:27:20.572] muffled <- FALSE [17:27:20.572] if (inherits(cond, "message")) { [17:27:20.572] muffled <- grepl(pattern, "muffleMessage") [17:27:20.572] if (muffled) [17:27:20.572] invokeRestart("muffleMessage") [17:27:20.572] } [17:27:20.572] else if (inherits(cond, "warning")) { [17:27:20.572] muffled <- grepl(pattern, "muffleWarning") [17:27:20.572] if (muffled) [17:27:20.572] invokeRestart("muffleWarning") [17:27:20.572] } [17:27:20.572] else if (inherits(cond, "condition")) { [17:27:20.572] if (!is.null(pattern)) { [17:27:20.572] computeRestarts <- base::computeRestarts [17:27:20.572] grepl <- base::grepl [17:27:20.572] restarts <- computeRestarts(cond) [17:27:20.572] for (restart in restarts) { [17:27:20.572] name <- restart$name [17:27:20.572] if (is.null(name)) [17:27:20.572] next [17:27:20.572] if (!grepl(pattern, name)) [17:27:20.572] next [17:27:20.572] invokeRestart(restart) [17:27:20.572] muffled <- TRUE [17:27:20.572] break [17:27:20.572] } [17:27:20.572] } [17:27:20.572] } [17:27:20.572] invisible(muffled) [17:27:20.572] } [17:27:20.572] muffleCondition(cond) [17:27:20.572] }) [17:27:20.572] })) [17:27:20.572] future::FutureResult(value = ...future.value$value, [17:27:20.572] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.572] ...future.rng), globalenv = if (FALSE) [17:27:20.572] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:20.572] ...future.globalenv.names)) [17:27:20.572] else NULL, started = ...future.startTime, version = "1.8") [17:27:20.572] }, condition = base::local({ [17:27:20.572] c <- base::c [17:27:20.572] inherits <- base::inherits [17:27:20.572] invokeRestart <- base::invokeRestart [17:27:20.572] length <- base::length [17:27:20.572] list <- base::list [17:27:20.572] seq.int <- base::seq.int [17:27:20.572] signalCondition <- base::signalCondition [17:27:20.572] sys.calls <- base::sys.calls [17:27:20.572] `[[` <- base::`[[` [17:27:20.572] `+` <- base::`+` [17:27:20.572] `<<-` <- base::`<<-` [17:27:20.572] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:20.572] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:20.572] 3L)] [17:27:20.572] } [17:27:20.572] function(cond) { [17:27:20.572] is_error <- inherits(cond, "error") [17:27:20.572] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:20.572] NULL) [17:27:20.572] if (is_error) { [17:27:20.572] sessionInformation <- function() { [17:27:20.572] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:20.572] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:20.572] search = base::search(), system = base::Sys.info()) [17:27:20.572] } [17:27:20.572] ...future.conditions[[length(...future.conditions) + [17:27:20.572] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:20.572] cond$call), session = sessionInformation(), [17:27:20.572] timestamp = base::Sys.time(), signaled = 0L) [17:27:20.572] signalCondition(cond) [17:27:20.572] } [17:27:20.572] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:20.572] "immediateCondition"))) { [17:27:20.572] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:20.572] ...future.conditions[[length(...future.conditions) + [17:27:20.572] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:20.572] if (TRUE && !signal) { [17:27:20.572] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.572] { [17:27:20.572] inherits <- base::inherits [17:27:20.572] invokeRestart <- base::invokeRestart [17:27:20.572] is.null <- base::is.null [17:27:20.572] muffled <- FALSE [17:27:20.572] if (inherits(cond, "message")) { [17:27:20.572] muffled <- grepl(pattern, "muffleMessage") [17:27:20.572] if (muffled) [17:27:20.572] invokeRestart("muffleMessage") [17:27:20.572] } [17:27:20.572] else if (inherits(cond, "warning")) { [17:27:20.572] muffled <- grepl(pattern, "muffleWarning") [17:27:20.572] if (muffled) [17:27:20.572] invokeRestart("muffleWarning") [17:27:20.572] } [17:27:20.572] else if (inherits(cond, "condition")) { [17:27:20.572] if (!is.null(pattern)) { [17:27:20.572] computeRestarts <- base::computeRestarts [17:27:20.572] grepl <- base::grepl [17:27:20.572] restarts <- computeRestarts(cond) [17:27:20.572] for (restart in restarts) { [17:27:20.572] name <- restart$name [17:27:20.572] if (is.null(name)) [17:27:20.572] next [17:27:20.572] if (!grepl(pattern, name)) [17:27:20.572] next [17:27:20.572] invokeRestart(restart) [17:27:20.572] muffled <- TRUE [17:27:20.572] break [17:27:20.572] } [17:27:20.572] } [17:27:20.572] } [17:27:20.572] invisible(muffled) [17:27:20.572] } [17:27:20.572] muffleCondition(cond, pattern = "^muffle") [17:27:20.572] } [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] if (TRUE) { [17:27:20.572] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.572] { [17:27:20.572] inherits <- base::inherits [17:27:20.572] invokeRestart <- base::invokeRestart [17:27:20.572] is.null <- base::is.null [17:27:20.572] muffled <- FALSE [17:27:20.572] if (inherits(cond, "message")) { [17:27:20.572] muffled <- grepl(pattern, "muffleMessage") [17:27:20.572] if (muffled) [17:27:20.572] invokeRestart("muffleMessage") [17:27:20.572] } [17:27:20.572] else if (inherits(cond, "warning")) { [17:27:20.572] muffled <- grepl(pattern, "muffleWarning") [17:27:20.572] if (muffled) [17:27:20.572] invokeRestart("muffleWarning") [17:27:20.572] } [17:27:20.572] else if (inherits(cond, "condition")) { [17:27:20.572] if (!is.null(pattern)) { [17:27:20.572] computeRestarts <- base::computeRestarts [17:27:20.572] grepl <- base::grepl [17:27:20.572] restarts <- computeRestarts(cond) [17:27:20.572] for (restart in restarts) { [17:27:20.572] name <- restart$name [17:27:20.572] if (is.null(name)) [17:27:20.572] next [17:27:20.572] if (!grepl(pattern, name)) [17:27:20.572] next [17:27:20.572] invokeRestart(restart) [17:27:20.572] muffled <- TRUE [17:27:20.572] break [17:27:20.572] } [17:27:20.572] } [17:27:20.572] } [17:27:20.572] invisible(muffled) [17:27:20.572] } [17:27:20.572] muffleCondition(cond, pattern = "^muffle") [17:27:20.572] } [17:27:20.572] } [17:27:20.572] } [17:27:20.572] })) [17:27:20.572] }, error = function(ex) { [17:27:20.572] base::structure(base::list(value = NULL, visible = NULL, [17:27:20.572] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.572] ...future.rng), started = ...future.startTime, [17:27:20.572] finished = Sys.time(), session_uuid = NA_character_, [17:27:20.572] version = "1.8"), class = "FutureResult") [17:27:20.572] }, finally = { [17:27:20.572] if (!identical(...future.workdir, getwd())) [17:27:20.572] setwd(...future.workdir) [17:27:20.572] { [17:27:20.572] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:20.572] ...future.oldOptions$nwarnings <- NULL [17:27:20.572] } [17:27:20.572] base::options(...future.oldOptions) [17:27:20.572] if (.Platform$OS.type == "windows") { [17:27:20.572] old_names <- names(...future.oldEnvVars) [17:27:20.572] envs <- base::Sys.getenv() [17:27:20.572] names <- names(envs) [17:27:20.572] common <- intersect(names, old_names) [17:27:20.572] added <- setdiff(names, old_names) [17:27:20.572] removed <- setdiff(old_names, names) [17:27:20.572] changed <- common[...future.oldEnvVars[common] != [17:27:20.572] envs[common]] [17:27:20.572] NAMES <- toupper(changed) [17:27:20.572] args <- list() [17:27:20.572] for (kk in seq_along(NAMES)) { [17:27:20.572] name <- changed[[kk]] [17:27:20.572] NAME <- NAMES[[kk]] [17:27:20.572] if (name != NAME && is.element(NAME, old_names)) [17:27:20.572] next [17:27:20.572] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.572] } [17:27:20.572] NAMES <- toupper(added) [17:27:20.572] for (kk in seq_along(NAMES)) { [17:27:20.572] name <- added[[kk]] [17:27:20.572] NAME <- NAMES[[kk]] [17:27:20.572] if (name != NAME && is.element(NAME, old_names)) [17:27:20.572] next [17:27:20.572] args[[name]] <- "" [17:27:20.572] } [17:27:20.572] NAMES <- toupper(removed) [17:27:20.572] for (kk in seq_along(NAMES)) { [17:27:20.572] name <- removed[[kk]] [17:27:20.572] NAME <- NAMES[[kk]] [17:27:20.572] if (name != NAME && is.element(NAME, old_names)) [17:27:20.572] next [17:27:20.572] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.572] } [17:27:20.572] if (length(args) > 0) [17:27:20.572] base::do.call(base::Sys.setenv, args = args) [17:27:20.572] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:20.572] } [17:27:20.572] { [17:27:20.572] if (base::length(...future.futureOptionsAdded) > [17:27:20.572] 0L) { [17:27:20.572] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:20.572] base::names(opts) <- ...future.futureOptionsAdded [17:27:20.572] base::options(opts) [17:27:20.572] } [17:27:20.572] { [17:27:20.572] { [17:27:20.572] base::options(mc.cores = ...future.mc.cores.old) [17:27:20.572] NULL [17:27:20.572] } [17:27:20.572] options(future.plan = NULL) [17:27:20.572] if (is.na(NA_character_)) [17:27:20.572] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.572] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:20.572] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:20.572] .init = FALSE) [17:27:20.572] } [17:27:20.572] } [17:27:20.572] } [17:27:20.572] }) [17:27:20.572] if (TRUE) { [17:27:20.572] base::sink(type = "output", split = FALSE) [17:27:20.572] if (TRUE) { [17:27:20.572] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:20.572] } [17:27:20.572] else { [17:27:20.572] ...future.result["stdout"] <- base::list(NULL) [17:27:20.572] } [17:27:20.572] base::close(...future.stdout) [17:27:20.572] ...future.stdout <- NULL [17:27:20.572] } [17:27:20.572] ...future.result$conditions <- ...future.conditions [17:27:20.572] ...future.result$finished <- base::Sys.time() [17:27:20.572] ...future.result [17:27:20.572] } [17:27:20.578] MultisessionFuture started [17:27:20.579] - Launch lazy future ... done [17:27:20.579] run() for 'MultisessionFuture' ... done [17:27:20.579] getGlobalsAndPackages() ... [17:27:20.580] Searching for globals... [17:27:20.581] - globals found: [1] '{' [17:27:20.581] Searching for globals ... DONE [17:27:20.581] Resolving globals: FALSE [17:27:20.582] [17:27:20.582] [17:27:20.582] getGlobalsAndPackages() ... DONE [17:27:20.583] run() for 'Future' ... [17:27:20.583] - state: 'created' [17:27:20.584] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:20.601] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:20.602] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:20.602] - Field: 'node' [17:27:20.602] - Field: 'label' [17:27:20.603] - Field: 'local' [17:27:20.603] - Field: 'owner' [17:27:20.603] - Field: 'envir' [17:27:20.604] - Field: 'workers' [17:27:20.604] - Field: 'packages' [17:27:20.604] - Field: 'gc' [17:27:20.604] - Field: 'conditions' [17:27:20.605] - Field: 'persistent' [17:27:20.605] - Field: 'expr' [17:27:20.605] - Field: 'uuid' [17:27:20.606] - Field: 'seed' [17:27:20.606] - Field: 'version' [17:27:20.606] - Field: 'result' [17:27:20.606] - Field: 'asynchronous' [17:27:20.607] - Field: 'calls' [17:27:20.607] - Field: 'globals' [17:27:20.607] - Field: 'stdout' [17:27:20.608] - Field: 'earlySignal' [17:27:20.608] - Field: 'lazy' [17:27:20.608] - Field: 'state' [17:27:20.609] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:20.609] - Launch lazy future ... [17:27:20.609] Packages needed by the future expression (n = 0): [17:27:20.610] Packages needed by future strategies (n = 0): [17:27:20.611] { [17:27:20.611] { [17:27:20.611] { [17:27:20.611] ...future.startTime <- base::Sys.time() [17:27:20.611] { [17:27:20.611] { [17:27:20.611] { [17:27:20.611] { [17:27:20.611] base::local({ [17:27:20.611] has_future <- base::requireNamespace("future", [17:27:20.611] quietly = TRUE) [17:27:20.611] if (has_future) { [17:27:20.611] ns <- base::getNamespace("future") [17:27:20.611] version <- ns[[".package"]][["version"]] [17:27:20.611] if (is.null(version)) [17:27:20.611] version <- utils::packageVersion("future") [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] version <- NULL [17:27:20.611] } [17:27:20.611] if (!has_future || version < "1.8.0") { [17:27:20.611] info <- base::c(r_version = base::gsub("R version ", [17:27:20.611] "", base::R.version$version.string), [17:27:20.611] platform = base::sprintf("%s (%s-bit)", [17:27:20.611] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:20.611] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:20.611] "release", "version")], collapse = " "), [17:27:20.611] hostname = base::Sys.info()[["nodename"]]) [17:27:20.611] info <- base::sprintf("%s: %s", base::names(info), [17:27:20.611] info) [17:27:20.611] info <- base::paste(info, collapse = "; ") [17:27:20.611] if (!has_future) { [17:27:20.611] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:20.611] info) [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:20.611] info, version) [17:27:20.611] } [17:27:20.611] base::stop(msg) [17:27:20.611] } [17:27:20.611] }) [17:27:20.611] } [17:27:20.611] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:20.611] base::options(mc.cores = 1L) [17:27:20.611] } [17:27:20.611] ...future.strategy.old <- future::plan("list") [17:27:20.611] options(future.plan = NULL) [17:27:20.611] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.611] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:20.611] } [17:27:20.611] ...future.workdir <- getwd() [17:27:20.611] } [17:27:20.611] ...future.oldOptions <- base::as.list(base::.Options) [17:27:20.611] ...future.oldEnvVars <- base::Sys.getenv() [17:27:20.611] } [17:27:20.611] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:20.611] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:20.611] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:20.611] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:20.611] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:20.611] future.stdout.windows.reencode = NULL, width = 80L) [17:27:20.611] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:20.611] base::names(...future.oldOptions)) [17:27:20.611] } [17:27:20.611] if (FALSE) { [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] if (TRUE) { [17:27:20.611] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:20.611] open = "w") [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:20.611] windows = "NUL", "/dev/null"), open = "w") [17:27:20.611] } [17:27:20.611] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:20.611] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:20.611] base::sink(type = "output", split = FALSE) [17:27:20.611] base::close(...future.stdout) [17:27:20.611] }, add = TRUE) [17:27:20.611] } [17:27:20.611] ...future.frame <- base::sys.nframe() [17:27:20.611] ...future.conditions <- base::list() [17:27:20.611] ...future.rng <- base::globalenv()$.Random.seed [17:27:20.611] if (FALSE) { [17:27:20.611] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:20.611] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:20.611] } [17:27:20.611] ...future.result <- base::tryCatch({ [17:27:20.611] base::withCallingHandlers({ [17:27:20.611] ...future.value <- base::withVisible(base::local({ [17:27:20.611] ...future.makeSendCondition <- base::local({ [17:27:20.611] sendCondition <- NULL [17:27:20.611] function(frame = 1L) { [17:27:20.611] if (is.function(sendCondition)) [17:27:20.611] return(sendCondition) [17:27:20.611] ns <- getNamespace("parallel") [17:27:20.611] if (exists("sendData", mode = "function", [17:27:20.611] envir = ns)) { [17:27:20.611] parallel_sendData <- get("sendData", mode = "function", [17:27:20.611] envir = ns) [17:27:20.611] envir <- sys.frame(frame) [17:27:20.611] master <- NULL [17:27:20.611] while (!identical(envir, .GlobalEnv) && [17:27:20.611] !identical(envir, emptyenv())) { [17:27:20.611] if (exists("master", mode = "list", envir = envir, [17:27:20.611] inherits = FALSE)) { [17:27:20.611] master <- get("master", mode = "list", [17:27:20.611] envir = envir, inherits = FALSE) [17:27:20.611] if (inherits(master, c("SOCKnode", [17:27:20.611] "SOCK0node"))) { [17:27:20.611] sendCondition <<- function(cond) { [17:27:20.611] data <- list(type = "VALUE", value = cond, [17:27:20.611] success = TRUE) [17:27:20.611] parallel_sendData(master, data) [17:27:20.611] } [17:27:20.611] return(sendCondition) [17:27:20.611] } [17:27:20.611] } [17:27:20.611] frame <- frame + 1L [17:27:20.611] envir <- sys.frame(frame) [17:27:20.611] } [17:27:20.611] } [17:27:20.611] sendCondition <<- function(cond) NULL [17:27:20.611] } [17:27:20.611] }) [17:27:20.611] withCallingHandlers({ [17:27:20.611] { [17:27:20.611] 4 [17:27:20.611] } [17:27:20.611] }, immediateCondition = function(cond) { [17:27:20.611] sendCondition <- ...future.makeSendCondition() [17:27:20.611] sendCondition(cond) [17:27:20.611] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.611] { [17:27:20.611] inherits <- base::inherits [17:27:20.611] invokeRestart <- base::invokeRestart [17:27:20.611] is.null <- base::is.null [17:27:20.611] muffled <- FALSE [17:27:20.611] if (inherits(cond, "message")) { [17:27:20.611] muffled <- grepl(pattern, "muffleMessage") [17:27:20.611] if (muffled) [17:27:20.611] invokeRestart("muffleMessage") [17:27:20.611] } [17:27:20.611] else if (inherits(cond, "warning")) { [17:27:20.611] muffled <- grepl(pattern, "muffleWarning") [17:27:20.611] if (muffled) [17:27:20.611] invokeRestart("muffleWarning") [17:27:20.611] } [17:27:20.611] else if (inherits(cond, "condition")) { [17:27:20.611] if (!is.null(pattern)) { [17:27:20.611] computeRestarts <- base::computeRestarts [17:27:20.611] grepl <- base::grepl [17:27:20.611] restarts <- computeRestarts(cond) [17:27:20.611] for (restart in restarts) { [17:27:20.611] name <- restart$name [17:27:20.611] if (is.null(name)) [17:27:20.611] next [17:27:20.611] if (!grepl(pattern, name)) [17:27:20.611] next [17:27:20.611] invokeRestart(restart) [17:27:20.611] muffled <- TRUE [17:27:20.611] break [17:27:20.611] } [17:27:20.611] } [17:27:20.611] } [17:27:20.611] invisible(muffled) [17:27:20.611] } [17:27:20.611] muffleCondition(cond) [17:27:20.611] }) [17:27:20.611] })) [17:27:20.611] future::FutureResult(value = ...future.value$value, [17:27:20.611] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.611] ...future.rng), globalenv = if (FALSE) [17:27:20.611] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:20.611] ...future.globalenv.names)) [17:27:20.611] else NULL, started = ...future.startTime, version = "1.8") [17:27:20.611] }, condition = base::local({ [17:27:20.611] c <- base::c [17:27:20.611] inherits <- base::inherits [17:27:20.611] invokeRestart <- base::invokeRestart [17:27:20.611] length <- base::length [17:27:20.611] list <- base::list [17:27:20.611] seq.int <- base::seq.int [17:27:20.611] signalCondition <- base::signalCondition [17:27:20.611] sys.calls <- base::sys.calls [17:27:20.611] `[[` <- base::`[[` [17:27:20.611] `+` <- base::`+` [17:27:20.611] `<<-` <- base::`<<-` [17:27:20.611] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:20.611] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:20.611] 3L)] [17:27:20.611] } [17:27:20.611] function(cond) { [17:27:20.611] is_error <- inherits(cond, "error") [17:27:20.611] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:20.611] NULL) [17:27:20.611] if (is_error) { [17:27:20.611] sessionInformation <- function() { [17:27:20.611] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:20.611] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:20.611] search = base::search(), system = base::Sys.info()) [17:27:20.611] } [17:27:20.611] ...future.conditions[[length(...future.conditions) + [17:27:20.611] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:20.611] cond$call), session = sessionInformation(), [17:27:20.611] timestamp = base::Sys.time(), signaled = 0L) [17:27:20.611] signalCondition(cond) [17:27:20.611] } [17:27:20.611] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:20.611] "immediateCondition"))) { [17:27:20.611] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:20.611] ...future.conditions[[length(...future.conditions) + [17:27:20.611] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:20.611] if (TRUE && !signal) { [17:27:20.611] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.611] { [17:27:20.611] inherits <- base::inherits [17:27:20.611] invokeRestart <- base::invokeRestart [17:27:20.611] is.null <- base::is.null [17:27:20.611] muffled <- FALSE [17:27:20.611] if (inherits(cond, "message")) { [17:27:20.611] muffled <- grepl(pattern, "muffleMessage") [17:27:20.611] if (muffled) [17:27:20.611] invokeRestart("muffleMessage") [17:27:20.611] } [17:27:20.611] else if (inherits(cond, "warning")) { [17:27:20.611] muffled <- grepl(pattern, "muffleWarning") [17:27:20.611] if (muffled) [17:27:20.611] invokeRestart("muffleWarning") [17:27:20.611] } [17:27:20.611] else if (inherits(cond, "condition")) { [17:27:20.611] if (!is.null(pattern)) { [17:27:20.611] computeRestarts <- base::computeRestarts [17:27:20.611] grepl <- base::grepl [17:27:20.611] restarts <- computeRestarts(cond) [17:27:20.611] for (restart in restarts) { [17:27:20.611] name <- restart$name [17:27:20.611] if (is.null(name)) [17:27:20.611] next [17:27:20.611] if (!grepl(pattern, name)) [17:27:20.611] next [17:27:20.611] invokeRestart(restart) [17:27:20.611] muffled <- TRUE [17:27:20.611] break [17:27:20.611] } [17:27:20.611] } [17:27:20.611] } [17:27:20.611] invisible(muffled) [17:27:20.611] } [17:27:20.611] muffleCondition(cond, pattern = "^muffle") [17:27:20.611] } [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] if (TRUE) { [17:27:20.611] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.611] { [17:27:20.611] inherits <- base::inherits [17:27:20.611] invokeRestart <- base::invokeRestart [17:27:20.611] is.null <- base::is.null [17:27:20.611] muffled <- FALSE [17:27:20.611] if (inherits(cond, "message")) { [17:27:20.611] muffled <- grepl(pattern, "muffleMessage") [17:27:20.611] if (muffled) [17:27:20.611] invokeRestart("muffleMessage") [17:27:20.611] } [17:27:20.611] else if (inherits(cond, "warning")) { [17:27:20.611] muffled <- grepl(pattern, "muffleWarning") [17:27:20.611] if (muffled) [17:27:20.611] invokeRestart("muffleWarning") [17:27:20.611] } [17:27:20.611] else if (inherits(cond, "condition")) { [17:27:20.611] if (!is.null(pattern)) { [17:27:20.611] computeRestarts <- base::computeRestarts [17:27:20.611] grepl <- base::grepl [17:27:20.611] restarts <- computeRestarts(cond) [17:27:20.611] for (restart in restarts) { [17:27:20.611] name <- restart$name [17:27:20.611] if (is.null(name)) [17:27:20.611] next [17:27:20.611] if (!grepl(pattern, name)) [17:27:20.611] next [17:27:20.611] invokeRestart(restart) [17:27:20.611] muffled <- TRUE [17:27:20.611] break [17:27:20.611] } [17:27:20.611] } [17:27:20.611] } [17:27:20.611] invisible(muffled) [17:27:20.611] } [17:27:20.611] muffleCondition(cond, pattern = "^muffle") [17:27:20.611] } [17:27:20.611] } [17:27:20.611] } [17:27:20.611] })) [17:27:20.611] }, error = function(ex) { [17:27:20.611] base::structure(base::list(value = NULL, visible = NULL, [17:27:20.611] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.611] ...future.rng), started = ...future.startTime, [17:27:20.611] finished = Sys.time(), session_uuid = NA_character_, [17:27:20.611] version = "1.8"), class = "FutureResult") [17:27:20.611] }, finally = { [17:27:20.611] if (!identical(...future.workdir, getwd())) [17:27:20.611] setwd(...future.workdir) [17:27:20.611] { [17:27:20.611] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:20.611] ...future.oldOptions$nwarnings <- NULL [17:27:20.611] } [17:27:20.611] base::options(...future.oldOptions) [17:27:20.611] if (.Platform$OS.type == "windows") { [17:27:20.611] old_names <- names(...future.oldEnvVars) [17:27:20.611] envs <- base::Sys.getenv() [17:27:20.611] names <- names(envs) [17:27:20.611] common <- intersect(names, old_names) [17:27:20.611] added <- setdiff(names, old_names) [17:27:20.611] removed <- setdiff(old_names, names) [17:27:20.611] changed <- common[...future.oldEnvVars[common] != [17:27:20.611] envs[common]] [17:27:20.611] NAMES <- toupper(changed) [17:27:20.611] args <- list() [17:27:20.611] for (kk in seq_along(NAMES)) { [17:27:20.611] name <- changed[[kk]] [17:27:20.611] NAME <- NAMES[[kk]] [17:27:20.611] if (name != NAME && is.element(NAME, old_names)) [17:27:20.611] next [17:27:20.611] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.611] } [17:27:20.611] NAMES <- toupper(added) [17:27:20.611] for (kk in seq_along(NAMES)) { [17:27:20.611] name <- added[[kk]] [17:27:20.611] NAME <- NAMES[[kk]] [17:27:20.611] if (name != NAME && is.element(NAME, old_names)) [17:27:20.611] next [17:27:20.611] args[[name]] <- "" [17:27:20.611] } [17:27:20.611] NAMES <- toupper(removed) [17:27:20.611] for (kk in seq_along(NAMES)) { [17:27:20.611] name <- removed[[kk]] [17:27:20.611] NAME <- NAMES[[kk]] [17:27:20.611] if (name != NAME && is.element(NAME, old_names)) [17:27:20.611] next [17:27:20.611] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.611] } [17:27:20.611] if (length(args) > 0) [17:27:20.611] base::do.call(base::Sys.setenv, args = args) [17:27:20.611] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:20.611] } [17:27:20.611] { [17:27:20.611] if (base::length(...future.futureOptionsAdded) > [17:27:20.611] 0L) { [17:27:20.611] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:20.611] base::names(opts) <- ...future.futureOptionsAdded [17:27:20.611] base::options(opts) [17:27:20.611] } [17:27:20.611] { [17:27:20.611] { [17:27:20.611] base::options(mc.cores = ...future.mc.cores.old) [17:27:20.611] NULL [17:27:20.611] } [17:27:20.611] options(future.plan = NULL) [17:27:20.611] if (is.na(NA_character_)) [17:27:20.611] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.611] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:20.611] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:20.611] .init = FALSE) [17:27:20.611] } [17:27:20.611] } [17:27:20.611] } [17:27:20.611] }) [17:27:20.611] if (TRUE) { [17:27:20.611] base::sink(type = "output", split = FALSE) [17:27:20.611] if (TRUE) { [17:27:20.611] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:20.611] } [17:27:20.611] else { [17:27:20.611] ...future.result["stdout"] <- base::list(NULL) [17:27:20.611] } [17:27:20.611] base::close(...future.stdout) [17:27:20.611] ...future.stdout <- NULL [17:27:20.611] } [17:27:20.611] ...future.result$conditions <- ...future.conditions [17:27:20.611] ...future.result$finished <- base::Sys.time() [17:27:20.611] ...future.result [17:27:20.611] } [17:27:20.732] MultisessionFuture started [17:27:20.732] - Launch lazy future ... done [17:27:20.733] run() for 'MultisessionFuture' ... done [17:27:20.734] result() for ClusterFuture ... [17:27:20.734] receiveMessageFromWorker() for ClusterFuture ... [17:27:20.735] - Validating connection of MultisessionFuture [17:27:20.735] - received message: FutureResult [17:27:20.736] - Received FutureResult [17:27:20.736] - Erased future from FutureRegistry [17:27:20.737] result() for ClusterFuture ... [17:27:20.737] - result already collected: FutureResult [17:27:20.737] result() for ClusterFuture ... done [17:27:20.738] receiveMessageFromWorker() for ClusterFuture ... done [17:27:20.738] result() for ClusterFuture ... done [17:27:20.738] result() for ClusterFuture ... [17:27:20.739] - result already collected: FutureResult [17:27:20.739] result() for ClusterFuture ... done u$a = 2 [17:27:20.740] result() for ClusterFuture ... [17:27:20.740] receiveMessageFromWorker() for ClusterFuture ... [17:27:20.741] - Validating connection of MultisessionFuture [17:27:20.821] - received message: FutureResult [17:27:20.822] - Received FutureResult [17:27:20.822] - Erased future from FutureRegistry [17:27:20.823] result() for ClusterFuture ... [17:27:20.823] - result already collected: FutureResult [17:27:20.823] result() for ClusterFuture ... done [17:27:20.823] receiveMessageFromWorker() for ClusterFuture ... done [17:27:20.824] result() for ClusterFuture ... done [17:27:20.824] result() for ClusterFuture ... [17:27:20.824] - result already collected: FutureResult [17:27:20.825] result() for ClusterFuture ... done v$a = 4 [17:27:20.825] getGlobalsAndPackages() ... [17:27:20.826] Searching for globals... [17:27:20.828] - globals found: [3] '{', '*', 'a' [17:27:20.828] Searching for globals ... DONE [17:27:20.829] Resolving globals: FALSE [17:27:20.830] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:20.831] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:20.831] - globals: [1] 'a' [17:27:20.831] [17:27:20.832] getGlobalsAndPackages() ... DONE [17:27:20.832] run() for 'Future' ... [17:27:20.833] - state: 'created' [17:27:20.833] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:20.856] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:20.857] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:20.857] - Field: 'node' [17:27:20.857] - Field: 'label' [17:27:20.858] - Field: 'local' [17:27:20.858] - Field: 'owner' [17:27:20.858] - Field: 'envir' [17:27:20.859] - Field: 'workers' [17:27:20.859] - Field: 'packages' [17:27:20.859] - Field: 'gc' [17:27:20.860] - Field: 'conditions' [17:27:20.860] - Field: 'persistent' [17:27:20.860] - Field: 'expr' [17:27:20.861] - Field: 'uuid' [17:27:20.861] - Field: 'seed' [17:27:20.861] - Field: 'version' [17:27:20.862] - Field: 'result' [17:27:20.862] - Field: 'asynchronous' [17:27:20.863] - Field: 'calls' [17:27:20.863] - Field: 'globals' [17:27:20.863] - Field: 'stdout' [17:27:20.864] - Field: 'earlySignal' [17:27:20.864] - Field: 'lazy' [17:27:20.864] - Field: 'state' [17:27:20.865] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:20.865] - Launch lazy future ... [17:27:20.866] Packages needed by the future expression (n = 0): [17:27:20.866] Packages needed by future strategies (n = 0): [17:27:20.867] { [17:27:20.867] { [17:27:20.867] { [17:27:20.867] ...future.startTime <- base::Sys.time() [17:27:20.867] { [17:27:20.867] { [17:27:20.867] { [17:27:20.867] { [17:27:20.867] base::local({ [17:27:20.867] has_future <- base::requireNamespace("future", [17:27:20.867] quietly = TRUE) [17:27:20.867] if (has_future) { [17:27:20.867] ns <- base::getNamespace("future") [17:27:20.867] version <- ns[[".package"]][["version"]] [17:27:20.867] if (is.null(version)) [17:27:20.867] version <- utils::packageVersion("future") [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] version <- NULL [17:27:20.867] } [17:27:20.867] if (!has_future || version < "1.8.0") { [17:27:20.867] info <- base::c(r_version = base::gsub("R version ", [17:27:20.867] "", base::R.version$version.string), [17:27:20.867] platform = base::sprintf("%s (%s-bit)", [17:27:20.867] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:20.867] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:20.867] "release", "version")], collapse = " "), [17:27:20.867] hostname = base::Sys.info()[["nodename"]]) [17:27:20.867] info <- base::sprintf("%s: %s", base::names(info), [17:27:20.867] info) [17:27:20.867] info <- base::paste(info, collapse = "; ") [17:27:20.867] if (!has_future) { [17:27:20.867] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:20.867] info) [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:20.867] info, version) [17:27:20.867] } [17:27:20.867] base::stop(msg) [17:27:20.867] } [17:27:20.867] }) [17:27:20.867] } [17:27:20.867] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:20.867] base::options(mc.cores = 1L) [17:27:20.867] } [17:27:20.867] ...future.strategy.old <- future::plan("list") [17:27:20.867] options(future.plan = NULL) [17:27:20.867] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.867] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:20.867] } [17:27:20.867] ...future.workdir <- getwd() [17:27:20.867] } [17:27:20.867] ...future.oldOptions <- base::as.list(base::.Options) [17:27:20.867] ...future.oldEnvVars <- base::Sys.getenv() [17:27:20.867] } [17:27:20.867] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:20.867] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:20.867] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:20.867] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:20.867] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:20.867] future.stdout.windows.reencode = NULL, width = 80L) [17:27:20.867] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:20.867] base::names(...future.oldOptions)) [17:27:20.867] } [17:27:20.867] if (FALSE) { [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] if (TRUE) { [17:27:20.867] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:20.867] open = "w") [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:20.867] windows = "NUL", "/dev/null"), open = "w") [17:27:20.867] } [17:27:20.867] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:20.867] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:20.867] base::sink(type = "output", split = FALSE) [17:27:20.867] base::close(...future.stdout) [17:27:20.867] }, add = TRUE) [17:27:20.867] } [17:27:20.867] ...future.frame <- base::sys.nframe() [17:27:20.867] ...future.conditions <- base::list() [17:27:20.867] ...future.rng <- base::globalenv()$.Random.seed [17:27:20.867] if (FALSE) { [17:27:20.867] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:20.867] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:20.867] } [17:27:20.867] ...future.result <- base::tryCatch({ [17:27:20.867] base::withCallingHandlers({ [17:27:20.867] ...future.value <- base::withVisible(base::local({ [17:27:20.867] ...future.makeSendCondition <- base::local({ [17:27:20.867] sendCondition <- NULL [17:27:20.867] function(frame = 1L) { [17:27:20.867] if (is.function(sendCondition)) [17:27:20.867] return(sendCondition) [17:27:20.867] ns <- getNamespace("parallel") [17:27:20.867] if (exists("sendData", mode = "function", [17:27:20.867] envir = ns)) { [17:27:20.867] parallel_sendData <- get("sendData", mode = "function", [17:27:20.867] envir = ns) [17:27:20.867] envir <- sys.frame(frame) [17:27:20.867] master <- NULL [17:27:20.867] while (!identical(envir, .GlobalEnv) && [17:27:20.867] !identical(envir, emptyenv())) { [17:27:20.867] if (exists("master", mode = "list", envir = envir, [17:27:20.867] inherits = FALSE)) { [17:27:20.867] master <- get("master", mode = "list", [17:27:20.867] envir = envir, inherits = FALSE) [17:27:20.867] if (inherits(master, c("SOCKnode", [17:27:20.867] "SOCK0node"))) { [17:27:20.867] sendCondition <<- function(cond) { [17:27:20.867] data <- list(type = "VALUE", value = cond, [17:27:20.867] success = TRUE) [17:27:20.867] parallel_sendData(master, data) [17:27:20.867] } [17:27:20.867] return(sendCondition) [17:27:20.867] } [17:27:20.867] } [17:27:20.867] frame <- frame + 1L [17:27:20.867] envir <- sys.frame(frame) [17:27:20.867] } [17:27:20.867] } [17:27:20.867] sendCondition <<- function(cond) NULL [17:27:20.867] } [17:27:20.867] }) [17:27:20.867] withCallingHandlers({ [17:27:20.867] { [17:27:20.867] 2 * a [17:27:20.867] } [17:27:20.867] }, immediateCondition = function(cond) { [17:27:20.867] sendCondition <- ...future.makeSendCondition() [17:27:20.867] sendCondition(cond) [17:27:20.867] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.867] { [17:27:20.867] inherits <- base::inherits [17:27:20.867] invokeRestart <- base::invokeRestart [17:27:20.867] is.null <- base::is.null [17:27:20.867] muffled <- FALSE [17:27:20.867] if (inherits(cond, "message")) { [17:27:20.867] muffled <- grepl(pattern, "muffleMessage") [17:27:20.867] if (muffled) [17:27:20.867] invokeRestart("muffleMessage") [17:27:20.867] } [17:27:20.867] else if (inherits(cond, "warning")) { [17:27:20.867] muffled <- grepl(pattern, "muffleWarning") [17:27:20.867] if (muffled) [17:27:20.867] invokeRestart("muffleWarning") [17:27:20.867] } [17:27:20.867] else if (inherits(cond, "condition")) { [17:27:20.867] if (!is.null(pattern)) { [17:27:20.867] computeRestarts <- base::computeRestarts [17:27:20.867] grepl <- base::grepl [17:27:20.867] restarts <- computeRestarts(cond) [17:27:20.867] for (restart in restarts) { [17:27:20.867] name <- restart$name [17:27:20.867] if (is.null(name)) [17:27:20.867] next [17:27:20.867] if (!grepl(pattern, name)) [17:27:20.867] next [17:27:20.867] invokeRestart(restart) [17:27:20.867] muffled <- TRUE [17:27:20.867] break [17:27:20.867] } [17:27:20.867] } [17:27:20.867] } [17:27:20.867] invisible(muffled) [17:27:20.867] } [17:27:20.867] muffleCondition(cond) [17:27:20.867] }) [17:27:20.867] })) [17:27:20.867] future::FutureResult(value = ...future.value$value, [17:27:20.867] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.867] ...future.rng), globalenv = if (FALSE) [17:27:20.867] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:20.867] ...future.globalenv.names)) [17:27:20.867] else NULL, started = ...future.startTime, version = "1.8") [17:27:20.867] }, condition = base::local({ [17:27:20.867] c <- base::c [17:27:20.867] inherits <- base::inherits [17:27:20.867] invokeRestart <- base::invokeRestart [17:27:20.867] length <- base::length [17:27:20.867] list <- base::list [17:27:20.867] seq.int <- base::seq.int [17:27:20.867] signalCondition <- base::signalCondition [17:27:20.867] sys.calls <- base::sys.calls [17:27:20.867] `[[` <- base::`[[` [17:27:20.867] `+` <- base::`+` [17:27:20.867] `<<-` <- base::`<<-` [17:27:20.867] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:20.867] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:20.867] 3L)] [17:27:20.867] } [17:27:20.867] function(cond) { [17:27:20.867] is_error <- inherits(cond, "error") [17:27:20.867] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:20.867] NULL) [17:27:20.867] if (is_error) { [17:27:20.867] sessionInformation <- function() { [17:27:20.867] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:20.867] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:20.867] search = base::search(), system = base::Sys.info()) [17:27:20.867] } [17:27:20.867] ...future.conditions[[length(...future.conditions) + [17:27:20.867] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:20.867] cond$call), session = sessionInformation(), [17:27:20.867] timestamp = base::Sys.time(), signaled = 0L) [17:27:20.867] signalCondition(cond) [17:27:20.867] } [17:27:20.867] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:20.867] "immediateCondition"))) { [17:27:20.867] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:20.867] ...future.conditions[[length(...future.conditions) + [17:27:20.867] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:20.867] if (TRUE && !signal) { [17:27:20.867] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.867] { [17:27:20.867] inherits <- base::inherits [17:27:20.867] invokeRestart <- base::invokeRestart [17:27:20.867] is.null <- base::is.null [17:27:20.867] muffled <- FALSE [17:27:20.867] if (inherits(cond, "message")) { [17:27:20.867] muffled <- grepl(pattern, "muffleMessage") [17:27:20.867] if (muffled) [17:27:20.867] invokeRestart("muffleMessage") [17:27:20.867] } [17:27:20.867] else if (inherits(cond, "warning")) { [17:27:20.867] muffled <- grepl(pattern, "muffleWarning") [17:27:20.867] if (muffled) [17:27:20.867] invokeRestart("muffleWarning") [17:27:20.867] } [17:27:20.867] else if (inherits(cond, "condition")) { [17:27:20.867] if (!is.null(pattern)) { [17:27:20.867] computeRestarts <- base::computeRestarts [17:27:20.867] grepl <- base::grepl [17:27:20.867] restarts <- computeRestarts(cond) [17:27:20.867] for (restart in restarts) { [17:27:20.867] name <- restart$name [17:27:20.867] if (is.null(name)) [17:27:20.867] next [17:27:20.867] if (!grepl(pattern, name)) [17:27:20.867] next [17:27:20.867] invokeRestart(restart) [17:27:20.867] muffled <- TRUE [17:27:20.867] break [17:27:20.867] } [17:27:20.867] } [17:27:20.867] } [17:27:20.867] invisible(muffled) [17:27:20.867] } [17:27:20.867] muffleCondition(cond, pattern = "^muffle") [17:27:20.867] } [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] if (TRUE) { [17:27:20.867] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.867] { [17:27:20.867] inherits <- base::inherits [17:27:20.867] invokeRestart <- base::invokeRestart [17:27:20.867] is.null <- base::is.null [17:27:20.867] muffled <- FALSE [17:27:20.867] if (inherits(cond, "message")) { [17:27:20.867] muffled <- grepl(pattern, "muffleMessage") [17:27:20.867] if (muffled) [17:27:20.867] invokeRestart("muffleMessage") [17:27:20.867] } [17:27:20.867] else if (inherits(cond, "warning")) { [17:27:20.867] muffled <- grepl(pattern, "muffleWarning") [17:27:20.867] if (muffled) [17:27:20.867] invokeRestart("muffleWarning") [17:27:20.867] } [17:27:20.867] else if (inherits(cond, "condition")) { [17:27:20.867] if (!is.null(pattern)) { [17:27:20.867] computeRestarts <- base::computeRestarts [17:27:20.867] grepl <- base::grepl [17:27:20.867] restarts <- computeRestarts(cond) [17:27:20.867] for (restart in restarts) { [17:27:20.867] name <- restart$name [17:27:20.867] if (is.null(name)) [17:27:20.867] next [17:27:20.867] if (!grepl(pattern, name)) [17:27:20.867] next [17:27:20.867] invokeRestart(restart) [17:27:20.867] muffled <- TRUE [17:27:20.867] break [17:27:20.867] } [17:27:20.867] } [17:27:20.867] } [17:27:20.867] invisible(muffled) [17:27:20.867] } [17:27:20.867] muffleCondition(cond, pattern = "^muffle") [17:27:20.867] } [17:27:20.867] } [17:27:20.867] } [17:27:20.867] })) [17:27:20.867] }, error = function(ex) { [17:27:20.867] base::structure(base::list(value = NULL, visible = NULL, [17:27:20.867] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.867] ...future.rng), started = ...future.startTime, [17:27:20.867] finished = Sys.time(), session_uuid = NA_character_, [17:27:20.867] version = "1.8"), class = "FutureResult") [17:27:20.867] }, finally = { [17:27:20.867] if (!identical(...future.workdir, getwd())) [17:27:20.867] setwd(...future.workdir) [17:27:20.867] { [17:27:20.867] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:20.867] ...future.oldOptions$nwarnings <- NULL [17:27:20.867] } [17:27:20.867] base::options(...future.oldOptions) [17:27:20.867] if (.Platform$OS.type == "windows") { [17:27:20.867] old_names <- names(...future.oldEnvVars) [17:27:20.867] envs <- base::Sys.getenv() [17:27:20.867] names <- names(envs) [17:27:20.867] common <- intersect(names, old_names) [17:27:20.867] added <- setdiff(names, old_names) [17:27:20.867] removed <- setdiff(old_names, names) [17:27:20.867] changed <- common[...future.oldEnvVars[common] != [17:27:20.867] envs[common]] [17:27:20.867] NAMES <- toupper(changed) [17:27:20.867] args <- list() [17:27:20.867] for (kk in seq_along(NAMES)) { [17:27:20.867] name <- changed[[kk]] [17:27:20.867] NAME <- NAMES[[kk]] [17:27:20.867] if (name != NAME && is.element(NAME, old_names)) [17:27:20.867] next [17:27:20.867] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.867] } [17:27:20.867] NAMES <- toupper(added) [17:27:20.867] for (kk in seq_along(NAMES)) { [17:27:20.867] name <- added[[kk]] [17:27:20.867] NAME <- NAMES[[kk]] [17:27:20.867] if (name != NAME && is.element(NAME, old_names)) [17:27:20.867] next [17:27:20.867] args[[name]] <- "" [17:27:20.867] } [17:27:20.867] NAMES <- toupper(removed) [17:27:20.867] for (kk in seq_along(NAMES)) { [17:27:20.867] name <- removed[[kk]] [17:27:20.867] NAME <- NAMES[[kk]] [17:27:20.867] if (name != NAME && is.element(NAME, old_names)) [17:27:20.867] next [17:27:20.867] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.867] } [17:27:20.867] if (length(args) > 0) [17:27:20.867] base::do.call(base::Sys.setenv, args = args) [17:27:20.867] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:20.867] } [17:27:20.867] { [17:27:20.867] if (base::length(...future.futureOptionsAdded) > [17:27:20.867] 0L) { [17:27:20.867] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:20.867] base::names(opts) <- ...future.futureOptionsAdded [17:27:20.867] base::options(opts) [17:27:20.867] } [17:27:20.867] { [17:27:20.867] { [17:27:20.867] base::options(mc.cores = ...future.mc.cores.old) [17:27:20.867] NULL [17:27:20.867] } [17:27:20.867] options(future.plan = NULL) [17:27:20.867] if (is.na(NA_character_)) [17:27:20.867] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.867] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:20.867] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:20.867] .init = FALSE) [17:27:20.867] } [17:27:20.867] } [17:27:20.867] } [17:27:20.867] }) [17:27:20.867] if (TRUE) { [17:27:20.867] base::sink(type = "output", split = FALSE) [17:27:20.867] if (TRUE) { [17:27:20.867] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:20.867] } [17:27:20.867] else { [17:27:20.867] ...future.result["stdout"] <- base::list(NULL) [17:27:20.867] } [17:27:20.867] base::close(...future.stdout) [17:27:20.867] ...future.stdout <- NULL [17:27:20.867] } [17:27:20.867] ...future.result$conditions <- ...future.conditions [17:27:20.867] ...future.result$finished <- base::Sys.time() [17:27:20.867] ...future.result [17:27:20.867] } [17:27:20.877] Exporting 1 global objects (342 bytes) to cluster node #1 ... [17:27:20.877] Exporting 'a' (39 bytes) to cluster node #1 ... [17:27:20.878] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [17:27:20.878] Exporting 1 global objects (342 bytes) to cluster node #1 ... DONE [17:27:20.879] MultisessionFuture started [17:27:20.880] - Launch lazy future ... done [17:27:20.880] run() for 'MultisessionFuture' ... done [17:27:20.881] result() for ClusterFuture ... [17:27:20.881] receiveMessageFromWorker() for ClusterFuture ... [17:27:20.881] - Validating connection of MultisessionFuture [17:27:20.906] - received message: FutureResult [17:27:20.906] - Received FutureResult [17:27:20.907] - Erased future from FutureRegistry [17:27:20.907] result() for ClusterFuture ... [17:27:20.908] - result already collected: FutureResult [17:27:20.908] result() for ClusterFuture ... done [17:27:20.908] receiveMessageFromWorker() for ClusterFuture ... done [17:27:20.909] result() for ClusterFuture ... done [17:27:20.909] result() for ClusterFuture ... [17:27:20.909] - result already collected: FutureResult [17:27:20.910] result() for ClusterFuture ... done [17:27:20.910] getGlobalsAndPackages() ... [17:27:20.911] Searching for globals... [17:27:20.913] - globals found: [3] '{', '*', 'a' [17:27:20.913] Searching for globals ... DONE [17:27:20.914] Resolving globals: FALSE [17:27:20.915] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:20.915] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:20.916] - globals: [1] 'a' [17:27:20.916] [17:27:20.916] getGlobalsAndPackages() ... DONE [17:27:20.917] run() for 'Future' ... [17:27:20.917] - state: 'created' [17:27:20.918] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:20.944] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:20.944] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:20.945] - Field: 'node' [17:27:20.945] - Field: 'label' [17:27:20.946] - Field: 'local' [17:27:20.946] - Field: 'owner' [17:27:20.946] - Field: 'envir' [17:27:20.947] - Field: 'workers' [17:27:20.947] - Field: 'packages' [17:27:20.947] - Field: 'gc' [17:27:20.948] - Field: 'conditions' [17:27:20.948] - Field: 'persistent' [17:27:20.948] - Field: 'expr' [17:27:20.949] - Field: 'uuid' [17:27:20.949] - Field: 'seed' [17:27:20.949] - Field: 'version' [17:27:20.950] - Field: 'result' [17:27:20.950] - Field: 'asynchronous' [17:27:20.951] - Field: 'calls' [17:27:20.951] - Field: 'globals' [17:27:20.951] - Field: 'stdout' [17:27:20.952] - Field: 'earlySignal' [17:27:20.952] - Field: 'lazy' [17:27:20.952] - Field: 'state' [17:27:20.953] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:20.953] - Launch lazy future ... [17:27:20.954] Packages needed by the future expression (n = 0): [17:27:20.954] Packages needed by future strategies (n = 0): [17:27:20.955] { [17:27:20.955] { [17:27:20.955] { [17:27:20.955] ...future.startTime <- base::Sys.time() [17:27:20.955] { [17:27:20.955] { [17:27:20.955] { [17:27:20.955] { [17:27:20.955] base::local({ [17:27:20.955] has_future <- base::requireNamespace("future", [17:27:20.955] quietly = TRUE) [17:27:20.955] if (has_future) { [17:27:20.955] ns <- base::getNamespace("future") [17:27:20.955] version <- ns[[".package"]][["version"]] [17:27:20.955] if (is.null(version)) [17:27:20.955] version <- utils::packageVersion("future") [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] version <- NULL [17:27:20.955] } [17:27:20.955] if (!has_future || version < "1.8.0") { [17:27:20.955] info <- base::c(r_version = base::gsub("R version ", [17:27:20.955] "", base::R.version$version.string), [17:27:20.955] platform = base::sprintf("%s (%s-bit)", [17:27:20.955] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:20.955] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:20.955] "release", "version")], collapse = " "), [17:27:20.955] hostname = base::Sys.info()[["nodename"]]) [17:27:20.955] info <- base::sprintf("%s: %s", base::names(info), [17:27:20.955] info) [17:27:20.955] info <- base::paste(info, collapse = "; ") [17:27:20.955] if (!has_future) { [17:27:20.955] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:20.955] info) [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:20.955] info, version) [17:27:20.955] } [17:27:20.955] base::stop(msg) [17:27:20.955] } [17:27:20.955] }) [17:27:20.955] } [17:27:20.955] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:20.955] base::options(mc.cores = 1L) [17:27:20.955] } [17:27:20.955] ...future.strategy.old <- future::plan("list") [17:27:20.955] options(future.plan = NULL) [17:27:20.955] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.955] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:20.955] } [17:27:20.955] ...future.workdir <- getwd() [17:27:20.955] } [17:27:20.955] ...future.oldOptions <- base::as.list(base::.Options) [17:27:20.955] ...future.oldEnvVars <- base::Sys.getenv() [17:27:20.955] } [17:27:20.955] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:20.955] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:20.955] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:20.955] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:20.955] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:20.955] future.stdout.windows.reencode = NULL, width = 80L) [17:27:20.955] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:20.955] base::names(...future.oldOptions)) [17:27:20.955] } [17:27:20.955] if (FALSE) { [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] if (TRUE) { [17:27:20.955] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:20.955] open = "w") [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:20.955] windows = "NUL", "/dev/null"), open = "w") [17:27:20.955] } [17:27:20.955] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:20.955] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:20.955] base::sink(type = "output", split = FALSE) [17:27:20.955] base::close(...future.stdout) [17:27:20.955] }, add = TRUE) [17:27:20.955] } [17:27:20.955] ...future.frame <- base::sys.nframe() [17:27:20.955] ...future.conditions <- base::list() [17:27:20.955] ...future.rng <- base::globalenv()$.Random.seed [17:27:20.955] if (FALSE) { [17:27:20.955] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:20.955] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:20.955] } [17:27:20.955] ...future.result <- base::tryCatch({ [17:27:20.955] base::withCallingHandlers({ [17:27:20.955] ...future.value <- base::withVisible(base::local({ [17:27:20.955] ...future.makeSendCondition <- base::local({ [17:27:20.955] sendCondition <- NULL [17:27:20.955] function(frame = 1L) { [17:27:20.955] if (is.function(sendCondition)) [17:27:20.955] return(sendCondition) [17:27:20.955] ns <- getNamespace("parallel") [17:27:20.955] if (exists("sendData", mode = "function", [17:27:20.955] envir = ns)) { [17:27:20.955] parallel_sendData <- get("sendData", mode = "function", [17:27:20.955] envir = ns) [17:27:20.955] envir <- sys.frame(frame) [17:27:20.955] master <- NULL [17:27:20.955] while (!identical(envir, .GlobalEnv) && [17:27:20.955] !identical(envir, emptyenv())) { [17:27:20.955] if (exists("master", mode = "list", envir = envir, [17:27:20.955] inherits = FALSE)) { [17:27:20.955] master <- get("master", mode = "list", [17:27:20.955] envir = envir, inherits = FALSE) [17:27:20.955] if (inherits(master, c("SOCKnode", [17:27:20.955] "SOCK0node"))) { [17:27:20.955] sendCondition <<- function(cond) { [17:27:20.955] data <- list(type = "VALUE", value = cond, [17:27:20.955] success = TRUE) [17:27:20.955] parallel_sendData(master, data) [17:27:20.955] } [17:27:20.955] return(sendCondition) [17:27:20.955] } [17:27:20.955] } [17:27:20.955] frame <- frame + 1L [17:27:20.955] envir <- sys.frame(frame) [17:27:20.955] } [17:27:20.955] } [17:27:20.955] sendCondition <<- function(cond) NULL [17:27:20.955] } [17:27:20.955] }) [17:27:20.955] withCallingHandlers({ [17:27:20.955] { [17:27:20.955] 2 * a [17:27:20.955] } [17:27:20.955] }, immediateCondition = function(cond) { [17:27:20.955] sendCondition <- ...future.makeSendCondition() [17:27:20.955] sendCondition(cond) [17:27:20.955] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.955] { [17:27:20.955] inherits <- base::inherits [17:27:20.955] invokeRestart <- base::invokeRestart [17:27:20.955] is.null <- base::is.null [17:27:20.955] muffled <- FALSE [17:27:20.955] if (inherits(cond, "message")) { [17:27:20.955] muffled <- grepl(pattern, "muffleMessage") [17:27:20.955] if (muffled) [17:27:20.955] invokeRestart("muffleMessage") [17:27:20.955] } [17:27:20.955] else if (inherits(cond, "warning")) { [17:27:20.955] muffled <- grepl(pattern, "muffleWarning") [17:27:20.955] if (muffled) [17:27:20.955] invokeRestart("muffleWarning") [17:27:20.955] } [17:27:20.955] else if (inherits(cond, "condition")) { [17:27:20.955] if (!is.null(pattern)) { [17:27:20.955] computeRestarts <- base::computeRestarts [17:27:20.955] grepl <- base::grepl [17:27:20.955] restarts <- computeRestarts(cond) [17:27:20.955] for (restart in restarts) { [17:27:20.955] name <- restart$name [17:27:20.955] if (is.null(name)) [17:27:20.955] next [17:27:20.955] if (!grepl(pattern, name)) [17:27:20.955] next [17:27:20.955] invokeRestart(restart) [17:27:20.955] muffled <- TRUE [17:27:20.955] break [17:27:20.955] } [17:27:20.955] } [17:27:20.955] } [17:27:20.955] invisible(muffled) [17:27:20.955] } [17:27:20.955] muffleCondition(cond) [17:27:20.955] }) [17:27:20.955] })) [17:27:20.955] future::FutureResult(value = ...future.value$value, [17:27:20.955] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.955] ...future.rng), globalenv = if (FALSE) [17:27:20.955] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:20.955] ...future.globalenv.names)) [17:27:20.955] else NULL, started = ...future.startTime, version = "1.8") [17:27:20.955] }, condition = base::local({ [17:27:20.955] c <- base::c [17:27:20.955] inherits <- base::inherits [17:27:20.955] invokeRestart <- base::invokeRestart [17:27:20.955] length <- base::length [17:27:20.955] list <- base::list [17:27:20.955] seq.int <- base::seq.int [17:27:20.955] signalCondition <- base::signalCondition [17:27:20.955] sys.calls <- base::sys.calls [17:27:20.955] `[[` <- base::`[[` [17:27:20.955] `+` <- base::`+` [17:27:20.955] `<<-` <- base::`<<-` [17:27:20.955] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:20.955] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:20.955] 3L)] [17:27:20.955] } [17:27:20.955] function(cond) { [17:27:20.955] is_error <- inherits(cond, "error") [17:27:20.955] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:20.955] NULL) [17:27:20.955] if (is_error) { [17:27:20.955] sessionInformation <- function() { [17:27:20.955] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:20.955] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:20.955] search = base::search(), system = base::Sys.info()) [17:27:20.955] } [17:27:20.955] ...future.conditions[[length(...future.conditions) + [17:27:20.955] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:20.955] cond$call), session = sessionInformation(), [17:27:20.955] timestamp = base::Sys.time(), signaled = 0L) [17:27:20.955] signalCondition(cond) [17:27:20.955] } [17:27:20.955] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:20.955] "immediateCondition"))) { [17:27:20.955] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:20.955] ...future.conditions[[length(...future.conditions) + [17:27:20.955] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:20.955] if (TRUE && !signal) { [17:27:20.955] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.955] { [17:27:20.955] inherits <- base::inherits [17:27:20.955] invokeRestart <- base::invokeRestart [17:27:20.955] is.null <- base::is.null [17:27:20.955] muffled <- FALSE [17:27:20.955] if (inherits(cond, "message")) { [17:27:20.955] muffled <- grepl(pattern, "muffleMessage") [17:27:20.955] if (muffled) [17:27:20.955] invokeRestart("muffleMessage") [17:27:20.955] } [17:27:20.955] else if (inherits(cond, "warning")) { [17:27:20.955] muffled <- grepl(pattern, "muffleWarning") [17:27:20.955] if (muffled) [17:27:20.955] invokeRestart("muffleWarning") [17:27:20.955] } [17:27:20.955] else if (inherits(cond, "condition")) { [17:27:20.955] if (!is.null(pattern)) { [17:27:20.955] computeRestarts <- base::computeRestarts [17:27:20.955] grepl <- base::grepl [17:27:20.955] restarts <- computeRestarts(cond) [17:27:20.955] for (restart in restarts) { [17:27:20.955] name <- restart$name [17:27:20.955] if (is.null(name)) [17:27:20.955] next [17:27:20.955] if (!grepl(pattern, name)) [17:27:20.955] next [17:27:20.955] invokeRestart(restart) [17:27:20.955] muffled <- TRUE [17:27:20.955] break [17:27:20.955] } [17:27:20.955] } [17:27:20.955] } [17:27:20.955] invisible(muffled) [17:27:20.955] } [17:27:20.955] muffleCondition(cond, pattern = "^muffle") [17:27:20.955] } [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] if (TRUE) { [17:27:20.955] muffleCondition <- function (cond, pattern = "^muffle") [17:27:20.955] { [17:27:20.955] inherits <- base::inherits [17:27:20.955] invokeRestart <- base::invokeRestart [17:27:20.955] is.null <- base::is.null [17:27:20.955] muffled <- FALSE [17:27:20.955] if (inherits(cond, "message")) { [17:27:20.955] muffled <- grepl(pattern, "muffleMessage") [17:27:20.955] if (muffled) [17:27:20.955] invokeRestart("muffleMessage") [17:27:20.955] } [17:27:20.955] else if (inherits(cond, "warning")) { [17:27:20.955] muffled <- grepl(pattern, "muffleWarning") [17:27:20.955] if (muffled) [17:27:20.955] invokeRestart("muffleWarning") [17:27:20.955] } [17:27:20.955] else if (inherits(cond, "condition")) { [17:27:20.955] if (!is.null(pattern)) { [17:27:20.955] computeRestarts <- base::computeRestarts [17:27:20.955] grepl <- base::grepl [17:27:20.955] restarts <- computeRestarts(cond) [17:27:20.955] for (restart in restarts) { [17:27:20.955] name <- restart$name [17:27:20.955] if (is.null(name)) [17:27:20.955] next [17:27:20.955] if (!grepl(pattern, name)) [17:27:20.955] next [17:27:20.955] invokeRestart(restart) [17:27:20.955] muffled <- TRUE [17:27:20.955] break [17:27:20.955] } [17:27:20.955] } [17:27:20.955] } [17:27:20.955] invisible(muffled) [17:27:20.955] } [17:27:20.955] muffleCondition(cond, pattern = "^muffle") [17:27:20.955] } [17:27:20.955] } [17:27:20.955] } [17:27:20.955] })) [17:27:20.955] }, error = function(ex) { [17:27:20.955] base::structure(base::list(value = NULL, visible = NULL, [17:27:20.955] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:20.955] ...future.rng), started = ...future.startTime, [17:27:20.955] finished = Sys.time(), session_uuid = NA_character_, [17:27:20.955] version = "1.8"), class = "FutureResult") [17:27:20.955] }, finally = { [17:27:20.955] if (!identical(...future.workdir, getwd())) [17:27:20.955] setwd(...future.workdir) [17:27:20.955] { [17:27:20.955] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:20.955] ...future.oldOptions$nwarnings <- NULL [17:27:20.955] } [17:27:20.955] base::options(...future.oldOptions) [17:27:20.955] if (.Platform$OS.type == "windows") { [17:27:20.955] old_names <- names(...future.oldEnvVars) [17:27:20.955] envs <- base::Sys.getenv() [17:27:20.955] names <- names(envs) [17:27:20.955] common <- intersect(names, old_names) [17:27:20.955] added <- setdiff(names, old_names) [17:27:20.955] removed <- setdiff(old_names, names) [17:27:20.955] changed <- common[...future.oldEnvVars[common] != [17:27:20.955] envs[common]] [17:27:20.955] NAMES <- toupper(changed) [17:27:20.955] args <- list() [17:27:20.955] for (kk in seq_along(NAMES)) { [17:27:20.955] name <- changed[[kk]] [17:27:20.955] NAME <- NAMES[[kk]] [17:27:20.955] if (name != NAME && is.element(NAME, old_names)) [17:27:20.955] next [17:27:20.955] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.955] } [17:27:20.955] NAMES <- toupper(added) [17:27:20.955] for (kk in seq_along(NAMES)) { [17:27:20.955] name <- added[[kk]] [17:27:20.955] NAME <- NAMES[[kk]] [17:27:20.955] if (name != NAME && is.element(NAME, old_names)) [17:27:20.955] next [17:27:20.955] args[[name]] <- "" [17:27:20.955] } [17:27:20.955] NAMES <- toupper(removed) [17:27:20.955] for (kk in seq_along(NAMES)) { [17:27:20.955] name <- removed[[kk]] [17:27:20.955] NAME <- NAMES[[kk]] [17:27:20.955] if (name != NAME && is.element(NAME, old_names)) [17:27:20.955] next [17:27:20.955] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:20.955] } [17:27:20.955] if (length(args) > 0) [17:27:20.955] base::do.call(base::Sys.setenv, args = args) [17:27:20.955] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:20.955] } [17:27:20.955] { [17:27:20.955] if (base::length(...future.futureOptionsAdded) > [17:27:20.955] 0L) { [17:27:20.955] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:20.955] base::names(opts) <- ...future.futureOptionsAdded [17:27:20.955] base::options(opts) [17:27:20.955] } [17:27:20.955] { [17:27:20.955] { [17:27:20.955] base::options(mc.cores = ...future.mc.cores.old) [17:27:20.955] NULL [17:27:20.955] } [17:27:20.955] options(future.plan = NULL) [17:27:20.955] if (is.na(NA_character_)) [17:27:20.955] Sys.unsetenv("R_FUTURE_PLAN") [17:27:20.955] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:20.955] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:20.955] .init = FALSE) [17:27:20.955] } [17:27:20.955] } [17:27:20.955] } [17:27:20.955] }) [17:27:20.955] if (TRUE) { [17:27:20.955] base::sink(type = "output", split = FALSE) [17:27:20.955] if (TRUE) { [17:27:20.955] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:20.955] } [17:27:20.955] else { [17:27:20.955] ...future.result["stdout"] <- base::list(NULL) [17:27:20.955] } [17:27:20.955] base::close(...future.stdout) [17:27:20.955] ...future.stdout <- NULL [17:27:20.955] } [17:27:20.955] ...future.result$conditions <- ...future.conditions [17:27:20.955] ...future.result$finished <- base::Sys.time() [17:27:20.955] ...future.result [17:27:20.955] } [17:27:20.965] Exporting 1 global objects (342 bytes) to cluster node #1 ... [17:27:20.965] Exporting 'a' (39 bytes) to cluster node #1 ... [17:27:20.966] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [17:27:20.967] Exporting 1 global objects (342 bytes) to cluster node #1 ... DONE [17:27:20.968] MultisessionFuture started [17:27:20.968] - Launch lazy future ... done [17:27:20.969] run() for 'MultisessionFuture' ... done [17:27:20.969] result() for ClusterFuture ... [17:27:20.969] receiveMessageFromWorker() for ClusterFuture ... [17:27:20.970] - Validating connection of MultisessionFuture [17:27:20.994] - received message: FutureResult [17:27:20.994] - Received FutureResult [17:27:20.995] - Erased future from FutureRegistry [17:27:20.995] result() for ClusterFuture ... [17:27:20.995] - result already collected: FutureResult [17:27:20.995] result() for ClusterFuture ... done [17:27:20.996] receiveMessageFromWorker() for ClusterFuture ... done [17:27:20.996] result() for ClusterFuture ... done [17:27:20.996] result() for ClusterFuture ... [17:27:20.996] - result already collected: FutureResult [17:27:20.997] result() for ClusterFuture ... done [17:27:20.997] getGlobalsAndPackages() ... [17:27:20.997] Searching for globals... [17:27:20.999] - globals found: [3] '{', '*', 'a' [17:27:20.999] Searching for globals ... DONE [17:27:21.000] Resolving globals: FALSE [17:27:21.000] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:21.001] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:21.001] - globals: [1] 'a' [17:27:21.001] [17:27:21.001] getGlobalsAndPackages() ... DONE [17:27:21.002] run() for 'Future' ... [17:27:21.002] - state: 'created' [17:27:21.002] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:21.018] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:21.019] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:21.019] - Field: 'node' [17:27:21.019] - Field: 'label' [17:27:21.019] - Field: 'local' [17:27:21.019] - Field: 'owner' [17:27:21.020] - Field: 'envir' [17:27:21.020] - Field: 'workers' [17:27:21.020] - Field: 'packages' [17:27:21.020] - Field: 'gc' [17:27:21.020] - Field: 'conditions' [17:27:21.020] - Field: 'persistent' [17:27:21.021] - Field: 'expr' [17:27:21.021] - Field: 'uuid' [17:27:21.021] - Field: 'seed' [17:27:21.021] - Field: 'version' [17:27:21.021] - Field: 'result' [17:27:21.022] - Field: 'asynchronous' [17:27:21.022] - Field: 'calls' [17:27:21.022] - Field: 'globals' [17:27:21.022] - Field: 'stdout' [17:27:21.022] - Field: 'earlySignal' [17:27:21.023] - Field: 'lazy' [17:27:21.023] - Field: 'state' [17:27:21.023] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:21.023] - Launch lazy future ... [17:27:21.024] Packages needed by the future expression (n = 0): [17:27:21.024] Packages needed by future strategies (n = 0): [17:27:21.024] { [17:27:21.024] { [17:27:21.024] { [17:27:21.024] ...future.startTime <- base::Sys.time() [17:27:21.024] { [17:27:21.024] { [17:27:21.024] { [17:27:21.024] { [17:27:21.024] base::local({ [17:27:21.024] has_future <- base::requireNamespace("future", [17:27:21.024] quietly = TRUE) [17:27:21.024] if (has_future) { [17:27:21.024] ns <- base::getNamespace("future") [17:27:21.024] version <- ns[[".package"]][["version"]] [17:27:21.024] if (is.null(version)) [17:27:21.024] version <- utils::packageVersion("future") [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] version <- NULL [17:27:21.024] } [17:27:21.024] if (!has_future || version < "1.8.0") { [17:27:21.024] info <- base::c(r_version = base::gsub("R version ", [17:27:21.024] "", base::R.version$version.string), [17:27:21.024] platform = base::sprintf("%s (%s-bit)", [17:27:21.024] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:21.024] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:21.024] "release", "version")], collapse = " "), [17:27:21.024] hostname = base::Sys.info()[["nodename"]]) [17:27:21.024] info <- base::sprintf("%s: %s", base::names(info), [17:27:21.024] info) [17:27:21.024] info <- base::paste(info, collapse = "; ") [17:27:21.024] if (!has_future) { [17:27:21.024] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:21.024] info) [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:21.024] info, version) [17:27:21.024] } [17:27:21.024] base::stop(msg) [17:27:21.024] } [17:27:21.024] }) [17:27:21.024] } [17:27:21.024] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:21.024] base::options(mc.cores = 1L) [17:27:21.024] } [17:27:21.024] ...future.strategy.old <- future::plan("list") [17:27:21.024] options(future.plan = NULL) [17:27:21.024] Sys.unsetenv("R_FUTURE_PLAN") [17:27:21.024] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:21.024] } [17:27:21.024] ...future.workdir <- getwd() [17:27:21.024] } [17:27:21.024] ...future.oldOptions <- base::as.list(base::.Options) [17:27:21.024] ...future.oldEnvVars <- base::Sys.getenv() [17:27:21.024] } [17:27:21.024] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:21.024] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:21.024] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:21.024] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:21.024] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:21.024] future.stdout.windows.reencode = NULL, width = 80L) [17:27:21.024] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:21.024] base::names(...future.oldOptions)) [17:27:21.024] } [17:27:21.024] if (FALSE) { [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] if (TRUE) { [17:27:21.024] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:21.024] open = "w") [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:21.024] windows = "NUL", "/dev/null"), open = "w") [17:27:21.024] } [17:27:21.024] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:21.024] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:21.024] base::sink(type = "output", split = FALSE) [17:27:21.024] base::close(...future.stdout) [17:27:21.024] }, add = TRUE) [17:27:21.024] } [17:27:21.024] ...future.frame <- base::sys.nframe() [17:27:21.024] ...future.conditions <- base::list() [17:27:21.024] ...future.rng <- base::globalenv()$.Random.seed [17:27:21.024] if (FALSE) { [17:27:21.024] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:21.024] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:21.024] } [17:27:21.024] ...future.result <- base::tryCatch({ [17:27:21.024] base::withCallingHandlers({ [17:27:21.024] ...future.value <- base::withVisible(base::local({ [17:27:21.024] ...future.makeSendCondition <- base::local({ [17:27:21.024] sendCondition <- NULL [17:27:21.024] function(frame = 1L) { [17:27:21.024] if (is.function(sendCondition)) [17:27:21.024] return(sendCondition) [17:27:21.024] ns <- getNamespace("parallel") [17:27:21.024] if (exists("sendData", mode = "function", [17:27:21.024] envir = ns)) { [17:27:21.024] parallel_sendData <- get("sendData", mode = "function", [17:27:21.024] envir = ns) [17:27:21.024] envir <- sys.frame(frame) [17:27:21.024] master <- NULL [17:27:21.024] while (!identical(envir, .GlobalEnv) && [17:27:21.024] !identical(envir, emptyenv())) { [17:27:21.024] if (exists("master", mode = "list", envir = envir, [17:27:21.024] inherits = FALSE)) { [17:27:21.024] master <- get("master", mode = "list", [17:27:21.024] envir = envir, inherits = FALSE) [17:27:21.024] if (inherits(master, c("SOCKnode", [17:27:21.024] "SOCK0node"))) { [17:27:21.024] sendCondition <<- function(cond) { [17:27:21.024] data <- list(type = "VALUE", value = cond, [17:27:21.024] success = TRUE) [17:27:21.024] parallel_sendData(master, data) [17:27:21.024] } [17:27:21.024] return(sendCondition) [17:27:21.024] } [17:27:21.024] } [17:27:21.024] frame <- frame + 1L [17:27:21.024] envir <- sys.frame(frame) [17:27:21.024] } [17:27:21.024] } [17:27:21.024] sendCondition <<- function(cond) NULL [17:27:21.024] } [17:27:21.024] }) [17:27:21.024] withCallingHandlers({ [17:27:21.024] { [17:27:21.024] 2 * a [17:27:21.024] } [17:27:21.024] }, immediateCondition = function(cond) { [17:27:21.024] sendCondition <- ...future.makeSendCondition() [17:27:21.024] sendCondition(cond) [17:27:21.024] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.024] { [17:27:21.024] inherits <- base::inherits [17:27:21.024] invokeRestart <- base::invokeRestart [17:27:21.024] is.null <- base::is.null [17:27:21.024] muffled <- FALSE [17:27:21.024] if (inherits(cond, "message")) { [17:27:21.024] muffled <- grepl(pattern, "muffleMessage") [17:27:21.024] if (muffled) [17:27:21.024] invokeRestart("muffleMessage") [17:27:21.024] } [17:27:21.024] else if (inherits(cond, "warning")) { [17:27:21.024] muffled <- grepl(pattern, "muffleWarning") [17:27:21.024] if (muffled) [17:27:21.024] invokeRestart("muffleWarning") [17:27:21.024] } [17:27:21.024] else if (inherits(cond, "condition")) { [17:27:21.024] if (!is.null(pattern)) { [17:27:21.024] computeRestarts <- base::computeRestarts [17:27:21.024] grepl <- base::grepl [17:27:21.024] restarts <- computeRestarts(cond) [17:27:21.024] for (restart in restarts) { [17:27:21.024] name <- restart$name [17:27:21.024] if (is.null(name)) [17:27:21.024] next [17:27:21.024] if (!grepl(pattern, name)) [17:27:21.024] next [17:27:21.024] invokeRestart(restart) [17:27:21.024] muffled <- TRUE [17:27:21.024] break [17:27:21.024] } [17:27:21.024] } [17:27:21.024] } [17:27:21.024] invisible(muffled) [17:27:21.024] } [17:27:21.024] muffleCondition(cond) [17:27:21.024] }) [17:27:21.024] })) [17:27:21.024] future::FutureResult(value = ...future.value$value, [17:27:21.024] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:21.024] ...future.rng), globalenv = if (FALSE) [17:27:21.024] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:21.024] ...future.globalenv.names)) [17:27:21.024] else NULL, started = ...future.startTime, version = "1.8") [17:27:21.024] }, condition = base::local({ [17:27:21.024] c <- base::c [17:27:21.024] inherits <- base::inherits [17:27:21.024] invokeRestart <- base::invokeRestart [17:27:21.024] length <- base::length [17:27:21.024] list <- base::list [17:27:21.024] seq.int <- base::seq.int [17:27:21.024] signalCondition <- base::signalCondition [17:27:21.024] sys.calls <- base::sys.calls [17:27:21.024] `[[` <- base::`[[` [17:27:21.024] `+` <- base::`+` [17:27:21.024] `<<-` <- base::`<<-` [17:27:21.024] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:21.024] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:21.024] 3L)] [17:27:21.024] } [17:27:21.024] function(cond) { [17:27:21.024] is_error <- inherits(cond, "error") [17:27:21.024] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:21.024] NULL) [17:27:21.024] if (is_error) { [17:27:21.024] sessionInformation <- function() { [17:27:21.024] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:21.024] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:21.024] search = base::search(), system = base::Sys.info()) [17:27:21.024] } [17:27:21.024] ...future.conditions[[length(...future.conditions) + [17:27:21.024] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:21.024] cond$call), session = sessionInformation(), [17:27:21.024] timestamp = base::Sys.time(), signaled = 0L) [17:27:21.024] signalCondition(cond) [17:27:21.024] } [17:27:21.024] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:21.024] "immediateCondition"))) { [17:27:21.024] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:21.024] ...future.conditions[[length(...future.conditions) + [17:27:21.024] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:21.024] if (TRUE && !signal) { [17:27:21.024] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.024] { [17:27:21.024] inherits <- base::inherits [17:27:21.024] invokeRestart <- base::invokeRestart [17:27:21.024] is.null <- base::is.null [17:27:21.024] muffled <- FALSE [17:27:21.024] if (inherits(cond, "message")) { [17:27:21.024] muffled <- grepl(pattern, "muffleMessage") [17:27:21.024] if (muffled) [17:27:21.024] invokeRestart("muffleMessage") [17:27:21.024] } [17:27:21.024] else if (inherits(cond, "warning")) { [17:27:21.024] muffled <- grepl(pattern, "muffleWarning") [17:27:21.024] if (muffled) [17:27:21.024] invokeRestart("muffleWarning") [17:27:21.024] } [17:27:21.024] else if (inherits(cond, "condition")) { [17:27:21.024] if (!is.null(pattern)) { [17:27:21.024] computeRestarts <- base::computeRestarts [17:27:21.024] grepl <- base::grepl [17:27:21.024] restarts <- computeRestarts(cond) [17:27:21.024] for (restart in restarts) { [17:27:21.024] name <- restart$name [17:27:21.024] if (is.null(name)) [17:27:21.024] next [17:27:21.024] if (!grepl(pattern, name)) [17:27:21.024] next [17:27:21.024] invokeRestart(restart) [17:27:21.024] muffled <- TRUE [17:27:21.024] break [17:27:21.024] } [17:27:21.024] } [17:27:21.024] } [17:27:21.024] invisible(muffled) [17:27:21.024] } [17:27:21.024] muffleCondition(cond, pattern = "^muffle") [17:27:21.024] } [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] if (TRUE) { [17:27:21.024] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.024] { [17:27:21.024] inherits <- base::inherits [17:27:21.024] invokeRestart <- base::invokeRestart [17:27:21.024] is.null <- base::is.null [17:27:21.024] muffled <- FALSE [17:27:21.024] if (inherits(cond, "message")) { [17:27:21.024] muffled <- grepl(pattern, "muffleMessage") [17:27:21.024] if (muffled) [17:27:21.024] invokeRestart("muffleMessage") [17:27:21.024] } [17:27:21.024] else if (inherits(cond, "warning")) { [17:27:21.024] muffled <- grepl(pattern, "muffleWarning") [17:27:21.024] if (muffled) [17:27:21.024] invokeRestart("muffleWarning") [17:27:21.024] } [17:27:21.024] else if (inherits(cond, "condition")) { [17:27:21.024] if (!is.null(pattern)) { [17:27:21.024] computeRestarts <- base::computeRestarts [17:27:21.024] grepl <- base::grepl [17:27:21.024] restarts <- computeRestarts(cond) [17:27:21.024] for (restart in restarts) { [17:27:21.024] name <- restart$name [17:27:21.024] if (is.null(name)) [17:27:21.024] next [17:27:21.024] if (!grepl(pattern, name)) [17:27:21.024] next [17:27:21.024] invokeRestart(restart) [17:27:21.024] muffled <- TRUE [17:27:21.024] break [17:27:21.024] } [17:27:21.024] } [17:27:21.024] } [17:27:21.024] invisible(muffled) [17:27:21.024] } [17:27:21.024] muffleCondition(cond, pattern = "^muffle") [17:27:21.024] } [17:27:21.024] } [17:27:21.024] } [17:27:21.024] })) [17:27:21.024] }, error = function(ex) { [17:27:21.024] base::structure(base::list(value = NULL, visible = NULL, [17:27:21.024] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:21.024] ...future.rng), started = ...future.startTime, [17:27:21.024] finished = Sys.time(), session_uuid = NA_character_, [17:27:21.024] version = "1.8"), class = "FutureResult") [17:27:21.024] }, finally = { [17:27:21.024] if (!identical(...future.workdir, getwd())) [17:27:21.024] setwd(...future.workdir) [17:27:21.024] { [17:27:21.024] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:21.024] ...future.oldOptions$nwarnings <- NULL [17:27:21.024] } [17:27:21.024] base::options(...future.oldOptions) [17:27:21.024] if (.Platform$OS.type == "windows") { [17:27:21.024] old_names <- names(...future.oldEnvVars) [17:27:21.024] envs <- base::Sys.getenv() [17:27:21.024] names <- names(envs) [17:27:21.024] common <- intersect(names, old_names) [17:27:21.024] added <- setdiff(names, old_names) [17:27:21.024] removed <- setdiff(old_names, names) [17:27:21.024] changed <- common[...future.oldEnvVars[common] != [17:27:21.024] envs[common]] [17:27:21.024] NAMES <- toupper(changed) [17:27:21.024] args <- list() [17:27:21.024] for (kk in seq_along(NAMES)) { [17:27:21.024] name <- changed[[kk]] [17:27:21.024] NAME <- NAMES[[kk]] [17:27:21.024] if (name != NAME && is.element(NAME, old_names)) [17:27:21.024] next [17:27:21.024] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:21.024] } [17:27:21.024] NAMES <- toupper(added) [17:27:21.024] for (kk in seq_along(NAMES)) { [17:27:21.024] name <- added[[kk]] [17:27:21.024] NAME <- NAMES[[kk]] [17:27:21.024] if (name != NAME && is.element(NAME, old_names)) [17:27:21.024] next [17:27:21.024] args[[name]] <- "" [17:27:21.024] } [17:27:21.024] NAMES <- toupper(removed) [17:27:21.024] for (kk in seq_along(NAMES)) { [17:27:21.024] name <- removed[[kk]] [17:27:21.024] NAME <- NAMES[[kk]] [17:27:21.024] if (name != NAME && is.element(NAME, old_names)) [17:27:21.024] next [17:27:21.024] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:21.024] } [17:27:21.024] if (length(args) > 0) [17:27:21.024] base::do.call(base::Sys.setenv, args = args) [17:27:21.024] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:21.024] } [17:27:21.024] { [17:27:21.024] if (base::length(...future.futureOptionsAdded) > [17:27:21.024] 0L) { [17:27:21.024] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:21.024] base::names(opts) <- ...future.futureOptionsAdded [17:27:21.024] base::options(opts) [17:27:21.024] } [17:27:21.024] { [17:27:21.024] { [17:27:21.024] base::options(mc.cores = ...future.mc.cores.old) [17:27:21.024] NULL [17:27:21.024] } [17:27:21.024] options(future.plan = NULL) [17:27:21.024] if (is.na(NA_character_)) [17:27:21.024] Sys.unsetenv("R_FUTURE_PLAN") [17:27:21.024] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:21.024] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:21.024] .init = FALSE) [17:27:21.024] } [17:27:21.024] } [17:27:21.024] } [17:27:21.024] }) [17:27:21.024] if (TRUE) { [17:27:21.024] base::sink(type = "output", split = FALSE) [17:27:21.024] if (TRUE) { [17:27:21.024] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:21.024] } [17:27:21.024] else { [17:27:21.024] ...future.result["stdout"] <- base::list(NULL) [17:27:21.024] } [17:27:21.024] base::close(...future.stdout) [17:27:21.024] ...future.stdout <- NULL [17:27:21.024] } [17:27:21.024] ...future.result$conditions <- ...future.conditions [17:27:21.024] ...future.result$finished <- base::Sys.time() [17:27:21.024] ...future.result [17:27:21.024] } [17:27:21.031] Exporting 1 global objects (342 bytes) to cluster node #1 ... [17:27:21.031] Exporting 'a' (39 bytes) to cluster node #1 ... [17:27:21.032] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [17:27:21.032] Exporting 1 global objects (342 bytes) to cluster node #1 ... DONE [17:27:21.033] MultisessionFuture started [17:27:21.033] - Launch lazy future ... done [17:27:21.033] run() for 'MultisessionFuture' ... done [17:27:21.034] result() for ClusterFuture ... [17:27:21.034] receiveMessageFromWorker() for ClusterFuture ... [17:27:21.034] - Validating connection of MultisessionFuture [17:27:21.058] - received message: FutureResult [17:27:21.059] - Received FutureResult [17:27:21.059] - Erased future from FutureRegistry [17:27:21.060] result() for ClusterFuture ... [17:27:21.060] - result already collected: FutureResult [17:27:21.060] result() for ClusterFuture ... done [17:27:21.061] receiveMessageFromWorker() for ClusterFuture ... done [17:27:21.061] result() for ClusterFuture ... done [17:27:21.061] result() for ClusterFuture ... [17:27:21.061] - result already collected: FutureResult [17:27:21.062] result() for ClusterFuture ... done [17:27:21.062] getGlobalsAndPackages() ... [17:27:21.062] Searching for globals... [17:27:21.064] - globals found: [3] '{', '*', 'a' [17:27:21.065] Searching for globals ... DONE [17:27:21.065] Resolving globals: FALSE [17:27:21.066] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:21.067] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:21.067] - globals: [1] 'a' [17:27:21.067] [17:27:21.067] getGlobalsAndPackages() ... DONE [17:27:21.068] run() for 'Future' ... [17:27:21.068] - state: 'created' [17:27:21.069] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:21.089] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:21.090] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:21.090] - Field: 'node' [17:27:21.091] - Field: 'label' [17:27:21.091] - Field: 'local' [17:27:21.091] - Field: 'owner' [17:27:21.091] - Field: 'envir' [17:27:21.092] - Field: 'workers' [17:27:21.092] - Field: 'packages' [17:27:21.092] - Field: 'gc' [17:27:21.093] - Field: 'conditions' [17:27:21.093] - Field: 'persistent' [17:27:21.093] - Field: 'expr' [17:27:21.094] - Field: 'uuid' [17:27:21.094] - Field: 'seed' [17:27:21.094] - Field: 'version' [17:27:21.095] - Field: 'result' [17:27:21.095] - Field: 'asynchronous' [17:27:21.096] - Field: 'calls' [17:27:21.096] - Field: 'globals' [17:27:21.096] - Field: 'stdout' [17:27:21.097] - Field: 'earlySignal' [17:27:21.097] - Field: 'lazy' [17:27:21.098] - Field: 'state' [17:27:21.098] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:21.098] - Launch lazy future ... [17:27:21.099] Packages needed by the future expression (n = 0): [17:27:21.099] Packages needed by future strategies (n = 0): [17:27:21.101] { [17:27:21.101] { [17:27:21.101] { [17:27:21.101] ...future.startTime <- base::Sys.time() [17:27:21.101] { [17:27:21.101] { [17:27:21.101] { [17:27:21.101] { [17:27:21.101] base::local({ [17:27:21.101] has_future <- base::requireNamespace("future", [17:27:21.101] quietly = TRUE) [17:27:21.101] if (has_future) { [17:27:21.101] ns <- base::getNamespace("future") [17:27:21.101] version <- ns[[".package"]][["version"]] [17:27:21.101] if (is.null(version)) [17:27:21.101] version <- utils::packageVersion("future") [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] version <- NULL [17:27:21.101] } [17:27:21.101] if (!has_future || version < "1.8.0") { [17:27:21.101] info <- base::c(r_version = base::gsub("R version ", [17:27:21.101] "", base::R.version$version.string), [17:27:21.101] platform = base::sprintf("%s (%s-bit)", [17:27:21.101] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:21.101] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:21.101] "release", "version")], collapse = " "), [17:27:21.101] hostname = base::Sys.info()[["nodename"]]) [17:27:21.101] info <- base::sprintf("%s: %s", base::names(info), [17:27:21.101] info) [17:27:21.101] info <- base::paste(info, collapse = "; ") [17:27:21.101] if (!has_future) { [17:27:21.101] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:21.101] info) [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:21.101] info, version) [17:27:21.101] } [17:27:21.101] base::stop(msg) [17:27:21.101] } [17:27:21.101] }) [17:27:21.101] } [17:27:21.101] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:21.101] base::options(mc.cores = 1L) [17:27:21.101] } [17:27:21.101] ...future.strategy.old <- future::plan("list") [17:27:21.101] options(future.plan = NULL) [17:27:21.101] Sys.unsetenv("R_FUTURE_PLAN") [17:27:21.101] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:21.101] } [17:27:21.101] ...future.workdir <- getwd() [17:27:21.101] } [17:27:21.101] ...future.oldOptions <- base::as.list(base::.Options) [17:27:21.101] ...future.oldEnvVars <- base::Sys.getenv() [17:27:21.101] } [17:27:21.101] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:21.101] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:21.101] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:21.101] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:21.101] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:21.101] future.stdout.windows.reencode = NULL, width = 80L) [17:27:21.101] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:21.101] base::names(...future.oldOptions)) [17:27:21.101] } [17:27:21.101] if (FALSE) { [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] if (TRUE) { [17:27:21.101] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:21.101] open = "w") [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:21.101] windows = "NUL", "/dev/null"), open = "w") [17:27:21.101] } [17:27:21.101] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:21.101] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:21.101] base::sink(type = "output", split = FALSE) [17:27:21.101] base::close(...future.stdout) [17:27:21.101] }, add = TRUE) [17:27:21.101] } [17:27:21.101] ...future.frame <- base::sys.nframe() [17:27:21.101] ...future.conditions <- base::list() [17:27:21.101] ...future.rng <- base::globalenv()$.Random.seed [17:27:21.101] if (FALSE) { [17:27:21.101] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:21.101] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:21.101] } [17:27:21.101] ...future.result <- base::tryCatch({ [17:27:21.101] base::withCallingHandlers({ [17:27:21.101] ...future.value <- base::withVisible(base::local({ [17:27:21.101] ...future.makeSendCondition <- base::local({ [17:27:21.101] sendCondition <- NULL [17:27:21.101] function(frame = 1L) { [17:27:21.101] if (is.function(sendCondition)) [17:27:21.101] return(sendCondition) [17:27:21.101] ns <- getNamespace("parallel") [17:27:21.101] if (exists("sendData", mode = "function", [17:27:21.101] envir = ns)) { [17:27:21.101] parallel_sendData <- get("sendData", mode = "function", [17:27:21.101] envir = ns) [17:27:21.101] envir <- sys.frame(frame) [17:27:21.101] master <- NULL [17:27:21.101] while (!identical(envir, .GlobalEnv) && [17:27:21.101] !identical(envir, emptyenv())) { [17:27:21.101] if (exists("master", mode = "list", envir = envir, [17:27:21.101] inherits = FALSE)) { [17:27:21.101] master <- get("master", mode = "list", [17:27:21.101] envir = envir, inherits = FALSE) [17:27:21.101] if (inherits(master, c("SOCKnode", [17:27:21.101] "SOCK0node"))) { [17:27:21.101] sendCondition <<- function(cond) { [17:27:21.101] data <- list(type = "VALUE", value = cond, [17:27:21.101] success = TRUE) [17:27:21.101] parallel_sendData(master, data) [17:27:21.101] } [17:27:21.101] return(sendCondition) [17:27:21.101] } [17:27:21.101] } [17:27:21.101] frame <- frame + 1L [17:27:21.101] envir <- sys.frame(frame) [17:27:21.101] } [17:27:21.101] } [17:27:21.101] sendCondition <<- function(cond) NULL [17:27:21.101] } [17:27:21.101] }) [17:27:21.101] withCallingHandlers({ [17:27:21.101] { [17:27:21.101] 2 * a [17:27:21.101] } [17:27:21.101] }, immediateCondition = function(cond) { [17:27:21.101] sendCondition <- ...future.makeSendCondition() [17:27:21.101] sendCondition(cond) [17:27:21.101] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.101] { [17:27:21.101] inherits <- base::inherits [17:27:21.101] invokeRestart <- base::invokeRestart [17:27:21.101] is.null <- base::is.null [17:27:21.101] muffled <- FALSE [17:27:21.101] if (inherits(cond, "message")) { [17:27:21.101] muffled <- grepl(pattern, "muffleMessage") [17:27:21.101] if (muffled) [17:27:21.101] invokeRestart("muffleMessage") [17:27:21.101] } [17:27:21.101] else if (inherits(cond, "warning")) { [17:27:21.101] muffled <- grepl(pattern, "muffleWarning") [17:27:21.101] if (muffled) [17:27:21.101] invokeRestart("muffleWarning") [17:27:21.101] } [17:27:21.101] else if (inherits(cond, "condition")) { [17:27:21.101] if (!is.null(pattern)) { [17:27:21.101] computeRestarts <- base::computeRestarts [17:27:21.101] grepl <- base::grepl [17:27:21.101] restarts <- computeRestarts(cond) [17:27:21.101] for (restart in restarts) { [17:27:21.101] name <- restart$name [17:27:21.101] if (is.null(name)) [17:27:21.101] next [17:27:21.101] if (!grepl(pattern, name)) [17:27:21.101] next [17:27:21.101] invokeRestart(restart) [17:27:21.101] muffled <- TRUE [17:27:21.101] break [17:27:21.101] } [17:27:21.101] } [17:27:21.101] } [17:27:21.101] invisible(muffled) [17:27:21.101] } [17:27:21.101] muffleCondition(cond) [17:27:21.101] }) [17:27:21.101] })) [17:27:21.101] future::FutureResult(value = ...future.value$value, [17:27:21.101] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:21.101] ...future.rng), globalenv = if (FALSE) [17:27:21.101] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:21.101] ...future.globalenv.names)) [17:27:21.101] else NULL, started = ...future.startTime, version = "1.8") [17:27:21.101] }, condition = base::local({ [17:27:21.101] c <- base::c [17:27:21.101] inherits <- base::inherits [17:27:21.101] invokeRestart <- base::invokeRestart [17:27:21.101] length <- base::length [17:27:21.101] list <- base::list [17:27:21.101] seq.int <- base::seq.int [17:27:21.101] signalCondition <- base::signalCondition [17:27:21.101] sys.calls <- base::sys.calls [17:27:21.101] `[[` <- base::`[[` [17:27:21.101] `+` <- base::`+` [17:27:21.101] `<<-` <- base::`<<-` [17:27:21.101] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:21.101] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:21.101] 3L)] [17:27:21.101] } [17:27:21.101] function(cond) { [17:27:21.101] is_error <- inherits(cond, "error") [17:27:21.101] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:21.101] NULL) [17:27:21.101] if (is_error) { [17:27:21.101] sessionInformation <- function() { [17:27:21.101] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:21.101] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:21.101] search = base::search(), system = base::Sys.info()) [17:27:21.101] } [17:27:21.101] ...future.conditions[[length(...future.conditions) + [17:27:21.101] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:21.101] cond$call), session = sessionInformation(), [17:27:21.101] timestamp = base::Sys.time(), signaled = 0L) [17:27:21.101] signalCondition(cond) [17:27:21.101] } [17:27:21.101] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:21.101] "immediateCondition"))) { [17:27:21.101] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:21.101] ...future.conditions[[length(...future.conditions) + [17:27:21.101] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:21.101] if (TRUE && !signal) { [17:27:21.101] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.101] { [17:27:21.101] inherits <- base::inherits [17:27:21.101] invokeRestart <- base::invokeRestart [17:27:21.101] is.null <- base::is.null [17:27:21.101] muffled <- FALSE [17:27:21.101] if (inherits(cond, "message")) { [17:27:21.101] muffled <- grepl(pattern, "muffleMessage") [17:27:21.101] if (muffled) [17:27:21.101] invokeRestart("muffleMessage") [17:27:21.101] } [17:27:21.101] else if (inherits(cond, "warning")) { [17:27:21.101] muffled <- grepl(pattern, "muffleWarning") [17:27:21.101] if (muffled) [17:27:21.101] invokeRestart("muffleWarning") [17:27:21.101] } [17:27:21.101] else if (inherits(cond, "condition")) { [17:27:21.101] if (!is.null(pattern)) { [17:27:21.101] computeRestarts <- base::computeRestarts [17:27:21.101] grepl <- base::grepl [17:27:21.101] restarts <- computeRestarts(cond) [17:27:21.101] for (restart in restarts) { [17:27:21.101] name <- restart$name [17:27:21.101] if (is.null(name)) [17:27:21.101] next [17:27:21.101] if (!grepl(pattern, name)) [17:27:21.101] next [17:27:21.101] invokeRestart(restart) [17:27:21.101] muffled <- TRUE [17:27:21.101] break [17:27:21.101] } [17:27:21.101] } [17:27:21.101] } [17:27:21.101] invisible(muffled) [17:27:21.101] } [17:27:21.101] muffleCondition(cond, pattern = "^muffle") [17:27:21.101] } [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] if (TRUE) { [17:27:21.101] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.101] { [17:27:21.101] inherits <- base::inherits [17:27:21.101] invokeRestart <- base::invokeRestart [17:27:21.101] is.null <- base::is.null [17:27:21.101] muffled <- FALSE [17:27:21.101] if (inherits(cond, "message")) { [17:27:21.101] muffled <- grepl(pattern, "muffleMessage") [17:27:21.101] if (muffled) [17:27:21.101] invokeRestart("muffleMessage") [17:27:21.101] } [17:27:21.101] else if (inherits(cond, "warning")) { [17:27:21.101] muffled <- grepl(pattern, "muffleWarning") [17:27:21.101] if (muffled) [17:27:21.101] invokeRestart("muffleWarning") [17:27:21.101] } [17:27:21.101] else if (inherits(cond, "condition")) { [17:27:21.101] if (!is.null(pattern)) { [17:27:21.101] computeRestarts <- base::computeRestarts [17:27:21.101] grepl <- base::grepl [17:27:21.101] restarts <- computeRestarts(cond) [17:27:21.101] for (restart in restarts) { [17:27:21.101] name <- restart$name [17:27:21.101] if (is.null(name)) [17:27:21.101] next [17:27:21.101] if (!grepl(pattern, name)) [17:27:21.101] next [17:27:21.101] invokeRestart(restart) [17:27:21.101] muffled <- TRUE [17:27:21.101] break [17:27:21.101] } [17:27:21.101] } [17:27:21.101] } [17:27:21.101] invisible(muffled) [17:27:21.101] } [17:27:21.101] muffleCondition(cond, pattern = "^muffle") [17:27:21.101] } [17:27:21.101] } [17:27:21.101] } [17:27:21.101] })) [17:27:21.101] }, error = function(ex) { [17:27:21.101] base::structure(base::list(value = NULL, visible = NULL, [17:27:21.101] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:21.101] ...future.rng), started = ...future.startTime, [17:27:21.101] finished = Sys.time(), session_uuid = NA_character_, [17:27:21.101] version = "1.8"), class = "FutureResult") [17:27:21.101] }, finally = { [17:27:21.101] if (!identical(...future.workdir, getwd())) [17:27:21.101] setwd(...future.workdir) [17:27:21.101] { [17:27:21.101] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:21.101] ...future.oldOptions$nwarnings <- NULL [17:27:21.101] } [17:27:21.101] base::options(...future.oldOptions) [17:27:21.101] if (.Platform$OS.type == "windows") { [17:27:21.101] old_names <- names(...future.oldEnvVars) [17:27:21.101] envs <- base::Sys.getenv() [17:27:21.101] names <- names(envs) [17:27:21.101] common <- intersect(names, old_names) [17:27:21.101] added <- setdiff(names, old_names) [17:27:21.101] removed <- setdiff(old_names, names) [17:27:21.101] changed <- common[...future.oldEnvVars[common] != [17:27:21.101] envs[common]] [17:27:21.101] NAMES <- toupper(changed) [17:27:21.101] args <- list() [17:27:21.101] for (kk in seq_along(NAMES)) { [17:27:21.101] name <- changed[[kk]] [17:27:21.101] NAME <- NAMES[[kk]] [17:27:21.101] if (name != NAME && is.element(NAME, old_names)) [17:27:21.101] next [17:27:21.101] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:21.101] } [17:27:21.101] NAMES <- toupper(added) [17:27:21.101] for (kk in seq_along(NAMES)) { [17:27:21.101] name <- added[[kk]] [17:27:21.101] NAME <- NAMES[[kk]] [17:27:21.101] if (name != NAME && is.element(NAME, old_names)) [17:27:21.101] next [17:27:21.101] args[[name]] <- "" [17:27:21.101] } [17:27:21.101] NAMES <- toupper(removed) [17:27:21.101] for (kk in seq_along(NAMES)) { [17:27:21.101] name <- removed[[kk]] [17:27:21.101] NAME <- NAMES[[kk]] [17:27:21.101] if (name != NAME && is.element(NAME, old_names)) [17:27:21.101] next [17:27:21.101] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:21.101] } [17:27:21.101] if (length(args) > 0) [17:27:21.101] base::do.call(base::Sys.setenv, args = args) [17:27:21.101] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:21.101] } [17:27:21.101] { [17:27:21.101] if (base::length(...future.futureOptionsAdded) > [17:27:21.101] 0L) { [17:27:21.101] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:21.101] base::names(opts) <- ...future.futureOptionsAdded [17:27:21.101] base::options(opts) [17:27:21.101] } [17:27:21.101] { [17:27:21.101] { [17:27:21.101] base::options(mc.cores = ...future.mc.cores.old) [17:27:21.101] NULL [17:27:21.101] } [17:27:21.101] options(future.plan = NULL) [17:27:21.101] if (is.na(NA_character_)) [17:27:21.101] Sys.unsetenv("R_FUTURE_PLAN") [17:27:21.101] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:21.101] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:21.101] .init = FALSE) [17:27:21.101] } [17:27:21.101] } [17:27:21.101] } [17:27:21.101] }) [17:27:21.101] if (TRUE) { [17:27:21.101] base::sink(type = "output", split = FALSE) [17:27:21.101] if (TRUE) { [17:27:21.101] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:21.101] } [17:27:21.101] else { [17:27:21.101] ...future.result["stdout"] <- base::list(NULL) [17:27:21.101] } [17:27:21.101] base::close(...future.stdout) [17:27:21.101] ...future.stdout <- NULL [17:27:21.101] } [17:27:21.101] ...future.result$conditions <- ...future.conditions [17:27:21.101] ...future.result$finished <- base::Sys.time() [17:27:21.101] ...future.result [17:27:21.101] } [17:27:21.111] Exporting 1 global objects (342 bytes) to cluster node #1 ... [17:27:21.112] Exporting 'a' (39 bytes) to cluster node #1 ... [17:27:21.112] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [17:27:21.113] Exporting 1 global objects (342 bytes) to cluster node #1 ... DONE [17:27:21.114] MultisessionFuture started [17:27:21.114] - Launch lazy future ... done [17:27:21.114] run() for 'MultisessionFuture' ... done [17:27:21.115] result() for ClusterFuture ... [17:27:21.115] receiveMessageFromWorker() for ClusterFuture ... [17:27:21.115] - Validating connection of MultisessionFuture [17:27:21.143] - received message: FutureResult [17:27:21.144] - Received FutureResult [17:27:21.144] - Erased future from FutureRegistry [17:27:21.144] result() for ClusterFuture ... [17:27:21.144] - result already collected: FutureResult [17:27:21.144] result() for ClusterFuture ... done [17:27:21.145] receiveMessageFromWorker() for ClusterFuture ... done [17:27:21.145] result() for ClusterFuture ... done [17:27:21.145] result() for ClusterFuture ... [17:27:21.145] - result already collected: FutureResult [17:27:21.145] result() for ClusterFuture ... done [17:27:21.146] getGlobalsAndPackages() ... [17:27:21.146] Searching for globals... [17:27:21.147] - globals found: [3] '{', '*', 'a' [17:27:21.148] Searching for globals ... DONE [17:27:21.148] Resolving globals: FALSE [17:27:21.148] The total size of the 1 globals is 39 bytes (39 bytes) [17:27:21.149] The total size of the 1 globals exported for future expression ('{; 2 * a; }') is 39 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'a' (39 bytes of class 'numeric') [17:27:21.149] - globals: [1] 'a' [17:27:21.149] [17:27:21.149] getGlobalsAndPackages() ... DONE [17:27:21.150] run() for 'Future' ... [17:27:21.150] - state: 'created' [17:27:21.150] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [17:27:21.169] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [17:27:21.169] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [17:27:21.170] - Field: 'node' [17:27:21.170] - Field: 'label' [17:27:21.170] - Field: 'local' [17:27:21.171] - Field: 'owner' [17:27:21.171] - Field: 'envir' [17:27:21.172] - Field: 'workers' [17:27:21.172] - Field: 'packages' [17:27:21.172] - Field: 'gc' [17:27:21.173] - Field: 'conditions' [17:27:21.173] - Field: 'persistent' [17:27:21.173] - Field: 'expr' [17:27:21.174] - Field: 'uuid' [17:27:21.174] - Field: 'seed' [17:27:21.174] - Field: 'version' [17:27:21.175] - Field: 'result' [17:27:21.175] - Field: 'asynchronous' [17:27:21.175] - Field: 'calls' [17:27:21.176] - Field: 'globals' [17:27:21.176] - Field: 'stdout' [17:27:21.176] - Field: 'earlySignal' [17:27:21.177] - Field: 'lazy' [17:27:21.177] - Field: 'state' [17:27:21.177] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [17:27:21.178] - Launch lazy future ... [17:27:21.178] Packages needed by the future expression (n = 0): [17:27:21.179] Packages needed by future strategies (n = 0): [17:27:21.180] { [17:27:21.180] { [17:27:21.180] { [17:27:21.180] ...future.startTime <- base::Sys.time() [17:27:21.180] { [17:27:21.180] { [17:27:21.180] { [17:27:21.180] { [17:27:21.180] base::local({ [17:27:21.180] has_future <- base::requireNamespace("future", [17:27:21.180] quietly = TRUE) [17:27:21.180] if (has_future) { [17:27:21.180] ns <- base::getNamespace("future") [17:27:21.180] version <- ns[[".package"]][["version"]] [17:27:21.180] if (is.null(version)) [17:27:21.180] version <- utils::packageVersion("future") [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] version <- NULL [17:27:21.180] } [17:27:21.180] if (!has_future || version < "1.8.0") { [17:27:21.180] info <- base::c(r_version = base::gsub("R version ", [17:27:21.180] "", base::R.version$version.string), [17:27:21.180] platform = base::sprintf("%s (%s-bit)", [17:27:21.180] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [17:27:21.180] os = base::paste(base::Sys.info()[base::c("sysname", [17:27:21.180] "release", "version")], collapse = " "), [17:27:21.180] hostname = base::Sys.info()[["nodename"]]) [17:27:21.180] info <- base::sprintf("%s: %s", base::names(info), [17:27:21.180] info) [17:27:21.180] info <- base::paste(info, collapse = "; ") [17:27:21.180] if (!has_future) { [17:27:21.180] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [17:27:21.180] info) [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [17:27:21.180] info, version) [17:27:21.180] } [17:27:21.180] base::stop(msg) [17:27:21.180] } [17:27:21.180] }) [17:27:21.180] } [17:27:21.180] ...future.mc.cores.old <- base::getOption("mc.cores") [17:27:21.180] base::options(mc.cores = 1L) [17:27:21.180] } [17:27:21.180] ...future.strategy.old <- future::plan("list") [17:27:21.180] options(future.plan = NULL) [17:27:21.180] Sys.unsetenv("R_FUTURE_PLAN") [17:27:21.180] future::plan("default", .cleanup = FALSE, .init = FALSE) [17:27:21.180] } [17:27:21.180] ...future.workdir <- getwd() [17:27:21.180] } [17:27:21.180] ...future.oldOptions <- base::as.list(base::.Options) [17:27:21.180] ...future.oldEnvVars <- base::Sys.getenv() [17:27:21.180] } [17:27:21.180] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [17:27:21.180] future.globals.maxSize = NULL, future.globals.method = NULL, [17:27:21.180] future.globals.onMissing = NULL, future.globals.onReference = NULL, [17:27:21.180] future.globals.resolve = NULL, future.resolve.recursive = NULL, [17:27:21.180] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [17:27:21.180] future.stdout.windows.reencode = NULL, width = 80L) [17:27:21.180] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [17:27:21.180] base::names(...future.oldOptions)) [17:27:21.180] } [17:27:21.180] if (FALSE) { [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] if (TRUE) { [17:27:21.180] ...future.stdout <- base::rawConnection(base::raw(0L), [17:27:21.180] open = "w") [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [17:27:21.180] windows = "NUL", "/dev/null"), open = "w") [17:27:21.180] } [17:27:21.180] base::sink(...future.stdout, type = "output", split = FALSE) [17:27:21.180] base::on.exit(if (!base::is.null(...future.stdout)) { [17:27:21.180] base::sink(type = "output", split = FALSE) [17:27:21.180] base::close(...future.stdout) [17:27:21.180] }, add = TRUE) [17:27:21.180] } [17:27:21.180] ...future.frame <- base::sys.nframe() [17:27:21.180] ...future.conditions <- base::list() [17:27:21.180] ...future.rng <- base::globalenv()$.Random.seed [17:27:21.180] if (FALSE) { [17:27:21.180] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [17:27:21.180] "...future.value", "...future.globalenv.names", ".Random.seed") [17:27:21.180] } [17:27:21.180] ...future.result <- base::tryCatch({ [17:27:21.180] base::withCallingHandlers({ [17:27:21.180] ...future.value <- base::withVisible(base::local({ [17:27:21.180] ...future.makeSendCondition <- base::local({ [17:27:21.180] sendCondition <- NULL [17:27:21.180] function(frame = 1L) { [17:27:21.180] if (is.function(sendCondition)) [17:27:21.180] return(sendCondition) [17:27:21.180] ns <- getNamespace("parallel") [17:27:21.180] if (exists("sendData", mode = "function", [17:27:21.180] envir = ns)) { [17:27:21.180] parallel_sendData <- get("sendData", mode = "function", [17:27:21.180] envir = ns) [17:27:21.180] envir <- sys.frame(frame) [17:27:21.180] master <- NULL [17:27:21.180] while (!identical(envir, .GlobalEnv) && [17:27:21.180] !identical(envir, emptyenv())) { [17:27:21.180] if (exists("master", mode = "list", envir = envir, [17:27:21.180] inherits = FALSE)) { [17:27:21.180] master <- get("master", mode = "list", [17:27:21.180] envir = envir, inherits = FALSE) [17:27:21.180] if (inherits(master, c("SOCKnode", [17:27:21.180] "SOCK0node"))) { [17:27:21.180] sendCondition <<- function(cond) { [17:27:21.180] data <- list(type = "VALUE", value = cond, [17:27:21.180] success = TRUE) [17:27:21.180] parallel_sendData(master, data) [17:27:21.180] } [17:27:21.180] return(sendCondition) [17:27:21.180] } [17:27:21.180] } [17:27:21.180] frame <- frame + 1L [17:27:21.180] envir <- sys.frame(frame) [17:27:21.180] } [17:27:21.180] } [17:27:21.180] sendCondition <<- function(cond) NULL [17:27:21.180] } [17:27:21.180] }) [17:27:21.180] withCallingHandlers({ [17:27:21.180] { [17:27:21.180] 2 * a [17:27:21.180] } [17:27:21.180] }, immediateCondition = function(cond) { [17:27:21.180] sendCondition <- ...future.makeSendCondition() [17:27:21.180] sendCondition(cond) [17:27:21.180] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.180] { [17:27:21.180] inherits <- base::inherits [17:27:21.180] invokeRestart <- base::invokeRestart [17:27:21.180] is.null <- base::is.null [17:27:21.180] muffled <- FALSE [17:27:21.180] if (inherits(cond, "message")) { [17:27:21.180] muffled <- grepl(pattern, "muffleMessage") [17:27:21.180] if (muffled) [17:27:21.180] invokeRestart("muffleMessage") [17:27:21.180] } [17:27:21.180] else if (inherits(cond, "warning")) { [17:27:21.180] muffled <- grepl(pattern, "muffleWarning") [17:27:21.180] if (muffled) [17:27:21.180] invokeRestart("muffleWarning") [17:27:21.180] } [17:27:21.180] else if (inherits(cond, "condition")) { [17:27:21.180] if (!is.null(pattern)) { [17:27:21.180] computeRestarts <- base::computeRestarts [17:27:21.180] grepl <- base::grepl [17:27:21.180] restarts <- computeRestarts(cond) [17:27:21.180] for (restart in restarts) { [17:27:21.180] name <- restart$name [17:27:21.180] if (is.null(name)) [17:27:21.180] next [17:27:21.180] if (!grepl(pattern, name)) [17:27:21.180] next [17:27:21.180] invokeRestart(restart) [17:27:21.180] muffled <- TRUE [17:27:21.180] break [17:27:21.180] } [17:27:21.180] } [17:27:21.180] } [17:27:21.180] invisible(muffled) [17:27:21.180] } [17:27:21.180] muffleCondition(cond) [17:27:21.180] }) [17:27:21.180] })) [17:27:21.180] future::FutureResult(value = ...future.value$value, [17:27:21.180] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [17:27:21.180] ...future.rng), globalenv = if (FALSE) [17:27:21.180] list(added = base::setdiff(base::names(base::.GlobalEnv), [17:27:21.180] ...future.globalenv.names)) [17:27:21.180] else NULL, started = ...future.startTime, version = "1.8") [17:27:21.180] }, condition = base::local({ [17:27:21.180] c <- base::c [17:27:21.180] inherits <- base::inherits [17:27:21.180] invokeRestart <- base::invokeRestart [17:27:21.180] length <- base::length [17:27:21.180] list <- base::list [17:27:21.180] seq.int <- base::seq.int [17:27:21.180] signalCondition <- base::signalCondition [17:27:21.180] sys.calls <- base::sys.calls [17:27:21.180] `[[` <- base::`[[` [17:27:21.180] `+` <- base::`+` [17:27:21.180] `<<-` <- base::`<<-` [17:27:21.180] sysCalls <- function(calls = sys.calls(), from = 1L) { [17:27:21.180] calls[seq.int(from = from + 12L, to = length(calls) - [17:27:21.180] 3L)] [17:27:21.180] } [17:27:21.180] function(cond) { [17:27:21.180] is_error <- inherits(cond, "error") [17:27:21.180] ignore <- !is_error && !is.null(NULL) && inherits(cond, [17:27:21.180] NULL) [17:27:21.180] if (is_error) { [17:27:21.180] sessionInformation <- function() { [17:27:21.180] list(r = base::R.Version(), locale = base::Sys.getlocale(), [17:27:21.180] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [17:27:21.180] search = base::search(), system = base::Sys.info()) [17:27:21.180] } [17:27:21.180] ...future.conditions[[length(...future.conditions) + [17:27:21.180] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [17:27:21.180] cond$call), session = sessionInformation(), [17:27:21.180] timestamp = base::Sys.time(), signaled = 0L) [17:27:21.180] signalCondition(cond) [17:27:21.180] } [17:27:21.180] else if (!ignore && TRUE && inherits(cond, c("condition", [17:27:21.180] "immediateCondition"))) { [17:27:21.180] signal <- TRUE && inherits(cond, "immediateCondition") [17:27:21.180] ...future.conditions[[length(...future.conditions) + [17:27:21.180] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [17:27:21.180] if (TRUE && !signal) { [17:27:21.180] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.180] { [17:27:21.180] inherits <- base::inherits [17:27:21.180] invokeRestart <- base::invokeRestart [17:27:21.180] is.null <- base::is.null [17:27:21.180] muffled <- FALSE [17:27:21.180] if (inherits(cond, "message")) { [17:27:21.180] muffled <- grepl(pattern, "muffleMessage") [17:27:21.180] if (muffled) [17:27:21.180] invokeRestart("muffleMessage") [17:27:21.180] } [17:27:21.180] else if (inherits(cond, "warning")) { [17:27:21.180] muffled <- grepl(pattern, "muffleWarning") [17:27:21.180] if (muffled) [17:27:21.180] invokeRestart("muffleWarning") [17:27:21.180] } [17:27:21.180] else if (inherits(cond, "condition")) { [17:27:21.180] if (!is.null(pattern)) { [17:27:21.180] computeRestarts <- base::computeRestarts [17:27:21.180] grepl <- base::grepl [17:27:21.180] restarts <- computeRestarts(cond) [17:27:21.180] for (restart in restarts) { [17:27:21.180] name <- restart$name [17:27:21.180] if (is.null(name)) [17:27:21.180] next [17:27:21.180] if (!grepl(pattern, name)) [17:27:21.180] next [17:27:21.180] invokeRestart(restart) [17:27:21.180] muffled <- TRUE [17:27:21.180] break [17:27:21.180] } [17:27:21.180] } [17:27:21.180] } [17:27:21.180] invisible(muffled) [17:27:21.180] } [17:27:21.180] muffleCondition(cond, pattern = "^muffle") [17:27:21.180] } [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] if (TRUE) { [17:27:21.180] muffleCondition <- function (cond, pattern = "^muffle") [17:27:21.180] { [17:27:21.180] inherits <- base::inherits [17:27:21.180] invokeRestart <- base::invokeRestart [17:27:21.180] is.null <- base::is.null [17:27:21.180] muffled <- FALSE [17:27:21.180] if (inherits(cond, "message")) { [17:27:21.180] muffled <- grepl(pattern, "muffleMessage") [17:27:21.180] if (muffled) [17:27:21.180] invokeRestart("muffleMessage") [17:27:21.180] } [17:27:21.180] else if (inherits(cond, "warning")) { [17:27:21.180] muffled <- grepl(pattern, "muffleWarning") [17:27:21.180] if (muffled) [17:27:21.180] invokeRestart("muffleWarning") [17:27:21.180] } [17:27:21.180] else if (inherits(cond, "condition")) { [17:27:21.180] if (!is.null(pattern)) { [17:27:21.180] computeRestarts <- base::computeRestarts [17:27:21.180] grepl <- base::grepl [17:27:21.180] restarts <- computeRestarts(cond) [17:27:21.180] for (restart in restarts) { [17:27:21.180] name <- restart$name [17:27:21.180] if (is.null(name)) [17:27:21.180] next [17:27:21.180] if (!grepl(pattern, name)) [17:27:21.180] next [17:27:21.180] invokeRestart(restart) [17:27:21.180] muffled <- TRUE [17:27:21.180] break [17:27:21.180] } [17:27:21.180] } [17:27:21.180] } [17:27:21.180] invisible(muffled) [17:27:21.180] } [17:27:21.180] muffleCondition(cond, pattern = "^muffle") [17:27:21.180] } [17:27:21.180] } [17:27:21.180] } [17:27:21.180] })) [17:27:21.180] }, error = function(ex) { [17:27:21.180] base::structure(base::list(value = NULL, visible = NULL, [17:27:21.180] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [17:27:21.180] ...future.rng), started = ...future.startTime, [17:27:21.180] finished = Sys.time(), session_uuid = NA_character_, [17:27:21.180] version = "1.8"), class = "FutureResult") [17:27:21.180] }, finally = { [17:27:21.180] if (!identical(...future.workdir, getwd())) [17:27:21.180] setwd(...future.workdir) [17:27:21.180] { [17:27:21.180] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [17:27:21.180] ...future.oldOptions$nwarnings <- NULL [17:27:21.180] } [17:27:21.180] base::options(...future.oldOptions) [17:27:21.180] if (.Platform$OS.type == "windows") { [17:27:21.180] old_names <- names(...future.oldEnvVars) [17:27:21.180] envs <- base::Sys.getenv() [17:27:21.180] names <- names(envs) [17:27:21.180] common <- intersect(names, old_names) [17:27:21.180] added <- setdiff(names, old_names) [17:27:21.180] removed <- setdiff(old_names, names) [17:27:21.180] changed <- common[...future.oldEnvVars[common] != [17:27:21.180] envs[common]] [17:27:21.180] NAMES <- toupper(changed) [17:27:21.180] args <- list() [17:27:21.180] for (kk in seq_along(NAMES)) { [17:27:21.180] name <- changed[[kk]] [17:27:21.180] NAME <- NAMES[[kk]] [17:27:21.180] if (name != NAME && is.element(NAME, old_names)) [17:27:21.180] next [17:27:21.180] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:21.180] } [17:27:21.180] NAMES <- toupper(added) [17:27:21.180] for (kk in seq_along(NAMES)) { [17:27:21.180] name <- added[[kk]] [17:27:21.180] NAME <- NAMES[[kk]] [17:27:21.180] if (name != NAME && is.element(NAME, old_names)) [17:27:21.180] next [17:27:21.180] args[[name]] <- "" [17:27:21.180] } [17:27:21.180] NAMES <- toupper(removed) [17:27:21.180] for (kk in seq_along(NAMES)) { [17:27:21.180] name <- removed[[kk]] [17:27:21.180] NAME <- NAMES[[kk]] [17:27:21.180] if (name != NAME && is.element(NAME, old_names)) [17:27:21.180] next [17:27:21.180] args[[name]] <- ...future.oldEnvVars[[name]] [17:27:21.180] } [17:27:21.180] if (length(args) > 0) [17:27:21.180] base::do.call(base::Sys.setenv, args = args) [17:27:21.180] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [17:27:21.180] } [17:27:21.180] { [17:27:21.180] if (base::length(...future.futureOptionsAdded) > [17:27:21.180] 0L) { [17:27:21.180] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [17:27:21.180] base::names(opts) <- ...future.futureOptionsAdded [17:27:21.180] base::options(opts) [17:27:21.180] } [17:27:21.180] { [17:27:21.180] { [17:27:21.180] base::options(mc.cores = ...future.mc.cores.old) [17:27:21.180] NULL [17:27:21.180] } [17:27:21.180] options(future.plan = NULL) [17:27:21.180] if (is.na(NA_character_)) [17:27:21.180] Sys.unsetenv("R_FUTURE_PLAN") [17:27:21.180] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [17:27:21.180] future::plan(...future.strategy.old, .cleanup = FALSE, [17:27:21.180] .init = FALSE) [17:27:21.180] } [17:27:21.180] } [17:27:21.180] } [17:27:21.180] }) [17:27:21.180] if (TRUE) { [17:27:21.180] base::sink(type = "output", split = FALSE) [17:27:21.180] if (TRUE) { [17:27:21.180] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [17:27:21.180] } [17:27:21.180] else { [17:27:21.180] ...future.result["stdout"] <- base::list(NULL) [17:27:21.180] } [17:27:21.180] base::close(...future.stdout) [17:27:21.180] ...future.stdout <- NULL [17:27:21.180] } [17:27:21.180] ...future.result$conditions <- ...future.conditions [17:27:21.180] ...future.result$finished <- base::Sys.time() [17:27:21.180] ...future.result [17:27:21.180] } [17:27:21.190] Exporting 1 global objects (342 bytes) to cluster node #1 ... [17:27:21.191] Exporting 'a' (39 bytes) to cluster node #1 ... [17:27:21.192] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [17:27:21.192] Exporting 1 global objects (342 bytes) to cluster node #1 ... DONE [17:27:21.193] MultisessionFuture started [17:27:21.193] - Launch lazy future ... done [17:27:21.193] run() for 'MultisessionFuture' ... done [17:27:21.194] result() for ClusterFuture ... [17:27:21.194] receiveMessageFromWorker() for ClusterFuture ... [17:27:21.194] - Validating connection of MultisessionFuture [17:27:21.215] - received message: FutureResult [17:27:21.216] - Received FutureResult [17:27:21.216] - Erased future from FutureRegistry [17:27:21.216] result() for ClusterFuture ... [17:27:21.216] - result already collected: FutureResult [17:27:21.216] result() for ClusterFuture ... done [17:27:21.216] receiveMessageFromWorker() for ClusterFuture ... done [17:27:21.217] result() for ClusterFuture ... done [17:27:21.217] result() for ClusterFuture ... [17:27:21.217] - result already collected: FutureResult [17:27:21.217] result() for ClusterFuture ... done *** futureAssign() with 'multisession' futures ... DONE Testing with 2 cores ... DONE > > message("*** futureAssign() - lazy = TRUE / FALSE ... DONE") *** futureAssign() - lazy = TRUE / FALSE ... DONE > > message("*** futureAssign() ... DONE") *** futureAssign() ... DONE > > source("incl/end.R") [17:27:21.218] plan(): Setting new future strategy stack: [17:27:21.218] List of future strategies: [17:27:21.218] 1. FutureStrategy: [17:27:21.218] - args: function (..., envir = parent.frame(), workers = "") [17:27:21.218] - tweaked: FALSE [17:27:21.218] - call: future::plan(oplan) [17:27:21.227] plan(): nbrOfWorkers() = 1 Failed to undo environment variables: - Expected environment variables: [n=205] '!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', 'OCL', 'OMP_THREAD_LIMIT', 'OS', 'PATH', 'PATHEXT', 'PROCESSOR_ARCHITECTURE', 'PROCESSOR_IDENTIFIER', 'PROCESSOR_LEVEL', 'PROCESSOR_REVISION', 'PROGRAMFILES', 'PROMPT', 'PSModulePath', 'PUBLIC', 'PWD', 'ProgramData', 'ProgramFiles(x86)', 'ProgramW6432', 'RTOOLS43_HOME', 'RTOOLS44_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_RTOOLS44_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_MBCS_CONVERSION_FAILURE_', '_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_NOTE_LOST_BRACES_', '_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_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_NOTE_MISSING_PACKAGE_ANCHORS_', '_R_CHECK_XREFS_USE_ALIASES_FROM_CRAN_', '_R_CLASS_MATRIX_ARRAY_', '_R_DEPRECATED_IS_R_', '_R_S3_METHOD_LOOKUP_BASEENV_AFTER_GLOBALENV_', '_R_SHLIB_BUILD_OBJECTS_SYMBOL_TABLES_', '__R_CHECK_DOC_FILES_NOTE_IF_ALL_SPECIAL__', '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 1.20 0.23 2.53