R Under development (unstable) (2024-10-26 r87273 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") Loading required package: future [18:42:08.997] plan(): Setting new future strategy stack: [18:42:08.999] List of future strategies: [18:42:08.999] 1. sequential: [18:42:08.999] - args: function (..., envir = parent.frame(), workers = "") [18:42:08.999] - tweaked: FALSE [18:42:08.999] - call: future::plan("sequential") [18:42:09.015] plan(): nbrOfWorkers() = 1 > > message("*** future_*apply() and 'future.stdout' ...") *** future_*apply() and 'future.stdout' ... > > options(future.debug = TRUE) > > truth <- list() > > out <- utils::capture.output({ + y <- lapply(1:0, FUN = function(x) { + print(x) + }) + }) > truth[["lapply"]] <- list(value = y, stdout = out) > > out <- utils::capture.output({ + y <- mapply(1:0, 0:1, FUN = function(x, y) { + print(list(x = x, y = y)) + }) + }) > truth[["mapply"]] <- list(value = y, stdout = out) > > for (cores in 1:availCores) { + message(sprintf(" - Testing with %d cores ...", cores)) + options(mc.cores = cores) + + for (strategy in supportedStrategies(cores)) { + message(sprintf("* plan('%s') ...", strategy)) + plan(strategy) + + for (fun in names(truth)) { + for (stdout in c(FALSE, TRUE, NA)) { + message(sprintf("* future_%s(x, ..., future.stdout = %s) ...", fun, stdout)) + + out <- utils::capture.output({ + if (fun == "lapply") { + y <- future_lapply(1:0, FUN = function(x) { + Sys.sleep(x / 2) ## make futures resolve out of order + print(x) + }, future.stdout = stdout) + } else if (fun == "mapply") { + y <- future_mapply(1:0, 0:1, FUN = function(x, y) { + Sys.sleep(x / 2) ## make futures resolve out of order + print(list(x = x, y = y)) + }, future.stdout = stdout) + } + }) + stopifnot(identical(y, truth[[fun]]$value)) + + if (isTRUE(stdout)) { + stopifnot(identical(out, truth[[fun]]$stdout)) + } else if (is.na(stdout)) { + } else { + stopifnot(nchar(out) == 0) + } + + message(sprintf("* future_%s(x, ..., future.stdout = %s) ... DONE", fun, stdout)) + } ## for (stdout ...) + } ## for (fun ...) + + message(sprintf("* plan('%s') ... DONE", strategy)) + } + + message(sprintf(" - Testing with %d cores ... DONE", cores)) + } - Testing with 1 cores ... * plan('sequential') ... [18:42:09.057] plan(): Setting new future strategy stack: [18:42:09.057] List of future strategies: [18:42:09.057] 1. sequential: [18:42:09.057] - args: function (..., envir = parent.frame(), workers = "") [18:42:09.057] - tweaked: FALSE [18:42:09.057] - call: plan(strategy) [18:42:09.071] plan(): nbrOfWorkers() = 1 * future_lapply(x, ..., future.stdout = FALSE) ... [18:42:09.072] future_lapply() ... [18:42:09.077] Number of chunks: 1 [18:42:09.077] getGlobalsAndPackagesXApply() ... [18:42:09.078] - future.globals: TRUE [18:42:09.078] getGlobalsAndPackages() ... [18:42:09.079] Searching for globals... [18:42:09.082] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:09.082] Searching for globals ... DONE [18:42:09.082] Resolving globals: FALSE [18:42:09.084] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:09.084] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:09.084] - globals: [1] 'FUN' [18:42:09.085] [18:42:09.085] getGlobalsAndPackages() ... DONE [18:42:09.085] - globals found/used: [n=1] 'FUN' [18:42:09.085] - needed namespaces: [n=0] [18:42:09.085] Finding globals ... DONE [18:42:09.086] - use_args: TRUE [18:42:09.086] - Getting '...' globals ... [18:42:09.087] resolve() on list ... [18:42:09.087] recursive: 0 [18:42:09.087] length: 1 [18:42:09.088] elements: '...' [18:42:09.088] length: 0 (resolved future 1) [18:42:09.088] resolve() on list ... DONE [18:42:09.088] - '...' content: [n=0] [18:42:09.088] List of 1 [18:42:09.088] $ ...: list() [18:42:09.088] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:09.088] - attr(*, "where")=List of 1 [18:42:09.088] ..$ ...: [18:42:09.088] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:09.088] - attr(*, "resolved")= logi TRUE [18:42:09.088] - attr(*, "total_size")= num NA [18:42:09.096] - Getting '...' globals ... DONE [18:42:09.096] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:09.097] List of 2 [18:42:09.097] $ ...future.FUN:function (x) [18:42:09.097] $ ... : list() [18:42:09.097] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:09.097] - attr(*, "where")=List of 2 [18:42:09.097] ..$ ...future.FUN: [18:42:09.097] ..$ ... : [18:42:09.097] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:09.097] - attr(*, "resolved")= logi FALSE [18:42:09.097] - attr(*, "total_size")= int 5632 [18:42:09.100] Packages to be attached in all futures: [n=0] [18:42:09.100] getGlobalsAndPackagesXApply() ... DONE [18:42:09.100] Number of futures (= number of chunks): 1 [18:42:09.101] Launching 1 futures (chunks) ... [18:42:09.101] Chunk #1 of 1 ... [18:42:09.101] - Finding globals in 'X' for chunk #1 ... [18:42:09.101] getGlobalsAndPackages() ... [18:42:09.101] Searching for globals... [18:42:09.102] [18:42:09.102] Searching for globals ... DONE [18:42:09.102] - globals: [0] [18:42:09.102] getGlobalsAndPackages() ... DONE [18:42:09.102] + additional globals found: [n=0] [18:42:09.103] + additional namespaces needed: [n=0] [18:42:09.103] - Finding globals in 'X' for chunk #1 ... DONE [18:42:09.103] - seeds: [18:42:09.103] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:09.103] getGlobalsAndPackages() ... [18:42:09.104] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:09.104] Resolving globals: FALSE [18:42:09.104] Tweak future expression to call with '...' arguments ... [18:42:09.104] { [18:42:09.104] do.call(function(...) { [18:42:09.104] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:09.104] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:09.104] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:09.104] on.exit(options(oopts), add = TRUE) [18:42:09.104] } [18:42:09.104] { [18:42:09.104] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:09.104] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:09.104] ...future.FUN(...future.X_jj, ...) [18:42:09.104] }) [18:42:09.104] } [18:42:09.104] }, args = future.call.arguments) [18:42:09.104] } [18:42:09.105] Tweak future expression to call with '...' arguments ... DONE [18:42:09.105] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:09.105] [18:42:09.105] getGlobalsAndPackages() ... DONE [18:42:09.106] run() for 'Future' ... [18:42:09.106] - state: 'created' [18:42:09.107] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:42:09.107] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:09.107] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:09.108] - Field: 'label' [18:42:09.108] - Field: 'local' [18:42:09.108] - Field: 'owner' [18:42:09.108] - Field: 'envir' [18:42:09.108] - Field: 'packages' [18:42:09.109] - Field: 'gc' [18:42:09.109] - Field: 'conditions' [18:42:09.109] - Field: 'expr' [18:42:09.109] - Field: 'uuid' [18:42:09.109] - Field: 'seed' [18:42:09.109] - Field: 'version' [18:42:09.110] - Field: 'result' [18:42:09.110] - Field: 'asynchronous' [18:42:09.110] - Field: 'calls' [18:42:09.110] - Field: 'globals' [18:42:09.110] - Field: 'stdout' [18:42:09.110] - Field: 'earlySignal' [18:42:09.111] - Field: 'lazy' [18:42:09.111] - Field: 'state' [18:42:09.111] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:09.111] - Launch lazy future ... [18:42:09.112] Packages needed by the future expression (n = 0): [18:42:09.112] Packages needed by future strategies (n = 0): [18:42:09.113] { [18:42:09.113] { [18:42:09.113] { [18:42:09.113] ...future.startTime <- base::Sys.time() [18:42:09.113] { [18:42:09.113] { [18:42:09.113] { [18:42:09.113] base::local({ [18:42:09.113] has_future <- base::requireNamespace("future", [18:42:09.113] quietly = TRUE) [18:42:09.113] if (has_future) { [18:42:09.113] ns <- base::getNamespace("future") [18:42:09.113] version <- ns[[".package"]][["version"]] [18:42:09.113] if (is.null(version)) [18:42:09.113] version <- utils::packageVersion("future") [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] version <- NULL [18:42:09.113] } [18:42:09.113] if (!has_future || version < "1.8.0") { [18:42:09.113] info <- base::c(r_version = base::gsub("R version ", [18:42:09.113] "", base::R.version$version.string), [18:42:09.113] platform = base::sprintf("%s (%s-bit)", [18:42:09.113] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:09.113] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:09.113] "release", "version")], collapse = " "), [18:42:09.113] hostname = base::Sys.info()[["nodename"]]) [18:42:09.113] info <- base::sprintf("%s: %s", base::names(info), [18:42:09.113] info) [18:42:09.113] info <- base::paste(info, collapse = "; ") [18:42:09.113] if (!has_future) { [18:42:09.113] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:09.113] info) [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:09.113] info, version) [18:42:09.113] } [18:42:09.113] base::stop(msg) [18:42:09.113] } [18:42:09.113] }) [18:42:09.113] } [18:42:09.113] ...future.strategy.old <- future::plan("list") [18:42:09.113] options(future.plan = NULL) [18:42:09.113] Sys.unsetenv("R_FUTURE_PLAN") [18:42:09.113] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:09.113] } [18:42:09.113] ...future.workdir <- getwd() [18:42:09.113] } [18:42:09.113] ...future.oldOptions <- base::as.list(base::.Options) [18:42:09.113] ...future.oldEnvVars <- base::Sys.getenv() [18:42:09.113] } [18:42:09.113] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:09.113] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:09.113] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:09.113] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:09.113] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:09.113] future.stdout.windows.reencode = NULL, width = 80L) [18:42:09.113] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:09.113] base::names(...future.oldOptions)) [18:42:09.113] } [18:42:09.113] if (FALSE) { [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] if (FALSE) { [18:42:09.113] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:09.113] open = "w") [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:09.113] windows = "NUL", "/dev/null"), open = "w") [18:42:09.113] } [18:42:09.113] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:09.113] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:09.113] base::sink(type = "output", split = FALSE) [18:42:09.113] base::close(...future.stdout) [18:42:09.113] }, add = TRUE) [18:42:09.113] } [18:42:09.113] ...future.frame <- base::sys.nframe() [18:42:09.113] ...future.conditions <- base::list() [18:42:09.113] ...future.rng <- base::globalenv()$.Random.seed [18:42:09.113] if (FALSE) { [18:42:09.113] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:09.113] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:09.113] } [18:42:09.113] ...future.result <- base::tryCatch({ [18:42:09.113] base::withCallingHandlers({ [18:42:09.113] ...future.value <- base::withVisible(base::local({ [18:42:09.113] do.call(function(...) { [18:42:09.113] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:09.113] if (!identical(...future.globals.maxSize.org, [18:42:09.113] ...future.globals.maxSize)) { [18:42:09.113] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:09.113] on.exit(options(oopts), add = TRUE) [18:42:09.113] } [18:42:09.113] { [18:42:09.113] lapply(seq_along(...future.elements_ii), [18:42:09.113] FUN = function(jj) { [18:42:09.113] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:09.113] ...future.FUN(...future.X_jj, ...) [18:42:09.113] }) [18:42:09.113] } [18:42:09.113] }, args = future.call.arguments) [18:42:09.113] })) [18:42:09.113] future::FutureResult(value = ...future.value$value, [18:42:09.113] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:09.113] ...future.rng), globalenv = if (FALSE) [18:42:09.113] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:09.113] ...future.globalenv.names)) [18:42:09.113] else NULL, started = ...future.startTime, version = "1.8") [18:42:09.113] }, condition = base::local({ [18:42:09.113] c <- base::c [18:42:09.113] inherits <- base::inherits [18:42:09.113] invokeRestart <- base::invokeRestart [18:42:09.113] length <- base::length [18:42:09.113] list <- base::list [18:42:09.113] seq.int <- base::seq.int [18:42:09.113] signalCondition <- base::signalCondition [18:42:09.113] sys.calls <- base::sys.calls [18:42:09.113] `[[` <- base::`[[` [18:42:09.113] `+` <- base::`+` [18:42:09.113] `<<-` <- base::`<<-` [18:42:09.113] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:09.113] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:09.113] 3L)] [18:42:09.113] } [18:42:09.113] function(cond) { [18:42:09.113] is_error <- inherits(cond, "error") [18:42:09.113] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:09.113] NULL) [18:42:09.113] if (is_error) { [18:42:09.113] sessionInformation <- function() { [18:42:09.113] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:09.113] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:09.113] search = base::search(), system = base::Sys.info()) [18:42:09.113] } [18:42:09.113] ...future.conditions[[length(...future.conditions) + [18:42:09.113] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:09.113] cond$call), session = sessionInformation(), [18:42:09.113] timestamp = base::Sys.time(), signaled = 0L) [18:42:09.113] signalCondition(cond) [18:42:09.113] } [18:42:09.113] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:09.113] "immediateCondition"))) { [18:42:09.113] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:09.113] ...future.conditions[[length(...future.conditions) + [18:42:09.113] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:09.113] if (TRUE && !signal) { [18:42:09.113] muffleCondition <- function (cond, pattern = "^muffle") [18:42:09.113] { [18:42:09.113] inherits <- base::inherits [18:42:09.113] invokeRestart <- base::invokeRestart [18:42:09.113] is.null <- base::is.null [18:42:09.113] muffled <- FALSE [18:42:09.113] if (inherits(cond, "message")) { [18:42:09.113] muffled <- grepl(pattern, "muffleMessage") [18:42:09.113] if (muffled) [18:42:09.113] invokeRestart("muffleMessage") [18:42:09.113] } [18:42:09.113] else if (inherits(cond, "warning")) { [18:42:09.113] muffled <- grepl(pattern, "muffleWarning") [18:42:09.113] if (muffled) [18:42:09.113] invokeRestart("muffleWarning") [18:42:09.113] } [18:42:09.113] else if (inherits(cond, "condition")) { [18:42:09.113] if (!is.null(pattern)) { [18:42:09.113] computeRestarts <- base::computeRestarts [18:42:09.113] grepl <- base::grepl [18:42:09.113] restarts <- computeRestarts(cond) [18:42:09.113] for (restart in restarts) { [18:42:09.113] name <- restart$name [18:42:09.113] if (is.null(name)) [18:42:09.113] next [18:42:09.113] if (!grepl(pattern, name)) [18:42:09.113] next [18:42:09.113] invokeRestart(restart) [18:42:09.113] muffled <- TRUE [18:42:09.113] break [18:42:09.113] } [18:42:09.113] } [18:42:09.113] } [18:42:09.113] invisible(muffled) [18:42:09.113] } [18:42:09.113] muffleCondition(cond, pattern = "^muffle") [18:42:09.113] } [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] if (TRUE) { [18:42:09.113] muffleCondition <- function (cond, pattern = "^muffle") [18:42:09.113] { [18:42:09.113] inherits <- base::inherits [18:42:09.113] invokeRestart <- base::invokeRestart [18:42:09.113] is.null <- base::is.null [18:42:09.113] muffled <- FALSE [18:42:09.113] if (inherits(cond, "message")) { [18:42:09.113] muffled <- grepl(pattern, "muffleMessage") [18:42:09.113] if (muffled) [18:42:09.113] invokeRestart("muffleMessage") [18:42:09.113] } [18:42:09.113] else if (inherits(cond, "warning")) { [18:42:09.113] muffled <- grepl(pattern, "muffleWarning") [18:42:09.113] if (muffled) [18:42:09.113] invokeRestart("muffleWarning") [18:42:09.113] } [18:42:09.113] else if (inherits(cond, "condition")) { [18:42:09.113] if (!is.null(pattern)) { [18:42:09.113] computeRestarts <- base::computeRestarts [18:42:09.113] grepl <- base::grepl [18:42:09.113] restarts <- computeRestarts(cond) [18:42:09.113] for (restart in restarts) { [18:42:09.113] name <- restart$name [18:42:09.113] if (is.null(name)) [18:42:09.113] next [18:42:09.113] if (!grepl(pattern, name)) [18:42:09.113] next [18:42:09.113] invokeRestart(restart) [18:42:09.113] muffled <- TRUE [18:42:09.113] break [18:42:09.113] } [18:42:09.113] } [18:42:09.113] } [18:42:09.113] invisible(muffled) [18:42:09.113] } [18:42:09.113] muffleCondition(cond, pattern = "^muffle") [18:42:09.113] } [18:42:09.113] } [18:42:09.113] } [18:42:09.113] })) [18:42:09.113] }, error = function(ex) { [18:42:09.113] base::structure(base::list(value = NULL, visible = NULL, [18:42:09.113] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:09.113] ...future.rng), started = ...future.startTime, [18:42:09.113] finished = Sys.time(), session_uuid = NA_character_, [18:42:09.113] version = "1.8"), class = "FutureResult") [18:42:09.113] }, finally = { [18:42:09.113] if (!identical(...future.workdir, getwd())) [18:42:09.113] setwd(...future.workdir) [18:42:09.113] { [18:42:09.113] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:09.113] ...future.oldOptions$nwarnings <- NULL [18:42:09.113] } [18:42:09.113] base::options(...future.oldOptions) [18:42:09.113] if (.Platform$OS.type == "windows") { [18:42:09.113] old_names <- names(...future.oldEnvVars) [18:42:09.113] envs <- base::Sys.getenv() [18:42:09.113] names <- names(envs) [18:42:09.113] common <- intersect(names, old_names) [18:42:09.113] added <- setdiff(names, old_names) [18:42:09.113] removed <- setdiff(old_names, names) [18:42:09.113] changed <- common[...future.oldEnvVars[common] != [18:42:09.113] envs[common]] [18:42:09.113] NAMES <- toupper(changed) [18:42:09.113] args <- list() [18:42:09.113] for (kk in seq_along(NAMES)) { [18:42:09.113] name <- changed[[kk]] [18:42:09.113] NAME <- NAMES[[kk]] [18:42:09.113] if (name != NAME && is.element(NAME, old_names)) [18:42:09.113] next [18:42:09.113] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:09.113] } [18:42:09.113] NAMES <- toupper(added) [18:42:09.113] for (kk in seq_along(NAMES)) { [18:42:09.113] name <- added[[kk]] [18:42:09.113] NAME <- NAMES[[kk]] [18:42:09.113] if (name != NAME && is.element(NAME, old_names)) [18:42:09.113] next [18:42:09.113] args[[name]] <- "" [18:42:09.113] } [18:42:09.113] NAMES <- toupper(removed) [18:42:09.113] for (kk in seq_along(NAMES)) { [18:42:09.113] name <- removed[[kk]] [18:42:09.113] NAME <- NAMES[[kk]] [18:42:09.113] if (name != NAME && is.element(NAME, old_names)) [18:42:09.113] next [18:42:09.113] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:09.113] } [18:42:09.113] if (length(args) > 0) [18:42:09.113] base::do.call(base::Sys.setenv, args = args) [18:42:09.113] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:09.113] } [18:42:09.113] { [18:42:09.113] if (base::length(...future.futureOptionsAdded) > [18:42:09.113] 0L) { [18:42:09.113] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:09.113] base::names(opts) <- ...future.futureOptionsAdded [18:42:09.113] base::options(opts) [18:42:09.113] } [18:42:09.113] { [18:42:09.113] { [18:42:09.113] NULL [18:42:09.113] RNGkind("Mersenne-Twister") [18:42:09.113] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:09.113] inherits = FALSE) [18:42:09.113] } [18:42:09.113] options(future.plan = NULL) [18:42:09.113] if (is.na(NA_character_)) [18:42:09.113] Sys.unsetenv("R_FUTURE_PLAN") [18:42:09.113] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:09.113] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:09.113] .init = FALSE) [18:42:09.113] } [18:42:09.113] } [18:42:09.113] } [18:42:09.113] }) [18:42:09.113] if (TRUE) { [18:42:09.113] base::sink(type = "output", split = FALSE) [18:42:09.113] if (FALSE) { [18:42:09.113] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:09.113] } [18:42:09.113] else { [18:42:09.113] ...future.result["stdout"] <- base::list(NULL) [18:42:09.113] } [18:42:09.113] base::close(...future.stdout) [18:42:09.113] ...future.stdout <- NULL [18:42:09.113] } [18:42:09.113] ...future.result$conditions <- ...future.conditions [18:42:09.113] ...future.result$finished <- base::Sys.time() [18:42:09.113] ...future.result [18:42:09.113] } [18:42:09.117] assign_globals() ... [18:42:09.118] List of 5 [18:42:09.118] $ ...future.FUN :function (x) [18:42:09.118] $ future.call.arguments : list() [18:42:09.118] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:09.118] $ ...future.elements_ii :List of 2 [18:42:09.118] ..$ : int 1 [18:42:09.118] ..$ : int 0 [18:42:09.118] $ ...future.seeds_ii : NULL [18:42:09.118] $ ...future.globals.maxSize: NULL [18:42:09.118] - attr(*, "where")=List of 5 [18:42:09.118] ..$ ...future.FUN : [18:42:09.118] ..$ future.call.arguments : [18:42:09.118] ..$ ...future.elements_ii : [18:42:09.118] ..$ ...future.seeds_ii : [18:42:09.118] ..$ ...future.globals.maxSize: [18:42:09.118] - attr(*, "resolved")= logi FALSE [18:42:09.118] - attr(*, "total_size")= num 5632 [18:42:09.118] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:09.118] - attr(*, "already-done")= logi TRUE [18:42:09.125] - reassign environment for '...future.FUN' [18:42:09.125] - copied '...future.FUN' to environment [18:42:09.126] - copied 'future.call.arguments' to environment [18:42:09.126] - copied '...future.elements_ii' to environment [18:42:09.126] - copied '...future.seeds_ii' to environment [18:42:09.126] - copied '...future.globals.maxSize' to environment [18:42:09.126] assign_globals() ... done [18:42:09.127] plan(): Setting new future strategy stack: [18:42:09.127] List of future strategies: [18:42:09.127] 1. sequential: [18:42:09.127] - args: function (..., envir = parent.frame(), workers = "") [18:42:09.127] - tweaked: FALSE [18:42:09.127] - call: NULL [18:42:09.128] plan(): nbrOfWorkers() = 1 [18:42:09.635] plan(): Setting new future strategy stack: [18:42:09.635] List of future strategies: [18:42:09.635] 1. sequential: [18:42:09.635] - args: function (..., envir = parent.frame(), workers = "") [18:42:09.635] - tweaked: FALSE [18:42:09.635] - call: plan(strategy) [18:42:09.636] plan(): nbrOfWorkers() = 1 [18:42:09.637] SequentialFuture started (and completed) [18:42:09.638] - Launch lazy future ... done [18:42:09.638] run() for 'SequentialFuture' ... done [18:42:09.638] Created future: [18:42:09.639] SequentialFuture: [18:42:09.639] Label: 'future_lapply-1' [18:42:09.639] Expression: [18:42:09.639] { [18:42:09.639] do.call(function(...) { [18:42:09.639] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:09.639] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:09.639] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:09.639] on.exit(options(oopts), add = TRUE) [18:42:09.639] } [18:42:09.639] { [18:42:09.639] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:09.639] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:09.639] ...future.FUN(...future.X_jj, ...) [18:42:09.639] }) [18:42:09.639] } [18:42:09.639] }, args = future.call.arguments) [18:42:09.639] } [18:42:09.639] Lazy evaluation: FALSE [18:42:09.639] Asynchronous evaluation: FALSE [18:42:09.639] Local evaluation: TRUE [18:42:09.639] Environment: R_GlobalEnv [18:42:09.639] Capture standard output: FALSE [18:42:09.639] Capture condition classes: 'condition' (excluding 'nothing') [18:42:09.639] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:09.639] Packages: [18:42:09.639] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:09.639] Resolved: TRUE [18:42:09.639] Value: 55 bytes of class 'list' [18:42:09.639] Early signaling: FALSE [18:42:09.639] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:09.639] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:09.642] Chunk #1 of 1 ... DONE [18:42:09.642] Launching 1 futures (chunks) ... DONE [18:42:09.642] Resolving 1 futures (chunks) ... [18:42:09.643] resolve() on list ... [18:42:09.643] recursive: 0 [18:42:09.643] length: 1 [18:42:09.643] [18:42:09.644] resolved() for 'SequentialFuture' ... [18:42:09.644] - state: 'finished' [18:42:09.644] - run: TRUE [18:42:09.644] - result: 'FutureResult' [18:42:09.645] resolved() for 'SequentialFuture' ... done [18:42:09.645] Future #1 [18:42:09.646] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:09.646] - nx: 1 [18:42:09.646] - relay: TRUE [18:42:09.647] - stdout: TRUE [18:42:09.647] - signal: TRUE [18:42:09.647] - resignal: FALSE [18:42:09.647] - force: TRUE [18:42:09.647] - relayed: [n=1] FALSE [18:42:09.648] - queued futures: [n=1] FALSE [18:42:09.648] - until=1 [18:42:09.648] - relaying element #1 [18:42:09.649] - relayed: [n=1] TRUE [18:42:09.649] - queued futures: [n=1] TRUE [18:42:09.649] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:09.650] length: 0 (resolved future 1) [18:42:09.650] Relaying remaining futures [18:42:09.650] signalConditionsASAP(NULL, pos=0) ... [18:42:09.650] - nx: 1 [18:42:09.650] - relay: TRUE [18:42:09.651] - stdout: TRUE [18:42:09.651] - signal: TRUE [18:42:09.651] - resignal: FALSE [18:42:09.651] - force: TRUE [18:42:09.652] - relayed: [n=1] TRUE [18:42:09.652] - queued futures: [n=1] TRUE - flush all [18:42:09.652] - relayed: [n=1] TRUE [18:42:09.652] - queued futures: [n=1] TRUE [18:42:09.653] signalConditionsASAP(NULL, pos=0) ... done [18:42:09.653] resolve() on list ... DONE [18:42:09.653] - Number of value chunks collected: 1 [18:42:09.654] Resolving 1 futures (chunks) ... DONE [18:42:09.654] Reducing values from 1 chunks ... [18:42:09.654] - Number of values collected after concatenation: 2 [18:42:09.654] - Number of values expected: 2 [18:42:09.655] Reducing values from 1 chunks ... DONE [18:42:09.655] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = FALSE) ... DONE * future_lapply(x, ..., future.stdout = TRUE) ... [18:42:09.656] future_lapply() ... [18:42:09.657] Number of chunks: 1 [18:42:09.658] getGlobalsAndPackagesXApply() ... [18:42:09.658] - future.globals: TRUE [18:42:09.658] getGlobalsAndPackages() ... [18:42:09.658] Searching for globals... [18:42:09.662] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:09.662] Searching for globals ... DONE [18:42:09.662] Resolving globals: FALSE [18:42:09.663] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:09.664] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:09.664] - globals: [1] 'FUN' [18:42:09.665] [18:42:09.665] getGlobalsAndPackages() ... DONE [18:42:09.665] - globals found/used: [n=1] 'FUN' [18:42:09.665] - needed namespaces: [n=0] [18:42:09.666] Finding globals ... DONE [18:42:09.666] - use_args: TRUE [18:42:09.666] - Getting '...' globals ... [18:42:09.667] resolve() on list ... [18:42:09.667] recursive: 0 [18:42:09.667] length: 1 [18:42:09.668] elements: '...' [18:42:09.668] length: 0 (resolved future 1) [18:42:09.668] resolve() on list ... DONE [18:42:09.669] - '...' content: [n=0] [18:42:09.669] List of 1 [18:42:09.669] $ ...: list() [18:42:09.669] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:09.669] - attr(*, "where")=List of 1 [18:42:09.669] ..$ ...: [18:42:09.669] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:09.669] - attr(*, "resolved")= logi TRUE [18:42:09.669] - attr(*, "total_size")= num NA [18:42:09.679] - Getting '...' globals ... DONE [18:42:09.679] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:09.679] List of 2 [18:42:09.679] $ ...future.FUN:function (x) [18:42:09.679] $ ... : list() [18:42:09.679] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:09.679] - attr(*, "where")=List of 2 [18:42:09.679] ..$ ...future.FUN: [18:42:09.679] ..$ ... : [18:42:09.679] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:09.679] - attr(*, "resolved")= logi FALSE [18:42:09.679] - attr(*, "total_size")= int 5632 [18:42:09.685] Packages to be attached in all futures: [n=0] [18:42:09.685] getGlobalsAndPackagesXApply() ... DONE [18:42:09.685] Number of futures (= number of chunks): 1 [18:42:09.685] Launching 1 futures (chunks) ... [18:42:09.686] Chunk #1 of 1 ... [18:42:09.686] - Finding globals in 'X' for chunk #1 ... [18:42:09.686] getGlobalsAndPackages() ... [18:42:09.686] Searching for globals... [18:42:09.687] [18:42:09.687] Searching for globals ... DONE [18:42:09.687] - globals: [0] [18:42:09.687] getGlobalsAndPackages() ... DONE [18:42:09.688] + additional globals found: [n=0] [18:42:09.688] + additional namespaces needed: [n=0] [18:42:09.688] - Finding globals in 'X' for chunk #1 ... DONE [18:42:09.688] - seeds: [18:42:09.689] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:09.689] getGlobalsAndPackages() ... [18:42:09.689] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:09.689] Resolving globals: FALSE [18:42:09.689] Tweak future expression to call with '...' arguments ... [18:42:09.690] { [18:42:09.690] do.call(function(...) { [18:42:09.690] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:09.690] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:09.690] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:09.690] on.exit(options(oopts), add = TRUE) [18:42:09.690] } [18:42:09.690] { [18:42:09.690] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:09.690] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:09.690] ...future.FUN(...future.X_jj, ...) [18:42:09.690] }) [18:42:09.690] } [18:42:09.690] }, args = future.call.arguments) [18:42:09.690] } [18:42:09.690] Tweak future expression to call with '...' arguments ... DONE [18:42:09.691] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:09.691] [18:42:09.691] getGlobalsAndPackages() ... DONE [18:42:09.692] run() for 'Future' ... [18:42:09.692] - state: 'created' [18:42:09.693] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:42:09.693] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:09.694] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:09.694] - Field: 'label' [18:42:09.694] - Field: 'local' [18:42:09.694] - Field: 'owner' [18:42:09.695] - Field: 'envir' [18:42:09.695] - Field: 'packages' [18:42:09.695] - Field: 'gc' [18:42:09.696] - Field: 'conditions' [18:42:09.696] - Field: 'expr' [18:42:09.696] - Field: 'uuid' [18:42:09.696] - Field: 'seed' [18:42:09.696] - Field: 'version' [18:42:09.697] - Field: 'result' [18:42:09.697] - Field: 'asynchronous' [18:42:09.697] - Field: 'calls' [18:42:09.697] - Field: 'globals' [18:42:09.698] - Field: 'stdout' [18:42:09.698] - Field: 'earlySignal' [18:42:09.698] - Field: 'lazy' [18:42:09.698] - Field: 'state' [18:42:09.699] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:09.699] - Launch lazy future ... [18:42:09.699] Packages needed by the future expression (n = 0): [18:42:09.699] Packages needed by future strategies (n = 0): [18:42:09.700] { [18:42:09.700] { [18:42:09.700] { [18:42:09.700] ...future.startTime <- base::Sys.time() [18:42:09.700] { [18:42:09.700] { [18:42:09.700] { [18:42:09.700] base::local({ [18:42:09.700] has_future <- base::requireNamespace("future", [18:42:09.700] quietly = TRUE) [18:42:09.700] if (has_future) { [18:42:09.700] ns <- base::getNamespace("future") [18:42:09.700] version <- ns[[".package"]][["version"]] [18:42:09.700] if (is.null(version)) [18:42:09.700] version <- utils::packageVersion("future") [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] version <- NULL [18:42:09.700] } [18:42:09.700] if (!has_future || version < "1.8.0") { [18:42:09.700] info <- base::c(r_version = base::gsub("R version ", [18:42:09.700] "", base::R.version$version.string), [18:42:09.700] platform = base::sprintf("%s (%s-bit)", [18:42:09.700] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:09.700] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:09.700] "release", "version")], collapse = " "), [18:42:09.700] hostname = base::Sys.info()[["nodename"]]) [18:42:09.700] info <- base::sprintf("%s: %s", base::names(info), [18:42:09.700] info) [18:42:09.700] info <- base::paste(info, collapse = "; ") [18:42:09.700] if (!has_future) { [18:42:09.700] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:09.700] info) [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:09.700] info, version) [18:42:09.700] } [18:42:09.700] base::stop(msg) [18:42:09.700] } [18:42:09.700] }) [18:42:09.700] } [18:42:09.700] ...future.strategy.old <- future::plan("list") [18:42:09.700] options(future.plan = NULL) [18:42:09.700] Sys.unsetenv("R_FUTURE_PLAN") [18:42:09.700] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:09.700] } [18:42:09.700] ...future.workdir <- getwd() [18:42:09.700] } [18:42:09.700] ...future.oldOptions <- base::as.list(base::.Options) [18:42:09.700] ...future.oldEnvVars <- base::Sys.getenv() [18:42:09.700] } [18:42:09.700] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:09.700] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:09.700] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:09.700] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:09.700] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:09.700] future.stdout.windows.reencode = NULL, width = 80L) [18:42:09.700] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:09.700] base::names(...future.oldOptions)) [18:42:09.700] } [18:42:09.700] if (FALSE) { [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] if (TRUE) { [18:42:09.700] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:09.700] open = "w") [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:09.700] windows = "NUL", "/dev/null"), open = "w") [18:42:09.700] } [18:42:09.700] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:09.700] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:09.700] base::sink(type = "output", split = FALSE) [18:42:09.700] base::close(...future.stdout) [18:42:09.700] }, add = TRUE) [18:42:09.700] } [18:42:09.700] ...future.frame <- base::sys.nframe() [18:42:09.700] ...future.conditions <- base::list() [18:42:09.700] ...future.rng <- base::globalenv()$.Random.seed [18:42:09.700] if (FALSE) { [18:42:09.700] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:09.700] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:09.700] } [18:42:09.700] ...future.result <- base::tryCatch({ [18:42:09.700] base::withCallingHandlers({ [18:42:09.700] ...future.value <- base::withVisible(base::local({ [18:42:09.700] do.call(function(...) { [18:42:09.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:09.700] if (!identical(...future.globals.maxSize.org, [18:42:09.700] ...future.globals.maxSize)) { [18:42:09.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:09.700] on.exit(options(oopts), add = TRUE) [18:42:09.700] } [18:42:09.700] { [18:42:09.700] lapply(seq_along(...future.elements_ii), [18:42:09.700] FUN = function(jj) { [18:42:09.700] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:09.700] ...future.FUN(...future.X_jj, ...) [18:42:09.700] }) [18:42:09.700] } [18:42:09.700] }, args = future.call.arguments) [18:42:09.700] })) [18:42:09.700] future::FutureResult(value = ...future.value$value, [18:42:09.700] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:09.700] ...future.rng), globalenv = if (FALSE) [18:42:09.700] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:09.700] ...future.globalenv.names)) [18:42:09.700] else NULL, started = ...future.startTime, version = "1.8") [18:42:09.700] }, condition = base::local({ [18:42:09.700] c <- base::c [18:42:09.700] inherits <- base::inherits [18:42:09.700] invokeRestart <- base::invokeRestart [18:42:09.700] length <- base::length [18:42:09.700] list <- base::list [18:42:09.700] seq.int <- base::seq.int [18:42:09.700] signalCondition <- base::signalCondition [18:42:09.700] sys.calls <- base::sys.calls [18:42:09.700] `[[` <- base::`[[` [18:42:09.700] `+` <- base::`+` [18:42:09.700] `<<-` <- base::`<<-` [18:42:09.700] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:09.700] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:09.700] 3L)] [18:42:09.700] } [18:42:09.700] function(cond) { [18:42:09.700] is_error <- inherits(cond, "error") [18:42:09.700] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:09.700] NULL) [18:42:09.700] if (is_error) { [18:42:09.700] sessionInformation <- function() { [18:42:09.700] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:09.700] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:09.700] search = base::search(), system = base::Sys.info()) [18:42:09.700] } [18:42:09.700] ...future.conditions[[length(...future.conditions) + [18:42:09.700] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:09.700] cond$call), session = sessionInformation(), [18:42:09.700] timestamp = base::Sys.time(), signaled = 0L) [18:42:09.700] signalCondition(cond) [18:42:09.700] } [18:42:09.700] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:09.700] "immediateCondition"))) { [18:42:09.700] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:09.700] ...future.conditions[[length(...future.conditions) + [18:42:09.700] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:09.700] if (TRUE && !signal) { [18:42:09.700] muffleCondition <- function (cond, pattern = "^muffle") [18:42:09.700] { [18:42:09.700] inherits <- base::inherits [18:42:09.700] invokeRestart <- base::invokeRestart [18:42:09.700] is.null <- base::is.null [18:42:09.700] muffled <- FALSE [18:42:09.700] if (inherits(cond, "message")) { [18:42:09.700] muffled <- grepl(pattern, "muffleMessage") [18:42:09.700] if (muffled) [18:42:09.700] invokeRestart("muffleMessage") [18:42:09.700] } [18:42:09.700] else if (inherits(cond, "warning")) { [18:42:09.700] muffled <- grepl(pattern, "muffleWarning") [18:42:09.700] if (muffled) [18:42:09.700] invokeRestart("muffleWarning") [18:42:09.700] } [18:42:09.700] else if (inherits(cond, "condition")) { [18:42:09.700] if (!is.null(pattern)) { [18:42:09.700] computeRestarts <- base::computeRestarts [18:42:09.700] grepl <- base::grepl [18:42:09.700] restarts <- computeRestarts(cond) [18:42:09.700] for (restart in restarts) { [18:42:09.700] name <- restart$name [18:42:09.700] if (is.null(name)) [18:42:09.700] next [18:42:09.700] if (!grepl(pattern, name)) [18:42:09.700] next [18:42:09.700] invokeRestart(restart) [18:42:09.700] muffled <- TRUE [18:42:09.700] break [18:42:09.700] } [18:42:09.700] } [18:42:09.700] } [18:42:09.700] invisible(muffled) [18:42:09.700] } [18:42:09.700] muffleCondition(cond, pattern = "^muffle") [18:42:09.700] } [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] if (TRUE) { [18:42:09.700] muffleCondition <- function (cond, pattern = "^muffle") [18:42:09.700] { [18:42:09.700] inherits <- base::inherits [18:42:09.700] invokeRestart <- base::invokeRestart [18:42:09.700] is.null <- base::is.null [18:42:09.700] muffled <- FALSE [18:42:09.700] if (inherits(cond, "message")) { [18:42:09.700] muffled <- grepl(pattern, "muffleMessage") [18:42:09.700] if (muffled) [18:42:09.700] invokeRestart("muffleMessage") [18:42:09.700] } [18:42:09.700] else if (inherits(cond, "warning")) { [18:42:09.700] muffled <- grepl(pattern, "muffleWarning") [18:42:09.700] if (muffled) [18:42:09.700] invokeRestart("muffleWarning") [18:42:09.700] } [18:42:09.700] else if (inherits(cond, "condition")) { [18:42:09.700] if (!is.null(pattern)) { [18:42:09.700] computeRestarts <- base::computeRestarts [18:42:09.700] grepl <- base::grepl [18:42:09.700] restarts <- computeRestarts(cond) [18:42:09.700] for (restart in restarts) { [18:42:09.700] name <- restart$name [18:42:09.700] if (is.null(name)) [18:42:09.700] next [18:42:09.700] if (!grepl(pattern, name)) [18:42:09.700] next [18:42:09.700] invokeRestart(restart) [18:42:09.700] muffled <- TRUE [18:42:09.700] break [18:42:09.700] } [18:42:09.700] } [18:42:09.700] } [18:42:09.700] invisible(muffled) [18:42:09.700] } [18:42:09.700] muffleCondition(cond, pattern = "^muffle") [18:42:09.700] } [18:42:09.700] } [18:42:09.700] } [18:42:09.700] })) [18:42:09.700] }, error = function(ex) { [18:42:09.700] base::structure(base::list(value = NULL, visible = NULL, [18:42:09.700] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:09.700] ...future.rng), started = ...future.startTime, [18:42:09.700] finished = Sys.time(), session_uuid = NA_character_, [18:42:09.700] version = "1.8"), class = "FutureResult") [18:42:09.700] }, finally = { [18:42:09.700] if (!identical(...future.workdir, getwd())) [18:42:09.700] setwd(...future.workdir) [18:42:09.700] { [18:42:09.700] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:09.700] ...future.oldOptions$nwarnings <- NULL [18:42:09.700] } [18:42:09.700] base::options(...future.oldOptions) [18:42:09.700] if (.Platform$OS.type == "windows") { [18:42:09.700] old_names <- names(...future.oldEnvVars) [18:42:09.700] envs <- base::Sys.getenv() [18:42:09.700] names <- names(envs) [18:42:09.700] common <- intersect(names, old_names) [18:42:09.700] added <- setdiff(names, old_names) [18:42:09.700] removed <- setdiff(old_names, names) [18:42:09.700] changed <- common[...future.oldEnvVars[common] != [18:42:09.700] envs[common]] [18:42:09.700] NAMES <- toupper(changed) [18:42:09.700] args <- list() [18:42:09.700] for (kk in seq_along(NAMES)) { [18:42:09.700] name <- changed[[kk]] [18:42:09.700] NAME <- NAMES[[kk]] [18:42:09.700] if (name != NAME && is.element(NAME, old_names)) [18:42:09.700] next [18:42:09.700] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:09.700] } [18:42:09.700] NAMES <- toupper(added) [18:42:09.700] for (kk in seq_along(NAMES)) { [18:42:09.700] name <- added[[kk]] [18:42:09.700] NAME <- NAMES[[kk]] [18:42:09.700] if (name != NAME && is.element(NAME, old_names)) [18:42:09.700] next [18:42:09.700] args[[name]] <- "" [18:42:09.700] } [18:42:09.700] NAMES <- toupper(removed) [18:42:09.700] for (kk in seq_along(NAMES)) { [18:42:09.700] name <- removed[[kk]] [18:42:09.700] NAME <- NAMES[[kk]] [18:42:09.700] if (name != NAME && is.element(NAME, old_names)) [18:42:09.700] next [18:42:09.700] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:09.700] } [18:42:09.700] if (length(args) > 0) [18:42:09.700] base::do.call(base::Sys.setenv, args = args) [18:42:09.700] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:09.700] } [18:42:09.700] { [18:42:09.700] if (base::length(...future.futureOptionsAdded) > [18:42:09.700] 0L) { [18:42:09.700] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:09.700] base::names(opts) <- ...future.futureOptionsAdded [18:42:09.700] base::options(opts) [18:42:09.700] } [18:42:09.700] { [18:42:09.700] { [18:42:09.700] NULL [18:42:09.700] RNGkind("Mersenne-Twister") [18:42:09.700] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:09.700] inherits = FALSE) [18:42:09.700] } [18:42:09.700] options(future.plan = NULL) [18:42:09.700] if (is.na(NA_character_)) [18:42:09.700] Sys.unsetenv("R_FUTURE_PLAN") [18:42:09.700] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:09.700] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:09.700] .init = FALSE) [18:42:09.700] } [18:42:09.700] } [18:42:09.700] } [18:42:09.700] }) [18:42:09.700] if (TRUE) { [18:42:09.700] base::sink(type = "output", split = FALSE) [18:42:09.700] if (TRUE) { [18:42:09.700] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:09.700] } [18:42:09.700] else { [18:42:09.700] ...future.result["stdout"] <- base::list(NULL) [18:42:09.700] } [18:42:09.700] base::close(...future.stdout) [18:42:09.700] ...future.stdout <- NULL [18:42:09.700] } [18:42:09.700] ...future.result$conditions <- ...future.conditions [18:42:09.700] ...future.result$finished <- base::Sys.time() [18:42:09.700] ...future.result [18:42:09.700] } [18:42:09.705] assign_globals() ... [18:42:09.705] List of 5 [18:42:09.705] $ ...future.FUN :function (x) [18:42:09.705] $ future.call.arguments : list() [18:42:09.705] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:09.705] $ ...future.elements_ii :List of 2 [18:42:09.705] ..$ : int 1 [18:42:09.705] ..$ : int 0 [18:42:09.705] $ ...future.seeds_ii : NULL [18:42:09.705] $ ...future.globals.maxSize: NULL [18:42:09.705] - attr(*, "where")=List of 5 [18:42:09.705] ..$ ...future.FUN : [18:42:09.705] ..$ future.call.arguments : [18:42:09.705] ..$ ...future.elements_ii : [18:42:09.705] ..$ ...future.seeds_ii : [18:42:09.705] ..$ ...future.globals.maxSize: [18:42:09.705] - attr(*, "resolved")= logi FALSE [18:42:09.705] - attr(*, "total_size")= num 5632 [18:42:09.705] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:09.705] - attr(*, "already-done")= logi TRUE [18:42:09.716] - reassign environment for '...future.FUN' [18:42:09.717] - copied '...future.FUN' to environment [18:42:09.717] - copied 'future.call.arguments' to environment [18:42:09.717] - copied '...future.elements_ii' to environment [18:42:09.717] - copied '...future.seeds_ii' to environment [18:42:09.718] - copied '...future.globals.maxSize' to environment [18:42:09.718] assign_globals() ... done [18:42:09.718] plan(): Setting new future strategy stack: [18:42:09.718] List of future strategies: [18:42:09.718] 1. sequential: [18:42:09.718] - args: function (..., envir = parent.frame(), workers = "") [18:42:09.718] - tweaked: FALSE [18:42:09.718] - call: NULL [18:42:09.719] plan(): nbrOfWorkers() = 1 [18:42:10.226] plan(): Setting new future strategy stack: [18:42:10.226] List of future strategies: [18:42:10.226] 1. sequential: [18:42:10.226] - args: function (..., envir = parent.frame(), workers = "") [18:42:10.226] - tweaked: FALSE [18:42:10.226] - call: plan(strategy) [18:42:10.227] plan(): nbrOfWorkers() = 1 [18:42:10.227] SequentialFuture started (and completed) [18:42:10.227] - Launch lazy future ... done [18:42:10.227] run() for 'SequentialFuture' ... done [18:42:10.228] Created future: [18:42:10.228] SequentialFuture: [18:42:10.228] Label: 'future_lapply-1' [18:42:10.228] Expression: [18:42:10.228] { [18:42:10.228] do.call(function(...) { [18:42:10.228] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:10.228] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:10.228] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:10.228] on.exit(options(oopts), add = TRUE) [18:42:10.228] } [18:42:10.228] { [18:42:10.228] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:10.228] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:10.228] ...future.FUN(...future.X_jj, ...) [18:42:10.228] }) [18:42:10.228] } [18:42:10.228] }, args = future.call.arguments) [18:42:10.228] } [18:42:10.228] Lazy evaluation: FALSE [18:42:10.228] Asynchronous evaluation: FALSE [18:42:10.228] Local evaluation: TRUE [18:42:10.228] Environment: R_GlobalEnv [18:42:10.228] Capture standard output: TRUE [18:42:10.228] Capture condition classes: 'condition' (excluding 'nothing') [18:42:10.228] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:10.228] Packages: [18:42:10.228] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:10.228] Resolved: TRUE [18:42:10.228] Value: 55 bytes of class 'list' [18:42:10.228] Early signaling: FALSE [18:42:10.228] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:10.228] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:10.229] Chunk #1 of 1 ... DONE [18:42:10.230] Launching 1 futures (chunks) ... DONE [18:42:10.230] Resolving 1 futures (chunks) ... [18:42:10.230] resolve() on list ... [18:42:10.230] recursive: 0 [18:42:10.230] length: 1 [18:42:10.231] [18:42:10.231] resolved() for 'SequentialFuture' ... [18:42:10.231] - state: 'finished' [18:42:10.231] - run: TRUE [18:42:10.231] - result: 'FutureResult' [18:42:10.232] resolved() for 'SequentialFuture' ... done [18:42:10.232] Future #1 [18:42:10.232] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:10.232] - nx: 1 [18:42:10.232] - relay: TRUE [18:42:10.233] - stdout: TRUE [18:42:10.233] - signal: TRUE [18:42:10.233] - resignal: FALSE [18:42:10.233] - force: TRUE [18:42:10.233] - relayed: [n=1] FALSE [18:42:10.233] - queued futures: [n=1] FALSE [18:42:10.234] - until=1 [18:42:10.234] - relaying element #1 [18:42:10.234] - relayed: [n=1] TRUE [18:42:10.234] - queued futures: [n=1] TRUE [18:42:10.234] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:10.235] length: 0 (resolved future 1) [18:42:10.235] Relaying remaining futures [18:42:10.235] signalConditionsASAP(NULL, pos=0) ... [18:42:10.235] - nx: 1 [18:42:10.235] - relay: TRUE [18:42:10.236] - stdout: TRUE [18:42:10.236] - signal: TRUE [18:42:10.236] - resignal: FALSE [18:42:10.236] - force: TRUE [18:42:10.236] - relayed: [n=1] TRUE [18:42:10.236] - queued futures: [n=1] TRUE - flush all [18:42:10.237] - relayed: [n=1] TRUE [18:42:10.237] - queued futures: [n=1] TRUE [18:42:10.237] signalConditionsASAP(NULL, pos=0) ... done [18:42:10.237] resolve() on list ... DONE [18:42:10.237] - Number of value chunks collected: 1 [18:42:10.238] Resolving 1 futures (chunks) ... DONE [18:42:10.238] Reducing values from 1 chunks ... [18:42:10.238] - Number of values collected after concatenation: 2 [18:42:10.238] - Number of values expected: 2 [18:42:10.238] Reducing values from 1 chunks ... DONE [18:42:10.238] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = TRUE) ... DONE * future_lapply(x, ..., future.stdout = NA) ... [18:42:10.239] future_lapply() ... [18:42:10.240] Number of chunks: 1 [18:42:10.240] getGlobalsAndPackagesXApply() ... [18:42:10.241] - future.globals: TRUE [18:42:10.241] getGlobalsAndPackages() ... [18:42:10.241] Searching for globals... [18:42:10.243] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:10.244] Searching for globals ... DONE [18:42:10.244] Resolving globals: FALSE [18:42:10.244] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:10.245] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:10.245] - globals: [1] 'FUN' [18:42:10.245] [18:42:10.246] getGlobalsAndPackages() ... DONE [18:42:10.246] - globals found/used: [n=1] 'FUN' [18:42:10.246] - needed namespaces: [n=0] [18:42:10.246] Finding globals ... DONE [18:42:10.246] - use_args: TRUE [18:42:10.246] - Getting '...' globals ... [18:42:10.247] resolve() on list ... [18:42:10.247] recursive: 0 [18:42:10.247] length: 1 [18:42:10.248] elements: '...' [18:42:10.248] length: 0 (resolved future 1) [18:42:10.248] resolve() on list ... DONE [18:42:10.248] - '...' content: [n=0] [18:42:10.248] List of 1 [18:42:10.248] $ ...: list() [18:42:10.248] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:10.248] - attr(*, "where")=List of 1 [18:42:10.248] ..$ ...: [18:42:10.248] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:10.248] - attr(*, "resolved")= logi TRUE [18:42:10.248] - attr(*, "total_size")= num NA [18:42:10.255] - Getting '...' globals ... DONE [18:42:10.255] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:10.255] List of 2 [18:42:10.255] $ ...future.FUN:function (x) [18:42:10.255] $ ... : list() [18:42:10.255] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:10.255] - attr(*, "where")=List of 2 [18:42:10.255] ..$ ...future.FUN: [18:42:10.255] ..$ ... : [18:42:10.255] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:10.255] - attr(*, "resolved")= logi FALSE [18:42:10.255] - attr(*, "total_size")= int 5632 [18:42:10.259] Packages to be attached in all futures: [n=0] [18:42:10.259] getGlobalsAndPackagesXApply() ... DONE [18:42:10.259] Number of futures (= number of chunks): 1 [18:42:10.260] Launching 1 futures (chunks) ... [18:42:10.260] Chunk #1 of 1 ... [18:42:10.260] - Finding globals in 'X' for chunk #1 ... [18:42:10.260] getGlobalsAndPackages() ... [18:42:10.260] Searching for globals... [18:42:10.261] [18:42:10.261] Searching for globals ... DONE [18:42:10.261] - globals: [0] [18:42:10.261] getGlobalsAndPackages() ... DONE [18:42:10.262] + additional globals found: [n=0] [18:42:10.262] + additional namespaces needed: [n=0] [18:42:10.262] - Finding globals in 'X' for chunk #1 ... DONE [18:42:10.262] - seeds: [18:42:10.262] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:10.262] getGlobalsAndPackages() ... [18:42:10.263] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:10.263] Resolving globals: FALSE [18:42:10.263] Tweak future expression to call with '...' arguments ... [18:42:10.263] { [18:42:10.263] do.call(function(...) { [18:42:10.263] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:10.263] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:10.263] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:10.263] on.exit(options(oopts), add = TRUE) [18:42:10.263] } [18:42:10.263] { [18:42:10.263] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:10.263] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:10.263] ...future.FUN(...future.X_jj, ...) [18:42:10.263] }) [18:42:10.263] } [18:42:10.263] }, args = future.call.arguments) [18:42:10.263] } [18:42:10.264] Tweak future expression to call with '...' arguments ... DONE [18:42:10.264] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:10.264] [18:42:10.264] getGlobalsAndPackages() ... DONE [18:42:10.265] run() for 'Future' ... [18:42:10.265] - state: 'created' [18:42:10.265] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:42:10.266] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:10.266] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:10.266] - Field: 'label' [18:42:10.266] - Field: 'local' [18:42:10.267] - Field: 'owner' [18:42:10.267] - Field: 'envir' [18:42:10.267] - Field: 'packages' [18:42:10.267] - Field: 'gc' [18:42:10.267] - Field: 'conditions' [18:42:10.267] - Field: 'expr' [18:42:10.268] - Field: 'uuid' [18:42:10.268] - Field: 'seed' [18:42:10.268] - Field: 'version' [18:42:10.268] - Field: 'result' [18:42:10.268] - Field: 'asynchronous' [18:42:10.269] - Field: 'calls' [18:42:10.269] - Field: 'globals' [18:42:10.269] - Field: 'stdout' [18:42:10.269] - Field: 'earlySignal' [18:42:10.269] - Field: 'lazy' [18:42:10.269] - Field: 'state' [18:42:10.270] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:10.270] - Launch lazy future ... [18:42:10.270] Packages needed by the future expression (n = 0): [18:42:10.270] Packages needed by future strategies (n = 0): [18:42:10.271] { [18:42:10.271] { [18:42:10.271] { [18:42:10.271] ...future.startTime <- base::Sys.time() [18:42:10.271] { [18:42:10.271] { [18:42:10.271] { [18:42:10.271] base::local({ [18:42:10.271] has_future <- base::requireNamespace("future", [18:42:10.271] quietly = TRUE) [18:42:10.271] if (has_future) { [18:42:10.271] ns <- base::getNamespace("future") [18:42:10.271] version <- ns[[".package"]][["version"]] [18:42:10.271] if (is.null(version)) [18:42:10.271] version <- utils::packageVersion("future") [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] version <- NULL [18:42:10.271] } [18:42:10.271] if (!has_future || version < "1.8.0") { [18:42:10.271] info <- base::c(r_version = base::gsub("R version ", [18:42:10.271] "", base::R.version$version.string), [18:42:10.271] platform = base::sprintf("%s (%s-bit)", [18:42:10.271] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:10.271] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:10.271] "release", "version")], collapse = " "), [18:42:10.271] hostname = base::Sys.info()[["nodename"]]) [18:42:10.271] info <- base::sprintf("%s: %s", base::names(info), [18:42:10.271] info) [18:42:10.271] info <- base::paste(info, collapse = "; ") [18:42:10.271] if (!has_future) { [18:42:10.271] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:10.271] info) [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:10.271] info, version) [18:42:10.271] } [18:42:10.271] base::stop(msg) [18:42:10.271] } [18:42:10.271] }) [18:42:10.271] } [18:42:10.271] ...future.strategy.old <- future::plan("list") [18:42:10.271] options(future.plan = NULL) [18:42:10.271] Sys.unsetenv("R_FUTURE_PLAN") [18:42:10.271] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:10.271] } [18:42:10.271] ...future.workdir <- getwd() [18:42:10.271] } [18:42:10.271] ...future.oldOptions <- base::as.list(base::.Options) [18:42:10.271] ...future.oldEnvVars <- base::Sys.getenv() [18:42:10.271] } [18:42:10.271] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:10.271] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:10.271] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:10.271] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:10.271] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:10.271] future.stdout.windows.reencode = NULL, width = 80L) [18:42:10.271] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:10.271] base::names(...future.oldOptions)) [18:42:10.271] } [18:42:10.271] if (TRUE) { [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] if (NA) { [18:42:10.271] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:10.271] open = "w") [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:10.271] windows = "NUL", "/dev/null"), open = "w") [18:42:10.271] } [18:42:10.271] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:10.271] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:10.271] base::sink(type = "output", split = FALSE) [18:42:10.271] base::close(...future.stdout) [18:42:10.271] }, add = TRUE) [18:42:10.271] } [18:42:10.271] ...future.frame <- base::sys.nframe() [18:42:10.271] ...future.conditions <- base::list() [18:42:10.271] ...future.rng <- base::globalenv()$.Random.seed [18:42:10.271] if (FALSE) { [18:42:10.271] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:10.271] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:10.271] } [18:42:10.271] ...future.result <- base::tryCatch({ [18:42:10.271] base::withCallingHandlers({ [18:42:10.271] ...future.value <- base::withVisible(base::local({ [18:42:10.271] do.call(function(...) { [18:42:10.271] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:10.271] if (!identical(...future.globals.maxSize.org, [18:42:10.271] ...future.globals.maxSize)) { [18:42:10.271] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:10.271] on.exit(options(oopts), add = TRUE) [18:42:10.271] } [18:42:10.271] { [18:42:10.271] lapply(seq_along(...future.elements_ii), [18:42:10.271] FUN = function(jj) { [18:42:10.271] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:10.271] ...future.FUN(...future.X_jj, ...) [18:42:10.271] }) [18:42:10.271] } [18:42:10.271] }, args = future.call.arguments) [18:42:10.271] })) [18:42:10.271] future::FutureResult(value = ...future.value$value, [18:42:10.271] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:10.271] ...future.rng), globalenv = if (FALSE) [18:42:10.271] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:10.271] ...future.globalenv.names)) [18:42:10.271] else NULL, started = ...future.startTime, version = "1.8") [18:42:10.271] }, condition = base::local({ [18:42:10.271] c <- base::c [18:42:10.271] inherits <- base::inherits [18:42:10.271] invokeRestart <- base::invokeRestart [18:42:10.271] length <- base::length [18:42:10.271] list <- base::list [18:42:10.271] seq.int <- base::seq.int [18:42:10.271] signalCondition <- base::signalCondition [18:42:10.271] sys.calls <- base::sys.calls [18:42:10.271] `[[` <- base::`[[` [18:42:10.271] `+` <- base::`+` [18:42:10.271] `<<-` <- base::`<<-` [18:42:10.271] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:10.271] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:10.271] 3L)] [18:42:10.271] } [18:42:10.271] function(cond) { [18:42:10.271] is_error <- inherits(cond, "error") [18:42:10.271] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:10.271] NULL) [18:42:10.271] if (is_error) { [18:42:10.271] sessionInformation <- function() { [18:42:10.271] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:10.271] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:10.271] search = base::search(), system = base::Sys.info()) [18:42:10.271] } [18:42:10.271] ...future.conditions[[length(...future.conditions) + [18:42:10.271] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:10.271] cond$call), session = sessionInformation(), [18:42:10.271] timestamp = base::Sys.time(), signaled = 0L) [18:42:10.271] signalCondition(cond) [18:42:10.271] } [18:42:10.271] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:10.271] "immediateCondition"))) { [18:42:10.271] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:10.271] ...future.conditions[[length(...future.conditions) + [18:42:10.271] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:10.271] if (TRUE && !signal) { [18:42:10.271] muffleCondition <- function (cond, pattern = "^muffle") [18:42:10.271] { [18:42:10.271] inherits <- base::inherits [18:42:10.271] invokeRestart <- base::invokeRestart [18:42:10.271] is.null <- base::is.null [18:42:10.271] muffled <- FALSE [18:42:10.271] if (inherits(cond, "message")) { [18:42:10.271] muffled <- grepl(pattern, "muffleMessage") [18:42:10.271] if (muffled) [18:42:10.271] invokeRestart("muffleMessage") [18:42:10.271] } [18:42:10.271] else if (inherits(cond, "warning")) { [18:42:10.271] muffled <- grepl(pattern, "muffleWarning") [18:42:10.271] if (muffled) [18:42:10.271] invokeRestart("muffleWarning") [18:42:10.271] } [18:42:10.271] else if (inherits(cond, "condition")) { [18:42:10.271] if (!is.null(pattern)) { [18:42:10.271] computeRestarts <- base::computeRestarts [18:42:10.271] grepl <- base::grepl [18:42:10.271] restarts <- computeRestarts(cond) [18:42:10.271] for (restart in restarts) { [18:42:10.271] name <- restart$name [18:42:10.271] if (is.null(name)) [18:42:10.271] next [18:42:10.271] if (!grepl(pattern, name)) [18:42:10.271] next [18:42:10.271] invokeRestart(restart) [18:42:10.271] muffled <- TRUE [18:42:10.271] break [18:42:10.271] } [18:42:10.271] } [18:42:10.271] } [18:42:10.271] invisible(muffled) [18:42:10.271] } [18:42:10.271] muffleCondition(cond, pattern = "^muffle") [18:42:10.271] } [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] if (TRUE) { [18:42:10.271] muffleCondition <- function (cond, pattern = "^muffle") [18:42:10.271] { [18:42:10.271] inherits <- base::inherits [18:42:10.271] invokeRestart <- base::invokeRestart [18:42:10.271] is.null <- base::is.null [18:42:10.271] muffled <- FALSE [18:42:10.271] if (inherits(cond, "message")) { [18:42:10.271] muffled <- grepl(pattern, "muffleMessage") [18:42:10.271] if (muffled) [18:42:10.271] invokeRestart("muffleMessage") [18:42:10.271] } [18:42:10.271] else if (inherits(cond, "warning")) { [18:42:10.271] muffled <- grepl(pattern, "muffleWarning") [18:42:10.271] if (muffled) [18:42:10.271] invokeRestart("muffleWarning") [18:42:10.271] } [18:42:10.271] else if (inherits(cond, "condition")) { [18:42:10.271] if (!is.null(pattern)) { [18:42:10.271] computeRestarts <- base::computeRestarts [18:42:10.271] grepl <- base::grepl [18:42:10.271] restarts <- computeRestarts(cond) [18:42:10.271] for (restart in restarts) { [18:42:10.271] name <- restart$name [18:42:10.271] if (is.null(name)) [18:42:10.271] next [18:42:10.271] if (!grepl(pattern, name)) [18:42:10.271] next [18:42:10.271] invokeRestart(restart) [18:42:10.271] muffled <- TRUE [18:42:10.271] break [18:42:10.271] } [18:42:10.271] } [18:42:10.271] } [18:42:10.271] invisible(muffled) [18:42:10.271] } [18:42:10.271] muffleCondition(cond, pattern = "^muffle") [18:42:10.271] } [18:42:10.271] } [18:42:10.271] } [18:42:10.271] })) [18:42:10.271] }, error = function(ex) { [18:42:10.271] base::structure(base::list(value = NULL, visible = NULL, [18:42:10.271] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:10.271] ...future.rng), started = ...future.startTime, [18:42:10.271] finished = Sys.time(), session_uuid = NA_character_, [18:42:10.271] version = "1.8"), class = "FutureResult") [18:42:10.271] }, finally = { [18:42:10.271] if (!identical(...future.workdir, getwd())) [18:42:10.271] setwd(...future.workdir) [18:42:10.271] { [18:42:10.271] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:10.271] ...future.oldOptions$nwarnings <- NULL [18:42:10.271] } [18:42:10.271] base::options(...future.oldOptions) [18:42:10.271] if (.Platform$OS.type == "windows") { [18:42:10.271] old_names <- names(...future.oldEnvVars) [18:42:10.271] envs <- base::Sys.getenv() [18:42:10.271] names <- names(envs) [18:42:10.271] common <- intersect(names, old_names) [18:42:10.271] added <- setdiff(names, old_names) [18:42:10.271] removed <- setdiff(old_names, names) [18:42:10.271] changed <- common[...future.oldEnvVars[common] != [18:42:10.271] envs[common]] [18:42:10.271] NAMES <- toupper(changed) [18:42:10.271] args <- list() [18:42:10.271] for (kk in seq_along(NAMES)) { [18:42:10.271] name <- changed[[kk]] [18:42:10.271] NAME <- NAMES[[kk]] [18:42:10.271] if (name != NAME && is.element(NAME, old_names)) [18:42:10.271] next [18:42:10.271] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:10.271] } [18:42:10.271] NAMES <- toupper(added) [18:42:10.271] for (kk in seq_along(NAMES)) { [18:42:10.271] name <- added[[kk]] [18:42:10.271] NAME <- NAMES[[kk]] [18:42:10.271] if (name != NAME && is.element(NAME, old_names)) [18:42:10.271] next [18:42:10.271] args[[name]] <- "" [18:42:10.271] } [18:42:10.271] NAMES <- toupper(removed) [18:42:10.271] for (kk in seq_along(NAMES)) { [18:42:10.271] name <- removed[[kk]] [18:42:10.271] NAME <- NAMES[[kk]] [18:42:10.271] if (name != NAME && is.element(NAME, old_names)) [18:42:10.271] next [18:42:10.271] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:10.271] } [18:42:10.271] if (length(args) > 0) [18:42:10.271] base::do.call(base::Sys.setenv, args = args) [18:42:10.271] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:10.271] } [18:42:10.271] { [18:42:10.271] if (base::length(...future.futureOptionsAdded) > [18:42:10.271] 0L) { [18:42:10.271] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:10.271] base::names(opts) <- ...future.futureOptionsAdded [18:42:10.271] base::options(opts) [18:42:10.271] } [18:42:10.271] { [18:42:10.271] { [18:42:10.271] NULL [18:42:10.271] RNGkind("Mersenne-Twister") [18:42:10.271] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:10.271] inherits = FALSE) [18:42:10.271] } [18:42:10.271] options(future.plan = NULL) [18:42:10.271] if (is.na(NA_character_)) [18:42:10.271] Sys.unsetenv("R_FUTURE_PLAN") [18:42:10.271] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:10.271] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:10.271] .init = FALSE) [18:42:10.271] } [18:42:10.271] } [18:42:10.271] } [18:42:10.271] }) [18:42:10.271] if (FALSE) { [18:42:10.271] base::sink(type = "output", split = FALSE) [18:42:10.271] if (NA) { [18:42:10.271] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:10.271] } [18:42:10.271] else { [18:42:10.271] ...future.result["stdout"] <- base::list(NULL) [18:42:10.271] } [18:42:10.271] base::close(...future.stdout) [18:42:10.271] ...future.stdout <- NULL [18:42:10.271] } [18:42:10.271] ...future.result$conditions <- ...future.conditions [18:42:10.271] ...future.result$finished <- base::Sys.time() [18:42:10.271] ...future.result [18:42:10.271] } [18:42:10.275] assign_globals() ... [18:42:10.275] List of 5 [18:42:10.275] $ ...future.FUN :function (x) [18:42:10.275] $ future.call.arguments : list() [18:42:10.275] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:10.275] $ ...future.elements_ii :List of 2 [18:42:10.275] ..$ : int 1 [18:42:10.275] ..$ : int 0 [18:42:10.275] $ ...future.seeds_ii : NULL [18:42:10.275] $ ...future.globals.maxSize: NULL [18:42:10.275] - attr(*, "where")=List of 5 [18:42:10.275] ..$ ...future.FUN : [18:42:10.275] ..$ future.call.arguments : [18:42:10.275] ..$ ...future.elements_ii : [18:42:10.275] ..$ ...future.seeds_ii : [18:42:10.275] ..$ ...future.globals.maxSize: [18:42:10.275] - attr(*, "resolved")= logi FALSE [18:42:10.275] - attr(*, "total_size")= num 5632 [18:42:10.275] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:10.275] - attr(*, "already-done")= logi TRUE [18:42:10.285] - reassign environment for '...future.FUN' [18:42:10.285] - copied '...future.FUN' to environment [18:42:10.285] - copied 'future.call.arguments' to environment [18:42:10.285] - copied '...future.elements_ii' to environment [18:42:10.285] - copied '...future.seeds_ii' to environment [18:42:10.285] - copied '...future.globals.maxSize' to environment [18:42:10.286] assign_globals() ... done [18:42:10.286] plan(): Setting new future strategy stack: [18:42:10.286] List of future strategies: [18:42:10.286] 1. sequential: [18:42:10.286] - args: function (..., envir = parent.frame(), workers = "") [18:42:10.286] - tweaked: FALSE [18:42:10.286] - call: NULL [18:42:10.287] plan(): nbrOfWorkers() = 1 [18:42:10.806] plan(): Setting new future strategy stack: [18:42:10.807] List of future strategies: [18:42:10.807] 1. sequential: [18:42:10.807] - args: function (..., envir = parent.frame(), workers = "") [18:42:10.807] - tweaked: FALSE [18:42:10.807] - call: plan(strategy) [18:42:10.809] plan(): nbrOfWorkers() = 1 [18:42:10.809] SequentialFuture started (and completed) [18:42:10.809] - Launch lazy future ... done [18:42:10.810] run() for 'SequentialFuture' ... done [18:42:10.810] Created future: [18:42:10.811] SequentialFuture: [18:42:10.811] Label: 'future_lapply-1' [18:42:10.811] Expression: [18:42:10.811] { [18:42:10.811] do.call(function(...) { [18:42:10.811] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:10.811] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:10.811] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:10.811] on.exit(options(oopts), add = TRUE) [18:42:10.811] } [18:42:10.811] { [18:42:10.811] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:10.811] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:10.811] ...future.FUN(...future.X_jj, ...) [18:42:10.811] }) [18:42:10.811] } [18:42:10.811] }, args = future.call.arguments) [18:42:10.811] } [18:42:10.811] Lazy evaluation: FALSE [18:42:10.811] Asynchronous evaluation: FALSE [18:42:10.811] Local evaluation: TRUE [18:42:10.811] Environment: R_GlobalEnv [18:42:10.811] Capture standard output: NA [18:42:10.811] Capture condition classes: 'condition' (excluding 'nothing') [18:42:10.811] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:10.811] Packages: [18:42:10.811] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:10.811] Resolved: TRUE [18:42:10.811] Value: 55 bytes of class 'list' [18:42:10.811] Early signaling: FALSE [18:42:10.811] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:10.811] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:10.813] Chunk #1 of 1 ... DONE [18:42:10.814] Launching 1 futures (chunks) ... DONE [18:42:10.814] Resolving 1 futures (chunks) ... [18:42:10.814] resolve() on list ... [18:42:10.815] recursive: 0 [18:42:10.815] length: 1 [18:42:10.815] [18:42:10.816] resolved() for 'SequentialFuture' ... [18:42:10.816] - state: 'finished' [18:42:10.817] - run: TRUE [18:42:10.817] - result: 'FutureResult' [18:42:10.817] resolved() for 'SequentialFuture' ... done [18:42:10.818] Future #1 [18:42:10.818] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:10.819] - nx: 1 [18:42:10.819] - relay: TRUE [18:42:10.819] - stdout: TRUE [18:42:10.820] - signal: TRUE [18:42:10.820] - resignal: FALSE [18:42:10.820] - force: TRUE [18:42:10.820] - relayed: [n=1] FALSE [18:42:10.821] - queued futures: [n=1] FALSE [18:42:10.821] - until=1 [18:42:10.821] - relaying element #1 [18:42:10.822] - relayed: [n=1] TRUE [18:42:10.822] - queued futures: [n=1] TRUE [18:42:10.823] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:10.823] length: 0 (resolved future 1) [18:42:10.824] Relaying remaining futures [18:42:10.824] signalConditionsASAP(NULL, pos=0) ... [18:42:10.824] - nx: 1 [18:42:10.825] - relay: TRUE [18:42:10.825] - stdout: TRUE [18:42:10.825] - signal: TRUE [18:42:10.826] - resignal: FALSE [18:42:10.826] - force: TRUE [18:42:10.826] - relayed: [n=1] TRUE [18:42:10.826] - queued futures: [n=1] TRUE - flush all [18:42:10.827] - relayed: [n=1] TRUE [18:42:10.827] - queued futures: [n=1] TRUE [18:42:10.828] signalConditionsASAP(NULL, pos=0) ... done [18:42:10.828] resolve() on list ... DONE [18:42:10.828] - Number of value chunks collected: 1 [18:42:10.829] Resolving 1 futures (chunks) ... DONE [18:42:10.829] Reducing values from 1 chunks ... [18:42:10.829] - Number of values collected after concatenation: 2 [18:42:10.830] - Number of values expected: 2 [18:42:10.830] Reducing values from 1 chunks ... DONE [18:42:10.830] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = NA) ... DONE * future_mapply(x, ..., future.stdout = FALSE) ... [18:42:10.832] future_mapply() ... [18:42:10.832] Number of chunks: 1 [18:42:10.832] getGlobalsAndPackagesXApply() ... [18:42:10.833] - future.globals: TRUE [18:42:10.833] getGlobalsAndPackages() ... [18:42:10.834] Searching for globals... [18:42:10.838] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:10.839] Searching for globals ... DONE [18:42:10.839] Resolving globals: FALSE [18:42:10.841] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:10.842] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:10.842] - globals: [1] 'FUN' [18:42:10.842] [18:42:10.843] getGlobalsAndPackages() ... DONE [18:42:10.843] - globals found/used: [n=1] 'FUN' [18:42:10.843] - needed namespaces: [n=0] [18:42:10.844] Finding globals ... DONE [18:42:10.844] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:10.845] List of 2 [18:42:10.845] $ ...future.FUN:function (x, y) [18:42:10.845] $ MoreArgs : NULL [18:42:10.845] - attr(*, "where")=List of 2 [18:42:10.845] ..$ ...future.FUN: [18:42:10.845] ..$ MoreArgs : [18:42:10.845] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:10.845] - attr(*, "resolved")= logi FALSE [18:42:10.845] - attr(*, "total_size")= num NA [18:42:10.858] Packages to be attached in all futures: [n=0] [18:42:10.859] getGlobalsAndPackagesXApply() ... DONE [18:42:10.859] Number of futures (= number of chunks): 1 [18:42:10.860] Launching 1 futures (chunks) ... [18:42:10.860] Chunk #1 of 1 ... [18:42:10.860] - Finding globals in '...' for chunk #1 ... [18:42:10.861] getGlobalsAndPackages() ... [18:42:10.861] Searching for globals... [18:42:10.862] [18:42:10.862] Searching for globals ... DONE [18:42:10.863] - globals: [0] [18:42:10.863] getGlobalsAndPackages() ... DONE [18:42:10.863] + additional globals found: [n=0] [18:42:10.864] + additional namespaces needed: [n=0] [18:42:10.864] - Finding globals in '...' for chunk #1 ... DONE [18:42:10.864] - seeds: [18:42:10.865] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:10.865] getGlobalsAndPackages() ... [18:42:10.865] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:10.866] Resolving globals: FALSE [18:42:10.867] The total size of the 5 globals is 1.21 KiB (1242 bytes) [18:42:10.868] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (95 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:10.868] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:10.869] [18:42:10.869] getGlobalsAndPackages() ... DONE [18:42:10.870] run() for 'Future' ... [18:42:10.870] - state: 'created' [18:42:10.871] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:42:10.871] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:10.872] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:10.872] - Field: 'label' [18:42:10.873] - Field: 'local' [18:42:10.873] - Field: 'owner' [18:42:10.873] - Field: 'envir' [18:42:10.874] - Field: 'packages' [18:42:10.874] - Field: 'gc' [18:42:10.874] - Field: 'conditions' [18:42:10.875] - Field: 'expr' [18:42:10.875] - Field: 'uuid' [18:42:10.875] - Field: 'seed' [18:42:10.876] - Field: 'version' [18:42:10.876] - Field: 'result' [18:42:10.876] - Field: 'asynchronous' [18:42:10.877] - Field: 'calls' [18:42:10.877] - Field: 'globals' [18:42:10.877] - Field: 'stdout' [18:42:10.877] - Field: 'earlySignal' [18:42:10.878] - Field: 'lazy' [18:42:10.878] - Field: 'state' [18:42:10.878] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:10.879] - Launch lazy future ... [18:42:10.879] Packages needed by the future expression (n = 0): [18:42:10.880] Packages needed by future strategies (n = 0): [18:42:10.881] { [18:42:10.881] { [18:42:10.881] { [18:42:10.881] ...future.startTime <- base::Sys.time() [18:42:10.881] { [18:42:10.881] { [18:42:10.881] { [18:42:10.881] base::local({ [18:42:10.881] has_future <- base::requireNamespace("future", [18:42:10.881] quietly = TRUE) [18:42:10.881] if (has_future) { [18:42:10.881] ns <- base::getNamespace("future") [18:42:10.881] version <- ns[[".package"]][["version"]] [18:42:10.881] if (is.null(version)) [18:42:10.881] version <- utils::packageVersion("future") [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] version <- NULL [18:42:10.881] } [18:42:10.881] if (!has_future || version < "1.8.0") { [18:42:10.881] info <- base::c(r_version = base::gsub("R version ", [18:42:10.881] "", base::R.version$version.string), [18:42:10.881] platform = base::sprintf("%s (%s-bit)", [18:42:10.881] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:10.881] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:10.881] "release", "version")], collapse = " "), [18:42:10.881] hostname = base::Sys.info()[["nodename"]]) [18:42:10.881] info <- base::sprintf("%s: %s", base::names(info), [18:42:10.881] info) [18:42:10.881] info <- base::paste(info, collapse = "; ") [18:42:10.881] if (!has_future) { [18:42:10.881] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:10.881] info) [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:10.881] info, version) [18:42:10.881] } [18:42:10.881] base::stop(msg) [18:42:10.881] } [18:42:10.881] }) [18:42:10.881] } [18:42:10.881] ...future.strategy.old <- future::plan("list") [18:42:10.881] options(future.plan = NULL) [18:42:10.881] Sys.unsetenv("R_FUTURE_PLAN") [18:42:10.881] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:10.881] } [18:42:10.881] ...future.workdir <- getwd() [18:42:10.881] } [18:42:10.881] ...future.oldOptions <- base::as.list(base::.Options) [18:42:10.881] ...future.oldEnvVars <- base::Sys.getenv() [18:42:10.881] } [18:42:10.881] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:10.881] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:10.881] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:10.881] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:10.881] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:10.881] future.stdout.windows.reencode = NULL, width = 80L) [18:42:10.881] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:10.881] base::names(...future.oldOptions)) [18:42:10.881] } [18:42:10.881] if (FALSE) { [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] if (FALSE) { [18:42:10.881] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:10.881] open = "w") [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:10.881] windows = "NUL", "/dev/null"), open = "w") [18:42:10.881] } [18:42:10.881] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:10.881] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:10.881] base::sink(type = "output", split = FALSE) [18:42:10.881] base::close(...future.stdout) [18:42:10.881] }, add = TRUE) [18:42:10.881] } [18:42:10.881] ...future.frame <- base::sys.nframe() [18:42:10.881] ...future.conditions <- base::list() [18:42:10.881] ...future.rng <- base::globalenv()$.Random.seed [18:42:10.881] if (FALSE) { [18:42:10.881] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:10.881] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:10.881] } [18:42:10.881] ...future.result <- base::tryCatch({ [18:42:10.881] base::withCallingHandlers({ [18:42:10.881] ...future.value <- base::withVisible(base::local({ [18:42:10.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:10.881] if (!identical(...future.globals.maxSize.org, [18:42:10.881] ...future.globals.maxSize)) { [18:42:10.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:10.881] on.exit(options(oopts), add = TRUE) [18:42:10.881] } [18:42:10.881] { [18:42:10.881] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:10.881] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:10.881] USE.NAMES = FALSE) [18:42:10.881] do.call(mapply, args = args) [18:42:10.881] } [18:42:10.881] })) [18:42:10.881] future::FutureResult(value = ...future.value$value, [18:42:10.881] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:10.881] ...future.rng), globalenv = if (FALSE) [18:42:10.881] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:10.881] ...future.globalenv.names)) [18:42:10.881] else NULL, started = ...future.startTime, version = "1.8") [18:42:10.881] }, condition = base::local({ [18:42:10.881] c <- base::c [18:42:10.881] inherits <- base::inherits [18:42:10.881] invokeRestart <- base::invokeRestart [18:42:10.881] length <- base::length [18:42:10.881] list <- base::list [18:42:10.881] seq.int <- base::seq.int [18:42:10.881] signalCondition <- base::signalCondition [18:42:10.881] sys.calls <- base::sys.calls [18:42:10.881] `[[` <- base::`[[` [18:42:10.881] `+` <- base::`+` [18:42:10.881] `<<-` <- base::`<<-` [18:42:10.881] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:10.881] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:10.881] 3L)] [18:42:10.881] } [18:42:10.881] function(cond) { [18:42:10.881] is_error <- inherits(cond, "error") [18:42:10.881] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:10.881] NULL) [18:42:10.881] if (is_error) { [18:42:10.881] sessionInformation <- function() { [18:42:10.881] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:10.881] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:10.881] search = base::search(), system = base::Sys.info()) [18:42:10.881] } [18:42:10.881] ...future.conditions[[length(...future.conditions) + [18:42:10.881] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:10.881] cond$call), session = sessionInformation(), [18:42:10.881] timestamp = base::Sys.time(), signaled = 0L) [18:42:10.881] signalCondition(cond) [18:42:10.881] } [18:42:10.881] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:10.881] "immediateCondition"))) { [18:42:10.881] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:10.881] ...future.conditions[[length(...future.conditions) + [18:42:10.881] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:10.881] if (TRUE && !signal) { [18:42:10.881] muffleCondition <- function (cond, pattern = "^muffle") [18:42:10.881] { [18:42:10.881] inherits <- base::inherits [18:42:10.881] invokeRestart <- base::invokeRestart [18:42:10.881] is.null <- base::is.null [18:42:10.881] muffled <- FALSE [18:42:10.881] if (inherits(cond, "message")) { [18:42:10.881] muffled <- grepl(pattern, "muffleMessage") [18:42:10.881] if (muffled) [18:42:10.881] invokeRestart("muffleMessage") [18:42:10.881] } [18:42:10.881] else if (inherits(cond, "warning")) { [18:42:10.881] muffled <- grepl(pattern, "muffleWarning") [18:42:10.881] if (muffled) [18:42:10.881] invokeRestart("muffleWarning") [18:42:10.881] } [18:42:10.881] else if (inherits(cond, "condition")) { [18:42:10.881] if (!is.null(pattern)) { [18:42:10.881] computeRestarts <- base::computeRestarts [18:42:10.881] grepl <- base::grepl [18:42:10.881] restarts <- computeRestarts(cond) [18:42:10.881] for (restart in restarts) { [18:42:10.881] name <- restart$name [18:42:10.881] if (is.null(name)) [18:42:10.881] next [18:42:10.881] if (!grepl(pattern, name)) [18:42:10.881] next [18:42:10.881] invokeRestart(restart) [18:42:10.881] muffled <- TRUE [18:42:10.881] break [18:42:10.881] } [18:42:10.881] } [18:42:10.881] } [18:42:10.881] invisible(muffled) [18:42:10.881] } [18:42:10.881] muffleCondition(cond, pattern = "^muffle") [18:42:10.881] } [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] if (TRUE) { [18:42:10.881] muffleCondition <- function (cond, pattern = "^muffle") [18:42:10.881] { [18:42:10.881] inherits <- base::inherits [18:42:10.881] invokeRestart <- base::invokeRestart [18:42:10.881] is.null <- base::is.null [18:42:10.881] muffled <- FALSE [18:42:10.881] if (inherits(cond, "message")) { [18:42:10.881] muffled <- grepl(pattern, "muffleMessage") [18:42:10.881] if (muffled) [18:42:10.881] invokeRestart("muffleMessage") [18:42:10.881] } [18:42:10.881] else if (inherits(cond, "warning")) { [18:42:10.881] muffled <- grepl(pattern, "muffleWarning") [18:42:10.881] if (muffled) [18:42:10.881] invokeRestart("muffleWarning") [18:42:10.881] } [18:42:10.881] else if (inherits(cond, "condition")) { [18:42:10.881] if (!is.null(pattern)) { [18:42:10.881] computeRestarts <- base::computeRestarts [18:42:10.881] grepl <- base::grepl [18:42:10.881] restarts <- computeRestarts(cond) [18:42:10.881] for (restart in restarts) { [18:42:10.881] name <- restart$name [18:42:10.881] if (is.null(name)) [18:42:10.881] next [18:42:10.881] if (!grepl(pattern, name)) [18:42:10.881] next [18:42:10.881] invokeRestart(restart) [18:42:10.881] muffled <- TRUE [18:42:10.881] break [18:42:10.881] } [18:42:10.881] } [18:42:10.881] } [18:42:10.881] invisible(muffled) [18:42:10.881] } [18:42:10.881] muffleCondition(cond, pattern = "^muffle") [18:42:10.881] } [18:42:10.881] } [18:42:10.881] } [18:42:10.881] })) [18:42:10.881] }, error = function(ex) { [18:42:10.881] base::structure(base::list(value = NULL, visible = NULL, [18:42:10.881] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:10.881] ...future.rng), started = ...future.startTime, [18:42:10.881] finished = Sys.time(), session_uuid = NA_character_, [18:42:10.881] version = "1.8"), class = "FutureResult") [18:42:10.881] }, finally = { [18:42:10.881] if (!identical(...future.workdir, getwd())) [18:42:10.881] setwd(...future.workdir) [18:42:10.881] { [18:42:10.881] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:10.881] ...future.oldOptions$nwarnings <- NULL [18:42:10.881] } [18:42:10.881] base::options(...future.oldOptions) [18:42:10.881] if (.Platform$OS.type == "windows") { [18:42:10.881] old_names <- names(...future.oldEnvVars) [18:42:10.881] envs <- base::Sys.getenv() [18:42:10.881] names <- names(envs) [18:42:10.881] common <- intersect(names, old_names) [18:42:10.881] added <- setdiff(names, old_names) [18:42:10.881] removed <- setdiff(old_names, names) [18:42:10.881] changed <- common[...future.oldEnvVars[common] != [18:42:10.881] envs[common]] [18:42:10.881] NAMES <- toupper(changed) [18:42:10.881] args <- list() [18:42:10.881] for (kk in seq_along(NAMES)) { [18:42:10.881] name <- changed[[kk]] [18:42:10.881] NAME <- NAMES[[kk]] [18:42:10.881] if (name != NAME && is.element(NAME, old_names)) [18:42:10.881] next [18:42:10.881] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:10.881] } [18:42:10.881] NAMES <- toupper(added) [18:42:10.881] for (kk in seq_along(NAMES)) { [18:42:10.881] name <- added[[kk]] [18:42:10.881] NAME <- NAMES[[kk]] [18:42:10.881] if (name != NAME && is.element(NAME, old_names)) [18:42:10.881] next [18:42:10.881] args[[name]] <- "" [18:42:10.881] } [18:42:10.881] NAMES <- toupper(removed) [18:42:10.881] for (kk in seq_along(NAMES)) { [18:42:10.881] name <- removed[[kk]] [18:42:10.881] NAME <- NAMES[[kk]] [18:42:10.881] if (name != NAME && is.element(NAME, old_names)) [18:42:10.881] next [18:42:10.881] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:10.881] } [18:42:10.881] if (length(args) > 0) [18:42:10.881] base::do.call(base::Sys.setenv, args = args) [18:42:10.881] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:10.881] } [18:42:10.881] { [18:42:10.881] if (base::length(...future.futureOptionsAdded) > [18:42:10.881] 0L) { [18:42:10.881] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:10.881] base::names(opts) <- ...future.futureOptionsAdded [18:42:10.881] base::options(opts) [18:42:10.881] } [18:42:10.881] { [18:42:10.881] { [18:42:10.881] NULL [18:42:10.881] RNGkind("Mersenne-Twister") [18:42:10.881] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:10.881] inherits = FALSE) [18:42:10.881] } [18:42:10.881] options(future.plan = NULL) [18:42:10.881] if (is.na(NA_character_)) [18:42:10.881] Sys.unsetenv("R_FUTURE_PLAN") [18:42:10.881] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:10.881] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:10.881] .init = FALSE) [18:42:10.881] } [18:42:10.881] } [18:42:10.881] } [18:42:10.881] }) [18:42:10.881] if (TRUE) { [18:42:10.881] base::sink(type = "output", split = FALSE) [18:42:10.881] if (FALSE) { [18:42:10.881] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:10.881] } [18:42:10.881] else { [18:42:10.881] ...future.result["stdout"] <- base::list(NULL) [18:42:10.881] } [18:42:10.881] base::close(...future.stdout) [18:42:10.881] ...future.stdout <- NULL [18:42:10.881] } [18:42:10.881] ...future.result$conditions <- ...future.conditions [18:42:10.881] ...future.result$finished <- base::Sys.time() [18:42:10.881] ...future.result [18:42:10.881] } [18:42:10.887] assign_globals() ... [18:42:10.888] List of 5 [18:42:10.888] $ ...future.FUN :function (x, y) [18:42:10.888] $ MoreArgs : NULL [18:42:10.888] $ ...future.elements_ii :List of 2 [18:42:10.888] ..$ :List of 2 [18:42:10.888] .. ..$ : int 1 [18:42:10.888] .. ..$ : int 0 [18:42:10.888] ..$ :List of 2 [18:42:10.888] .. ..$ : int 0 [18:42:10.888] .. ..$ : int 1 [18:42:10.888] $ ...future.seeds_ii : NULL [18:42:10.888] $ ...future.globals.maxSize: NULL [18:42:10.888] - attr(*, "where")=List of 5 [18:42:10.888] ..$ ...future.FUN : [18:42:10.888] ..$ MoreArgs : [18:42:10.888] ..$ ...future.elements_ii : [18:42:10.888] ..$ ...future.seeds_ii : [18:42:10.888] ..$ ...future.globals.maxSize: [18:42:10.888] - attr(*, "resolved")= logi FALSE [18:42:10.888] - attr(*, "total_size")= int 1242 [18:42:10.888] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:10.888] - attr(*, "already-done")= logi TRUE [18:42:10.903] - reassign environment for '...future.FUN' [18:42:10.903] - copied '...future.FUN' to environment [18:42:10.903] - copied 'MoreArgs' to environment [18:42:10.904] - copied '...future.elements_ii' to environment [18:42:10.904] - copied '...future.seeds_ii' to environment [18:42:10.904] - copied '...future.globals.maxSize' to environment [18:42:10.905] assign_globals() ... done [18:42:10.905] plan(): Setting new future strategy stack: [18:42:10.906] List of future strategies: [18:42:10.906] 1. sequential: [18:42:10.906] - args: function (..., envir = parent.frame(), workers = "") [18:42:10.906] - tweaked: FALSE [18:42:10.906] - call: NULL [18:42:10.907] plan(): nbrOfWorkers() = 1 [18:42:11.416] plan(): Setting new future strategy stack: [18:42:11.417] List of future strategies: [18:42:11.417] 1. sequential: [18:42:11.417] - args: function (..., envir = parent.frame(), workers = "") [18:42:11.417] - tweaked: FALSE [18:42:11.417] - call: plan(strategy) [18:42:11.419] plan(): nbrOfWorkers() = 1 [18:42:11.420] SequentialFuture started (and completed) [18:42:11.420] - Launch lazy future ... done [18:42:11.421] run() for 'SequentialFuture' ... done [18:42:11.421] Created future: [18:42:11.422] SequentialFuture: [18:42:11.422] Label: 'future_mapply-1' [18:42:11.422] Expression: [18:42:11.422] { [18:42:11.422] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:11.422] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:11.422] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:11.422] on.exit(options(oopts), add = TRUE) [18:42:11.422] } [18:42:11.422] { [18:42:11.422] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:11.422] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:11.422] do.call(mapply, args = args) [18:42:11.422] } [18:42:11.422] } [18:42:11.422] Lazy evaluation: FALSE [18:42:11.422] Asynchronous evaluation: FALSE [18:42:11.422] Local evaluation: TRUE [18:42:11.422] Environment: R_GlobalEnv [18:42:11.422] Capture standard output: FALSE [18:42:11.422] Capture condition classes: 'condition' (excluding 'nothing') [18:42:11.422] Globals: 5 objects totaling 1.21 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 95 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:11.422] Packages: [18:42:11.422] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:11.422] Resolved: TRUE [18:42:11.422] Value: 184 bytes of class 'list' [18:42:11.422] Early signaling: FALSE [18:42:11.422] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:11.422] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:11.425] Chunk #1 of 1 ... DONE [18:42:11.425] Launching 1 futures (chunks) ... DONE [18:42:11.425] Resolving 1 futures (chunks) ... [18:42:11.426] resolve() on list ... [18:42:11.426] recursive: 0 [18:42:11.427] length: 1 [18:42:11.427] [18:42:11.427] resolved() for 'SequentialFuture' ... [18:42:11.428] - state: 'finished' [18:42:11.428] - run: TRUE [18:42:11.429] - result: 'FutureResult' [18:42:11.429] resolved() for 'SequentialFuture' ... done [18:42:11.430] Future #1 [18:42:11.430] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:11.431] - nx: 1 [18:42:11.431] - relay: TRUE [18:42:11.431] - stdout: TRUE [18:42:11.432] - signal: TRUE [18:42:11.432] - resignal: FALSE [18:42:11.432] - force: TRUE [18:42:11.433] - relayed: [n=1] FALSE [18:42:11.433] - queued futures: [n=1] FALSE [18:42:11.433] - until=1 [18:42:11.434] - relaying element #1 [18:42:11.435] - relayed: [n=1] TRUE [18:42:11.435] - queued futures: [n=1] TRUE [18:42:11.435] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:11.436] length: 0 (resolved future 1) [18:42:11.436] Relaying remaining futures [18:42:11.437] signalConditionsASAP(NULL, pos=0) ... [18:42:11.437] - nx: 1 [18:42:11.437] - relay: TRUE [18:42:11.438] - stdout: TRUE [18:42:11.438] - signal: TRUE [18:42:11.438] - resignal: FALSE [18:42:11.439] - force: TRUE [18:42:11.439] - relayed: [n=1] TRUE [18:42:11.439] - queued futures: [n=1] TRUE - flush all [18:42:11.440] - relayed: [n=1] TRUE [18:42:11.440] - queued futures: [n=1] TRUE [18:42:11.441] signalConditionsASAP(NULL, pos=0) ... done [18:42:11.441] resolve() on list ... DONE [18:42:11.442] - Number of value chunks collected: 1 [18:42:11.442] Resolving 1 futures (chunks) ... DONE [18:42:11.443] Reducing values from 1 chunks ... [18:42:11.443] - Number of values collected after concatenation: 2 [18:42:11.443] - Number of values expected: 2 [18:42:11.444] Reducing values from 1 chunks ... DONE [18:42:11.444] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = FALSE) ... DONE * future_mapply(x, ..., future.stdout = TRUE) ... [18:42:11.446] future_mapply() ... [18:42:11.446] Number of chunks: 1 [18:42:11.447] getGlobalsAndPackagesXApply() ... [18:42:11.447] - future.globals: TRUE [18:42:11.448] getGlobalsAndPackages() ... [18:42:11.448] Searching for globals... [18:42:11.454] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:11.454] Searching for globals ... DONE [18:42:11.455] Resolving globals: FALSE [18:42:11.456] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:11.457] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:11.458] - globals: [1] 'FUN' [18:42:11.458] [18:42:11.459] getGlobalsAndPackages() ... DONE [18:42:11.459] - globals found/used: [n=1] 'FUN' [18:42:11.460] - needed namespaces: [n=0] [18:42:11.460] Finding globals ... DONE [18:42:11.461] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:11.461] List of 2 [18:42:11.461] $ ...future.FUN:function (x, y) [18:42:11.461] $ MoreArgs : NULL [18:42:11.461] - attr(*, "where")=List of 2 [18:42:11.461] ..$ ...future.FUN: [18:42:11.461] ..$ MoreArgs : [18:42:11.461] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:11.461] - attr(*, "resolved")= logi FALSE [18:42:11.461] - attr(*, "total_size")= num NA [18:42:11.470] Packages to be attached in all futures: [n=0] [18:42:11.471] getGlobalsAndPackagesXApply() ... DONE [18:42:11.471] Number of futures (= number of chunks): 1 [18:42:11.472] Launching 1 futures (chunks) ... [18:42:11.472] Chunk #1 of 1 ... [18:42:11.473] - Finding globals in '...' for chunk #1 ... [18:42:11.473] getGlobalsAndPackages() ... [18:42:11.474] Searching for globals... [18:42:11.475] [18:42:11.475] Searching for globals ... DONE [18:42:11.475] - globals: [0] [18:42:11.476] getGlobalsAndPackages() ... DONE [18:42:11.476] + additional globals found: [n=0] [18:42:11.483] + additional namespaces needed: [n=0] [18:42:11.483] - Finding globals in '...' for chunk #1 ... DONE [18:42:11.484] - seeds: [18:42:11.484] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:11.484] getGlobalsAndPackages() ... [18:42:11.485] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:11.485] Resolving globals: FALSE [18:42:11.486] The total size of the 5 globals is 1.21 KiB (1242 bytes) [18:42:11.488] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (95 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:11.488] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:11.489] [18:42:11.489] getGlobalsAndPackages() ... DONE [18:42:11.490] run() for 'Future' ... [18:42:11.491] - state: 'created' [18:42:11.491] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:42:11.492] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:11.492] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:11.493] - Field: 'label' [18:42:11.493] - Field: 'local' [18:42:11.493] - Field: 'owner' [18:42:11.494] - Field: 'envir' [18:42:11.494] - Field: 'packages' [18:42:11.494] - Field: 'gc' [18:42:11.495] - Field: 'conditions' [18:42:11.495] - Field: 'expr' [18:42:11.495] - Field: 'uuid' [18:42:11.496] - Field: 'seed' [18:42:11.496] - Field: 'version' [18:42:11.496] - Field: 'result' [18:42:11.497] - Field: 'asynchronous' [18:42:11.497] - Field: 'calls' [18:42:11.497] - Field: 'globals' [18:42:11.498] - Field: 'stdout' [18:42:11.498] - Field: 'earlySignal' [18:42:11.499] - Field: 'lazy' [18:42:11.499] - Field: 'state' [18:42:11.499] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:11.500] - Launch lazy future ... [18:42:11.500] Packages needed by the future expression (n = 0): [18:42:11.500] Packages needed by future strategies (n = 0): [18:42:11.502] { [18:42:11.502] { [18:42:11.502] { [18:42:11.502] ...future.startTime <- base::Sys.time() [18:42:11.502] { [18:42:11.502] { [18:42:11.502] { [18:42:11.502] base::local({ [18:42:11.502] has_future <- base::requireNamespace("future", [18:42:11.502] quietly = TRUE) [18:42:11.502] if (has_future) { [18:42:11.502] ns <- base::getNamespace("future") [18:42:11.502] version <- ns[[".package"]][["version"]] [18:42:11.502] if (is.null(version)) [18:42:11.502] version <- utils::packageVersion("future") [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] version <- NULL [18:42:11.502] } [18:42:11.502] if (!has_future || version < "1.8.0") { [18:42:11.502] info <- base::c(r_version = base::gsub("R version ", [18:42:11.502] "", base::R.version$version.string), [18:42:11.502] platform = base::sprintf("%s (%s-bit)", [18:42:11.502] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:11.502] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:11.502] "release", "version")], collapse = " "), [18:42:11.502] hostname = base::Sys.info()[["nodename"]]) [18:42:11.502] info <- base::sprintf("%s: %s", base::names(info), [18:42:11.502] info) [18:42:11.502] info <- base::paste(info, collapse = "; ") [18:42:11.502] if (!has_future) { [18:42:11.502] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:11.502] info) [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:11.502] info, version) [18:42:11.502] } [18:42:11.502] base::stop(msg) [18:42:11.502] } [18:42:11.502] }) [18:42:11.502] } [18:42:11.502] ...future.strategy.old <- future::plan("list") [18:42:11.502] options(future.plan = NULL) [18:42:11.502] Sys.unsetenv("R_FUTURE_PLAN") [18:42:11.502] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:11.502] } [18:42:11.502] ...future.workdir <- getwd() [18:42:11.502] } [18:42:11.502] ...future.oldOptions <- base::as.list(base::.Options) [18:42:11.502] ...future.oldEnvVars <- base::Sys.getenv() [18:42:11.502] } [18:42:11.502] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:11.502] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:11.502] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:11.502] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:11.502] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:11.502] future.stdout.windows.reencode = NULL, width = 80L) [18:42:11.502] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:11.502] base::names(...future.oldOptions)) [18:42:11.502] } [18:42:11.502] if (FALSE) { [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] if (TRUE) { [18:42:11.502] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:11.502] open = "w") [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:11.502] windows = "NUL", "/dev/null"), open = "w") [18:42:11.502] } [18:42:11.502] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:11.502] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:11.502] base::sink(type = "output", split = FALSE) [18:42:11.502] base::close(...future.stdout) [18:42:11.502] }, add = TRUE) [18:42:11.502] } [18:42:11.502] ...future.frame <- base::sys.nframe() [18:42:11.502] ...future.conditions <- base::list() [18:42:11.502] ...future.rng <- base::globalenv()$.Random.seed [18:42:11.502] if (FALSE) { [18:42:11.502] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:11.502] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:11.502] } [18:42:11.502] ...future.result <- base::tryCatch({ [18:42:11.502] base::withCallingHandlers({ [18:42:11.502] ...future.value <- base::withVisible(base::local({ [18:42:11.502] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:11.502] if (!identical(...future.globals.maxSize.org, [18:42:11.502] ...future.globals.maxSize)) { [18:42:11.502] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:11.502] on.exit(options(oopts), add = TRUE) [18:42:11.502] } [18:42:11.502] { [18:42:11.502] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:11.502] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:11.502] USE.NAMES = FALSE) [18:42:11.502] do.call(mapply, args = args) [18:42:11.502] } [18:42:11.502] })) [18:42:11.502] future::FutureResult(value = ...future.value$value, [18:42:11.502] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:11.502] ...future.rng), globalenv = if (FALSE) [18:42:11.502] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:11.502] ...future.globalenv.names)) [18:42:11.502] else NULL, started = ...future.startTime, version = "1.8") [18:42:11.502] }, condition = base::local({ [18:42:11.502] c <- base::c [18:42:11.502] inherits <- base::inherits [18:42:11.502] invokeRestart <- base::invokeRestart [18:42:11.502] length <- base::length [18:42:11.502] list <- base::list [18:42:11.502] seq.int <- base::seq.int [18:42:11.502] signalCondition <- base::signalCondition [18:42:11.502] sys.calls <- base::sys.calls [18:42:11.502] `[[` <- base::`[[` [18:42:11.502] `+` <- base::`+` [18:42:11.502] `<<-` <- base::`<<-` [18:42:11.502] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:11.502] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:11.502] 3L)] [18:42:11.502] } [18:42:11.502] function(cond) { [18:42:11.502] is_error <- inherits(cond, "error") [18:42:11.502] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:11.502] NULL) [18:42:11.502] if (is_error) { [18:42:11.502] sessionInformation <- function() { [18:42:11.502] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:11.502] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:11.502] search = base::search(), system = base::Sys.info()) [18:42:11.502] } [18:42:11.502] ...future.conditions[[length(...future.conditions) + [18:42:11.502] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:11.502] cond$call), session = sessionInformation(), [18:42:11.502] timestamp = base::Sys.time(), signaled = 0L) [18:42:11.502] signalCondition(cond) [18:42:11.502] } [18:42:11.502] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:11.502] "immediateCondition"))) { [18:42:11.502] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:11.502] ...future.conditions[[length(...future.conditions) + [18:42:11.502] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:11.502] if (TRUE && !signal) { [18:42:11.502] muffleCondition <- function (cond, pattern = "^muffle") [18:42:11.502] { [18:42:11.502] inherits <- base::inherits [18:42:11.502] invokeRestart <- base::invokeRestart [18:42:11.502] is.null <- base::is.null [18:42:11.502] muffled <- FALSE [18:42:11.502] if (inherits(cond, "message")) { [18:42:11.502] muffled <- grepl(pattern, "muffleMessage") [18:42:11.502] if (muffled) [18:42:11.502] invokeRestart("muffleMessage") [18:42:11.502] } [18:42:11.502] else if (inherits(cond, "warning")) { [18:42:11.502] muffled <- grepl(pattern, "muffleWarning") [18:42:11.502] if (muffled) [18:42:11.502] invokeRestart("muffleWarning") [18:42:11.502] } [18:42:11.502] else if (inherits(cond, "condition")) { [18:42:11.502] if (!is.null(pattern)) { [18:42:11.502] computeRestarts <- base::computeRestarts [18:42:11.502] grepl <- base::grepl [18:42:11.502] restarts <- computeRestarts(cond) [18:42:11.502] for (restart in restarts) { [18:42:11.502] name <- restart$name [18:42:11.502] if (is.null(name)) [18:42:11.502] next [18:42:11.502] if (!grepl(pattern, name)) [18:42:11.502] next [18:42:11.502] invokeRestart(restart) [18:42:11.502] muffled <- TRUE [18:42:11.502] break [18:42:11.502] } [18:42:11.502] } [18:42:11.502] } [18:42:11.502] invisible(muffled) [18:42:11.502] } [18:42:11.502] muffleCondition(cond, pattern = "^muffle") [18:42:11.502] } [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] if (TRUE) { [18:42:11.502] muffleCondition <- function (cond, pattern = "^muffle") [18:42:11.502] { [18:42:11.502] inherits <- base::inherits [18:42:11.502] invokeRestart <- base::invokeRestart [18:42:11.502] is.null <- base::is.null [18:42:11.502] muffled <- FALSE [18:42:11.502] if (inherits(cond, "message")) { [18:42:11.502] muffled <- grepl(pattern, "muffleMessage") [18:42:11.502] if (muffled) [18:42:11.502] invokeRestart("muffleMessage") [18:42:11.502] } [18:42:11.502] else if (inherits(cond, "warning")) { [18:42:11.502] muffled <- grepl(pattern, "muffleWarning") [18:42:11.502] if (muffled) [18:42:11.502] invokeRestart("muffleWarning") [18:42:11.502] } [18:42:11.502] else if (inherits(cond, "condition")) { [18:42:11.502] if (!is.null(pattern)) { [18:42:11.502] computeRestarts <- base::computeRestarts [18:42:11.502] grepl <- base::grepl [18:42:11.502] restarts <- computeRestarts(cond) [18:42:11.502] for (restart in restarts) { [18:42:11.502] name <- restart$name [18:42:11.502] if (is.null(name)) [18:42:11.502] next [18:42:11.502] if (!grepl(pattern, name)) [18:42:11.502] next [18:42:11.502] invokeRestart(restart) [18:42:11.502] muffled <- TRUE [18:42:11.502] break [18:42:11.502] } [18:42:11.502] } [18:42:11.502] } [18:42:11.502] invisible(muffled) [18:42:11.502] } [18:42:11.502] muffleCondition(cond, pattern = "^muffle") [18:42:11.502] } [18:42:11.502] } [18:42:11.502] } [18:42:11.502] })) [18:42:11.502] }, error = function(ex) { [18:42:11.502] base::structure(base::list(value = NULL, visible = NULL, [18:42:11.502] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:11.502] ...future.rng), started = ...future.startTime, [18:42:11.502] finished = Sys.time(), session_uuid = NA_character_, [18:42:11.502] version = "1.8"), class = "FutureResult") [18:42:11.502] }, finally = { [18:42:11.502] if (!identical(...future.workdir, getwd())) [18:42:11.502] setwd(...future.workdir) [18:42:11.502] { [18:42:11.502] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:11.502] ...future.oldOptions$nwarnings <- NULL [18:42:11.502] } [18:42:11.502] base::options(...future.oldOptions) [18:42:11.502] if (.Platform$OS.type == "windows") { [18:42:11.502] old_names <- names(...future.oldEnvVars) [18:42:11.502] envs <- base::Sys.getenv() [18:42:11.502] names <- names(envs) [18:42:11.502] common <- intersect(names, old_names) [18:42:11.502] added <- setdiff(names, old_names) [18:42:11.502] removed <- setdiff(old_names, names) [18:42:11.502] changed <- common[...future.oldEnvVars[common] != [18:42:11.502] envs[common]] [18:42:11.502] NAMES <- toupper(changed) [18:42:11.502] args <- list() [18:42:11.502] for (kk in seq_along(NAMES)) { [18:42:11.502] name <- changed[[kk]] [18:42:11.502] NAME <- NAMES[[kk]] [18:42:11.502] if (name != NAME && is.element(NAME, old_names)) [18:42:11.502] next [18:42:11.502] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:11.502] } [18:42:11.502] NAMES <- toupper(added) [18:42:11.502] for (kk in seq_along(NAMES)) { [18:42:11.502] name <- added[[kk]] [18:42:11.502] NAME <- NAMES[[kk]] [18:42:11.502] if (name != NAME && is.element(NAME, old_names)) [18:42:11.502] next [18:42:11.502] args[[name]] <- "" [18:42:11.502] } [18:42:11.502] NAMES <- toupper(removed) [18:42:11.502] for (kk in seq_along(NAMES)) { [18:42:11.502] name <- removed[[kk]] [18:42:11.502] NAME <- NAMES[[kk]] [18:42:11.502] if (name != NAME && is.element(NAME, old_names)) [18:42:11.502] next [18:42:11.502] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:11.502] } [18:42:11.502] if (length(args) > 0) [18:42:11.502] base::do.call(base::Sys.setenv, args = args) [18:42:11.502] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:11.502] } [18:42:11.502] { [18:42:11.502] if (base::length(...future.futureOptionsAdded) > [18:42:11.502] 0L) { [18:42:11.502] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:11.502] base::names(opts) <- ...future.futureOptionsAdded [18:42:11.502] base::options(opts) [18:42:11.502] } [18:42:11.502] { [18:42:11.502] { [18:42:11.502] NULL [18:42:11.502] RNGkind("Mersenne-Twister") [18:42:11.502] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:11.502] inherits = FALSE) [18:42:11.502] } [18:42:11.502] options(future.plan = NULL) [18:42:11.502] if (is.na(NA_character_)) [18:42:11.502] Sys.unsetenv("R_FUTURE_PLAN") [18:42:11.502] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:11.502] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:11.502] .init = FALSE) [18:42:11.502] } [18:42:11.502] } [18:42:11.502] } [18:42:11.502] }) [18:42:11.502] if (TRUE) { [18:42:11.502] base::sink(type = "output", split = FALSE) [18:42:11.502] if (TRUE) { [18:42:11.502] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:11.502] } [18:42:11.502] else { [18:42:11.502] ...future.result["stdout"] <- base::list(NULL) [18:42:11.502] } [18:42:11.502] base::close(...future.stdout) [18:42:11.502] ...future.stdout <- NULL [18:42:11.502] } [18:42:11.502] ...future.result$conditions <- ...future.conditions [18:42:11.502] ...future.result$finished <- base::Sys.time() [18:42:11.502] ...future.result [18:42:11.502] } [18:42:11.509] assign_globals() ... [18:42:11.510] List of 5 [18:42:11.510] $ ...future.FUN :function (x, y) [18:42:11.510] $ MoreArgs : NULL [18:42:11.510] $ ...future.elements_ii :List of 2 [18:42:11.510] ..$ :List of 2 [18:42:11.510] .. ..$ : int 1 [18:42:11.510] .. ..$ : int 0 [18:42:11.510] ..$ :List of 2 [18:42:11.510] .. ..$ : int 0 [18:42:11.510] .. ..$ : int 1 [18:42:11.510] $ ...future.seeds_ii : NULL [18:42:11.510] $ ...future.globals.maxSize: NULL [18:42:11.510] - attr(*, "where")=List of 5 [18:42:11.510] ..$ ...future.FUN : [18:42:11.510] ..$ MoreArgs : [18:42:11.510] ..$ ...future.elements_ii : [18:42:11.510] ..$ ...future.seeds_ii : [18:42:11.510] ..$ ...future.globals.maxSize: [18:42:11.510] - attr(*, "resolved")= logi FALSE [18:42:11.510] - attr(*, "total_size")= int 1242 [18:42:11.510] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:11.510] - attr(*, "already-done")= logi TRUE [18:42:11.526] - reassign environment for '...future.FUN' [18:42:11.527] - copied '...future.FUN' to environment [18:42:11.527] - copied 'MoreArgs' to environment [18:42:11.528] - copied '...future.elements_ii' to environment [18:42:11.528] - copied '...future.seeds_ii' to environment [18:42:11.528] - copied '...future.globals.maxSize' to environment [18:42:11.529] assign_globals() ... done [18:42:11.530] plan(): Setting new future strategy stack: [18:42:11.530] List of future strategies: [18:42:11.530] 1. sequential: [18:42:11.530] - args: function (..., envir = parent.frame(), workers = "") [18:42:11.530] - tweaked: FALSE [18:42:11.530] - call: NULL [18:42:11.531] plan(): nbrOfWorkers() = 1 [18:42:12.040] plan(): Setting new future strategy stack: [18:42:12.041] List of future strategies: [18:42:12.041] 1. sequential: [18:42:12.041] - args: function (..., envir = parent.frame(), workers = "") [18:42:12.041] - tweaked: FALSE [18:42:12.041] - call: plan(strategy) [18:42:12.042] plan(): nbrOfWorkers() = 1 [18:42:12.043] SequentialFuture started (and completed) [18:42:12.043] - Launch lazy future ... done [18:42:12.044] run() for 'SequentialFuture' ... done [18:42:12.044] Created future: [18:42:12.044] SequentialFuture: [18:42:12.044] Label: 'future_mapply-1' [18:42:12.044] Expression: [18:42:12.044] { [18:42:12.044] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:12.044] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:12.044] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:12.044] on.exit(options(oopts), add = TRUE) [18:42:12.044] } [18:42:12.044] { [18:42:12.044] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:12.044] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:12.044] do.call(mapply, args = args) [18:42:12.044] } [18:42:12.044] } [18:42:12.044] Lazy evaluation: FALSE [18:42:12.044] Asynchronous evaluation: FALSE [18:42:12.044] Local evaluation: TRUE [18:42:12.044] Environment: R_GlobalEnv [18:42:12.044] Capture standard output: TRUE [18:42:12.044] Capture condition classes: 'condition' (excluding 'nothing') [18:42:12.044] Globals: 5 objects totaling 1.21 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 95 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:12.044] Packages: [18:42:12.044] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:12.044] Resolved: TRUE [18:42:12.044] Value: 184 bytes of class 'list' [18:42:12.044] Early signaling: FALSE [18:42:12.044] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:12.044] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:12.120] Chunk #1 of 1 ... DONE [18:42:12.120] Launching 1 futures (chunks) ... DONE [18:42:12.120] Resolving 1 futures (chunks) ... [18:42:12.121] resolve() on list ... [18:42:12.121] recursive: 0 [18:42:12.121] length: 1 [18:42:12.122] [18:42:12.122] resolved() for 'SequentialFuture' ... [18:42:12.123] - state: 'finished' [18:42:12.123] - run: TRUE [18:42:12.123] - result: 'FutureResult' [18:42:12.124] resolved() for 'SequentialFuture' ... done [18:42:12.124] Future #1 [18:42:12.124] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:12.125] - nx: 1 [18:42:12.125] - relay: TRUE [18:42:12.125] - stdout: TRUE [18:42:12.126] - signal: TRUE [18:42:12.126] - resignal: FALSE [18:42:12.126] - force: TRUE [18:42:12.126] - relayed: [n=1] FALSE [18:42:12.127] - queued futures: [n=1] FALSE [18:42:12.127] - until=1 [18:42:12.127] - relaying element #1 [18:42:12.128] - relayed: [n=1] TRUE [18:42:12.128] - queued futures: [n=1] TRUE [18:42:12.128] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:12.129] length: 0 (resolved future 1) [18:42:12.129] Relaying remaining futures [18:42:12.129] signalConditionsASAP(NULL, pos=0) ... [18:42:12.130] - nx: 1 [18:42:12.130] - relay: TRUE [18:42:12.130] - stdout: TRUE [18:42:12.130] - signal: TRUE [18:42:12.131] - resignal: FALSE [18:42:12.131] - force: TRUE [18:42:12.131] - relayed: [n=1] TRUE [18:42:12.131] - queued futures: [n=1] TRUE - flush all [18:42:12.132] - relayed: [n=1] TRUE [18:42:12.132] - queued futures: [n=1] TRUE [18:42:12.132] signalConditionsASAP(NULL, pos=0) ... done [18:42:12.133] resolve() on list ... DONE [18:42:12.133] - Number of value chunks collected: 1 [18:42:12.133] Resolving 1 futures (chunks) ... DONE [18:42:12.134] Reducing values from 1 chunks ... [18:42:12.134] - Number of values collected after concatenation: 2 [18:42:12.134] - Number of values expected: 2 [18:42:12.135] Reducing values from 1 chunks ... DONE [18:42:12.135] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = TRUE) ... DONE * future_mapply(x, ..., future.stdout = NA) ... [18:42:12.136] future_mapply() ... [18:42:12.136] Number of chunks: 1 [18:42:12.137] getGlobalsAndPackagesXApply() ... [18:42:12.137] - future.globals: TRUE [18:42:12.137] getGlobalsAndPackages() ... [18:42:12.138] Searching for globals... [18:42:12.142] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:12.142] Searching for globals ... DONE [18:42:12.142] Resolving globals: FALSE [18:42:12.143] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:12.144] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:12.145] - globals: [1] 'FUN' [18:42:12.145] [18:42:12.145] getGlobalsAndPackages() ... DONE [18:42:12.145] - globals found/used: [n=1] 'FUN' [18:42:12.146] - needed namespaces: [n=0] [18:42:12.146] Finding globals ... DONE [18:42:12.147] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:12.147] List of 2 [18:42:12.147] $ ...future.FUN:function (x, y) [18:42:12.147] $ MoreArgs : NULL [18:42:12.147] - attr(*, "where")=List of 2 [18:42:12.147] ..$ ...future.FUN: [18:42:12.147] ..$ MoreArgs : [18:42:12.147] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:12.147] - attr(*, "resolved")= logi FALSE [18:42:12.147] - attr(*, "total_size")= num NA [18:42:12.153] Packages to be attached in all futures: [n=0] [18:42:12.154] getGlobalsAndPackagesXApply() ... DONE [18:42:12.154] Number of futures (= number of chunks): 1 [18:42:12.155] Launching 1 futures (chunks) ... [18:42:12.155] Chunk #1 of 1 ... [18:42:12.156] - Finding globals in '...' for chunk #1 ... [18:42:12.156] getGlobalsAndPackages() ... [18:42:12.156] Searching for globals... [18:42:12.157] [18:42:12.157] Searching for globals ... DONE [18:42:12.158] - globals: [0] [18:42:12.158] getGlobalsAndPackages() ... DONE [18:42:12.158] + additional globals found: [n=0] [18:42:12.159] + additional namespaces needed: [n=0] [18:42:12.159] - Finding globals in '...' for chunk #1 ... DONE [18:42:12.159] - seeds: [18:42:12.159] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:12.160] getGlobalsAndPackages() ... [18:42:12.160] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:12.161] Resolving globals: FALSE [18:42:12.162] The total size of the 5 globals is 1.21 KiB (1242 bytes) [18:42:12.163] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (95 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:12.163] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:12.164] [18:42:12.164] getGlobalsAndPackages() ... DONE [18:42:12.165] run() for 'Future' ... [18:42:12.165] - state: 'created' [18:42:12.166] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:42:12.166] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:12.167] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:12.167] - Field: 'label' [18:42:12.167] - Field: 'local' [18:42:12.168] - Field: 'owner' [18:42:12.168] - Field: 'envir' [18:42:12.168] - Field: 'packages' [18:42:12.169] - Field: 'gc' [18:42:12.169] - Field: 'conditions' [18:42:12.169] - Field: 'expr' [18:42:12.170] - Field: 'uuid' [18:42:12.170] - Field: 'seed' [18:42:12.172] - Field: 'version' [18:42:12.173] - Field: 'result' [18:42:12.173] - Field: 'asynchronous' [18:42:12.173] - Field: 'calls' [18:42:12.174] - Field: 'globals' [18:42:12.174] - Field: 'stdout' [18:42:12.174] - Field: 'earlySignal' [18:42:12.175] - Field: 'lazy' [18:42:12.175] - Field: 'state' [18:42:12.175] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:12.175] - Launch lazy future ... [18:42:12.176] Packages needed by the future expression (n = 0): [18:42:12.176] Packages needed by future strategies (n = 0): [18:42:12.177] { [18:42:12.177] { [18:42:12.177] { [18:42:12.177] ...future.startTime <- base::Sys.time() [18:42:12.177] { [18:42:12.177] { [18:42:12.177] { [18:42:12.177] base::local({ [18:42:12.177] has_future <- base::requireNamespace("future", [18:42:12.177] quietly = TRUE) [18:42:12.177] if (has_future) { [18:42:12.177] ns <- base::getNamespace("future") [18:42:12.177] version <- ns[[".package"]][["version"]] [18:42:12.177] if (is.null(version)) [18:42:12.177] version <- utils::packageVersion("future") [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] version <- NULL [18:42:12.177] } [18:42:12.177] if (!has_future || version < "1.8.0") { [18:42:12.177] info <- base::c(r_version = base::gsub("R version ", [18:42:12.177] "", base::R.version$version.string), [18:42:12.177] platform = base::sprintf("%s (%s-bit)", [18:42:12.177] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:12.177] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:12.177] "release", "version")], collapse = " "), [18:42:12.177] hostname = base::Sys.info()[["nodename"]]) [18:42:12.177] info <- base::sprintf("%s: %s", base::names(info), [18:42:12.177] info) [18:42:12.177] info <- base::paste(info, collapse = "; ") [18:42:12.177] if (!has_future) { [18:42:12.177] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:12.177] info) [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:12.177] info, version) [18:42:12.177] } [18:42:12.177] base::stop(msg) [18:42:12.177] } [18:42:12.177] }) [18:42:12.177] } [18:42:12.177] ...future.strategy.old <- future::plan("list") [18:42:12.177] options(future.plan = NULL) [18:42:12.177] Sys.unsetenv("R_FUTURE_PLAN") [18:42:12.177] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:12.177] } [18:42:12.177] ...future.workdir <- getwd() [18:42:12.177] } [18:42:12.177] ...future.oldOptions <- base::as.list(base::.Options) [18:42:12.177] ...future.oldEnvVars <- base::Sys.getenv() [18:42:12.177] } [18:42:12.177] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:12.177] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:12.177] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:12.177] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:12.177] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:12.177] future.stdout.windows.reencode = NULL, width = 80L) [18:42:12.177] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:12.177] base::names(...future.oldOptions)) [18:42:12.177] } [18:42:12.177] if (TRUE) { [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] if (NA) { [18:42:12.177] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:12.177] open = "w") [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:12.177] windows = "NUL", "/dev/null"), open = "w") [18:42:12.177] } [18:42:12.177] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:12.177] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:12.177] base::sink(type = "output", split = FALSE) [18:42:12.177] base::close(...future.stdout) [18:42:12.177] }, add = TRUE) [18:42:12.177] } [18:42:12.177] ...future.frame <- base::sys.nframe() [18:42:12.177] ...future.conditions <- base::list() [18:42:12.177] ...future.rng <- base::globalenv()$.Random.seed [18:42:12.177] if (FALSE) { [18:42:12.177] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:12.177] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:12.177] } [18:42:12.177] ...future.result <- base::tryCatch({ [18:42:12.177] base::withCallingHandlers({ [18:42:12.177] ...future.value <- base::withVisible(base::local({ [18:42:12.177] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:12.177] if (!identical(...future.globals.maxSize.org, [18:42:12.177] ...future.globals.maxSize)) { [18:42:12.177] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:12.177] on.exit(options(oopts), add = TRUE) [18:42:12.177] } [18:42:12.177] { [18:42:12.177] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:12.177] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:12.177] USE.NAMES = FALSE) [18:42:12.177] do.call(mapply, args = args) [18:42:12.177] } [18:42:12.177] })) [18:42:12.177] future::FutureResult(value = ...future.value$value, [18:42:12.177] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:12.177] ...future.rng), globalenv = if (FALSE) [18:42:12.177] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:12.177] ...future.globalenv.names)) [18:42:12.177] else NULL, started = ...future.startTime, version = "1.8") [18:42:12.177] }, condition = base::local({ [18:42:12.177] c <- base::c [18:42:12.177] inherits <- base::inherits [18:42:12.177] invokeRestart <- base::invokeRestart [18:42:12.177] length <- base::length [18:42:12.177] list <- base::list [18:42:12.177] seq.int <- base::seq.int [18:42:12.177] signalCondition <- base::signalCondition [18:42:12.177] sys.calls <- base::sys.calls [18:42:12.177] `[[` <- base::`[[` [18:42:12.177] `+` <- base::`+` [18:42:12.177] `<<-` <- base::`<<-` [18:42:12.177] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:12.177] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:12.177] 3L)] [18:42:12.177] } [18:42:12.177] function(cond) { [18:42:12.177] is_error <- inherits(cond, "error") [18:42:12.177] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:12.177] NULL) [18:42:12.177] if (is_error) { [18:42:12.177] sessionInformation <- function() { [18:42:12.177] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:12.177] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:12.177] search = base::search(), system = base::Sys.info()) [18:42:12.177] } [18:42:12.177] ...future.conditions[[length(...future.conditions) + [18:42:12.177] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:12.177] cond$call), session = sessionInformation(), [18:42:12.177] timestamp = base::Sys.time(), signaled = 0L) [18:42:12.177] signalCondition(cond) [18:42:12.177] } [18:42:12.177] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:12.177] "immediateCondition"))) { [18:42:12.177] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:12.177] ...future.conditions[[length(...future.conditions) + [18:42:12.177] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:12.177] if (TRUE && !signal) { [18:42:12.177] muffleCondition <- function (cond, pattern = "^muffle") [18:42:12.177] { [18:42:12.177] inherits <- base::inherits [18:42:12.177] invokeRestart <- base::invokeRestart [18:42:12.177] is.null <- base::is.null [18:42:12.177] muffled <- FALSE [18:42:12.177] if (inherits(cond, "message")) { [18:42:12.177] muffled <- grepl(pattern, "muffleMessage") [18:42:12.177] if (muffled) [18:42:12.177] invokeRestart("muffleMessage") [18:42:12.177] } [18:42:12.177] else if (inherits(cond, "warning")) { [18:42:12.177] muffled <- grepl(pattern, "muffleWarning") [18:42:12.177] if (muffled) [18:42:12.177] invokeRestart("muffleWarning") [18:42:12.177] } [18:42:12.177] else if (inherits(cond, "condition")) { [18:42:12.177] if (!is.null(pattern)) { [18:42:12.177] computeRestarts <- base::computeRestarts [18:42:12.177] grepl <- base::grepl [18:42:12.177] restarts <- computeRestarts(cond) [18:42:12.177] for (restart in restarts) { [18:42:12.177] name <- restart$name [18:42:12.177] if (is.null(name)) [18:42:12.177] next [18:42:12.177] if (!grepl(pattern, name)) [18:42:12.177] next [18:42:12.177] invokeRestart(restart) [18:42:12.177] muffled <- TRUE [18:42:12.177] break [18:42:12.177] } [18:42:12.177] } [18:42:12.177] } [18:42:12.177] invisible(muffled) [18:42:12.177] } [18:42:12.177] muffleCondition(cond, pattern = "^muffle") [18:42:12.177] } [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] if (TRUE) { [18:42:12.177] muffleCondition <- function (cond, pattern = "^muffle") [18:42:12.177] { [18:42:12.177] inherits <- base::inherits [18:42:12.177] invokeRestart <- base::invokeRestart [18:42:12.177] is.null <- base::is.null [18:42:12.177] muffled <- FALSE [18:42:12.177] if (inherits(cond, "message")) { [18:42:12.177] muffled <- grepl(pattern, "muffleMessage") [18:42:12.177] if (muffled) [18:42:12.177] invokeRestart("muffleMessage") [18:42:12.177] } [18:42:12.177] else if (inherits(cond, "warning")) { [18:42:12.177] muffled <- grepl(pattern, "muffleWarning") [18:42:12.177] if (muffled) [18:42:12.177] invokeRestart("muffleWarning") [18:42:12.177] } [18:42:12.177] else if (inherits(cond, "condition")) { [18:42:12.177] if (!is.null(pattern)) { [18:42:12.177] computeRestarts <- base::computeRestarts [18:42:12.177] grepl <- base::grepl [18:42:12.177] restarts <- computeRestarts(cond) [18:42:12.177] for (restart in restarts) { [18:42:12.177] name <- restart$name [18:42:12.177] if (is.null(name)) [18:42:12.177] next [18:42:12.177] if (!grepl(pattern, name)) [18:42:12.177] next [18:42:12.177] invokeRestart(restart) [18:42:12.177] muffled <- TRUE [18:42:12.177] break [18:42:12.177] } [18:42:12.177] } [18:42:12.177] } [18:42:12.177] invisible(muffled) [18:42:12.177] } [18:42:12.177] muffleCondition(cond, pattern = "^muffle") [18:42:12.177] } [18:42:12.177] } [18:42:12.177] } [18:42:12.177] })) [18:42:12.177] }, error = function(ex) { [18:42:12.177] base::structure(base::list(value = NULL, visible = NULL, [18:42:12.177] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:12.177] ...future.rng), started = ...future.startTime, [18:42:12.177] finished = Sys.time(), session_uuid = NA_character_, [18:42:12.177] version = "1.8"), class = "FutureResult") [18:42:12.177] }, finally = { [18:42:12.177] if (!identical(...future.workdir, getwd())) [18:42:12.177] setwd(...future.workdir) [18:42:12.177] { [18:42:12.177] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:12.177] ...future.oldOptions$nwarnings <- NULL [18:42:12.177] } [18:42:12.177] base::options(...future.oldOptions) [18:42:12.177] if (.Platform$OS.type == "windows") { [18:42:12.177] old_names <- names(...future.oldEnvVars) [18:42:12.177] envs <- base::Sys.getenv() [18:42:12.177] names <- names(envs) [18:42:12.177] common <- intersect(names, old_names) [18:42:12.177] added <- setdiff(names, old_names) [18:42:12.177] removed <- setdiff(old_names, names) [18:42:12.177] changed <- common[...future.oldEnvVars[common] != [18:42:12.177] envs[common]] [18:42:12.177] NAMES <- toupper(changed) [18:42:12.177] args <- list() [18:42:12.177] for (kk in seq_along(NAMES)) { [18:42:12.177] name <- changed[[kk]] [18:42:12.177] NAME <- NAMES[[kk]] [18:42:12.177] if (name != NAME && is.element(NAME, old_names)) [18:42:12.177] next [18:42:12.177] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:12.177] } [18:42:12.177] NAMES <- toupper(added) [18:42:12.177] for (kk in seq_along(NAMES)) { [18:42:12.177] name <- added[[kk]] [18:42:12.177] NAME <- NAMES[[kk]] [18:42:12.177] if (name != NAME && is.element(NAME, old_names)) [18:42:12.177] next [18:42:12.177] args[[name]] <- "" [18:42:12.177] } [18:42:12.177] NAMES <- toupper(removed) [18:42:12.177] for (kk in seq_along(NAMES)) { [18:42:12.177] name <- removed[[kk]] [18:42:12.177] NAME <- NAMES[[kk]] [18:42:12.177] if (name != NAME && is.element(NAME, old_names)) [18:42:12.177] next [18:42:12.177] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:12.177] } [18:42:12.177] if (length(args) > 0) [18:42:12.177] base::do.call(base::Sys.setenv, args = args) [18:42:12.177] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:12.177] } [18:42:12.177] { [18:42:12.177] if (base::length(...future.futureOptionsAdded) > [18:42:12.177] 0L) { [18:42:12.177] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:12.177] base::names(opts) <- ...future.futureOptionsAdded [18:42:12.177] base::options(opts) [18:42:12.177] } [18:42:12.177] { [18:42:12.177] { [18:42:12.177] NULL [18:42:12.177] RNGkind("Mersenne-Twister") [18:42:12.177] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:12.177] inherits = FALSE) [18:42:12.177] } [18:42:12.177] options(future.plan = NULL) [18:42:12.177] if (is.na(NA_character_)) [18:42:12.177] Sys.unsetenv("R_FUTURE_PLAN") [18:42:12.177] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:12.177] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:12.177] .init = FALSE) [18:42:12.177] } [18:42:12.177] } [18:42:12.177] } [18:42:12.177] }) [18:42:12.177] if (FALSE) { [18:42:12.177] base::sink(type = "output", split = FALSE) [18:42:12.177] if (NA) { [18:42:12.177] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:12.177] } [18:42:12.177] else { [18:42:12.177] ...future.result["stdout"] <- base::list(NULL) [18:42:12.177] } [18:42:12.177] base::close(...future.stdout) [18:42:12.177] ...future.stdout <- NULL [18:42:12.177] } [18:42:12.177] ...future.result$conditions <- ...future.conditions [18:42:12.177] ...future.result$finished <- base::Sys.time() [18:42:12.177] ...future.result [18:42:12.177] } [18:42:12.184] assign_globals() ... [18:42:12.185] List of 5 [18:42:12.185] $ ...future.FUN :function (x, y) [18:42:12.185] $ MoreArgs : NULL [18:42:12.185] $ ...future.elements_ii :List of 2 [18:42:12.185] ..$ :List of 2 [18:42:12.185] .. ..$ : int 1 [18:42:12.185] .. ..$ : int 0 [18:42:12.185] ..$ :List of 2 [18:42:12.185] .. ..$ : int 0 [18:42:12.185] .. ..$ : int 1 [18:42:12.185] $ ...future.seeds_ii : NULL [18:42:12.185] $ ...future.globals.maxSize: NULL [18:42:12.185] - attr(*, "where")=List of 5 [18:42:12.185] ..$ ...future.FUN : [18:42:12.185] ..$ MoreArgs : [18:42:12.185] ..$ ...future.elements_ii : [18:42:12.185] ..$ ...future.seeds_ii : [18:42:12.185] ..$ ...future.globals.maxSize: [18:42:12.185] - attr(*, "resolved")= logi FALSE [18:42:12.185] - attr(*, "total_size")= int 1242 [18:42:12.185] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:12.185] - attr(*, "already-done")= logi TRUE [18:42:12.198] - reassign environment for '...future.FUN' [18:42:12.198] - copied '...future.FUN' to environment [18:42:12.198] - copied 'MoreArgs' to environment [18:42:12.199] - copied '...future.elements_ii' to environment [18:42:12.199] - copied '...future.seeds_ii' to environment [18:42:12.199] - copied '...future.globals.maxSize' to environment [18:42:12.199] assign_globals() ... done [18:42:12.200] plan(): Setting new future strategy stack: [18:42:12.201] List of future strategies: [18:42:12.201] 1. sequential: [18:42:12.201] - args: function (..., envir = parent.frame(), workers = "") [18:42:12.201] - tweaked: FALSE [18:42:12.201] - call: NULL [18:42:12.202] plan(): nbrOfWorkers() = 1 [18:42:12.711] plan(): Setting new future strategy stack: [18:42:12.711] List of future strategies: [18:42:12.711] 1. sequential: [18:42:12.711] - args: function (..., envir = parent.frame(), workers = "") [18:42:12.711] - tweaked: FALSE [18:42:12.711] - call: plan(strategy) [18:42:12.712] plan(): nbrOfWorkers() = 1 [18:42:12.713] SequentialFuture started (and completed) [18:42:12.713] - Launch lazy future ... done [18:42:12.713] run() for 'SequentialFuture' ... done [18:42:12.713] Created future: [18:42:12.713] SequentialFuture: [18:42:12.713] Label: 'future_mapply-1' [18:42:12.713] Expression: [18:42:12.713] { [18:42:12.713] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:12.713] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:12.713] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:12.713] on.exit(options(oopts), add = TRUE) [18:42:12.713] } [18:42:12.713] { [18:42:12.713] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:12.713] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:12.713] do.call(mapply, args = args) [18:42:12.713] } [18:42:12.713] } [18:42:12.713] Lazy evaluation: FALSE [18:42:12.713] Asynchronous evaluation: FALSE [18:42:12.713] Local evaluation: TRUE [18:42:12.713] Environment: R_GlobalEnv [18:42:12.713] Capture standard output: NA [18:42:12.713] Capture condition classes: 'condition' (excluding 'nothing') [18:42:12.713] Globals: 5 objects totaling 1.21 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 95 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:12.713] Packages: [18:42:12.713] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:12.713] Resolved: TRUE [18:42:12.713] Value: 184 bytes of class 'list' [18:42:12.713] Early signaling: FALSE [18:42:12.713] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:12.713] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:12.715] Chunk #1 of 1 ... DONE [18:42:12.715] Launching 1 futures (chunks) ... DONE [18:42:12.715] Resolving 1 futures (chunks) ... [18:42:12.715] resolve() on list ... [18:42:12.715] recursive: 0 [18:42:12.716] length: 1 [18:42:12.716] [18:42:12.716] resolved() for 'SequentialFuture' ... [18:42:12.716] - state: 'finished' [18:42:12.716] - run: TRUE [18:42:12.716] - result: 'FutureResult' [18:42:12.717] resolved() for 'SequentialFuture' ... done [18:42:12.717] Future #1 [18:42:12.717] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:12.717] - nx: 1 [18:42:12.717] - relay: TRUE [18:42:12.718] - stdout: TRUE [18:42:12.718] - signal: TRUE [18:42:12.718] - resignal: FALSE [18:42:12.718] - force: TRUE [18:42:12.718] - relayed: [n=1] FALSE [18:42:12.718] - queued futures: [n=1] FALSE [18:42:12.718] - until=1 [18:42:12.719] - relaying element #1 [18:42:12.719] - relayed: [n=1] TRUE [18:42:12.719] - queued futures: [n=1] TRUE [18:42:12.719] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:12.719] length: 0 (resolved future 1) [18:42:12.720] Relaying remaining futures [18:42:12.720] signalConditionsASAP(NULL, pos=0) ... [18:42:12.720] - nx: 1 [18:42:12.720] - relay: TRUE [18:42:12.720] - stdout: TRUE [18:42:12.720] - signal: TRUE [18:42:12.721] - resignal: FALSE [18:42:12.721] - force: TRUE [18:42:12.721] - relayed: [n=1] TRUE [18:42:12.721] - queued futures: [n=1] TRUE - flush all [18:42:12.721] - relayed: [n=1] TRUE [18:42:12.721] - queued futures: [n=1] TRUE [18:42:12.722] signalConditionsASAP(NULL, pos=0) ... done [18:42:12.722] resolve() on list ... DONE [18:42:12.722] - Number of value chunks collected: 1 [18:42:12.722] Resolving 1 futures (chunks) ... DONE [18:42:12.722] Reducing values from 1 chunks ... [18:42:12.722] - Number of values collected after concatenation: 2 [18:42:12.723] - Number of values expected: 2 [18:42:12.723] Reducing values from 1 chunks ... DONE [18:42:12.723] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = NA) ... DONE * plan('sequential') ... DONE * plan('multisession') ... [18:42:12.725] plan(): Setting new future strategy stack: [18:42:12.726] List of future strategies: [18:42:12.726] 1. multisession: [18:42:12.726] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:12.726] - tweaked: FALSE [18:42:12.726] - call: plan(strategy) [18:42:12.726] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:42:12.726] multisession: [18:42:12.726] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:12.726] - tweaked: FALSE [18:42:12.726] - call: plan(strategy) [18:42:12.729] getGlobalsAndPackages() ... [18:42:12.729] Not searching for globals [18:42:12.730] - globals: [0] [18:42:12.730] getGlobalsAndPackages() ... DONE [18:42:12.730] Packages needed by the future expression (n = 0): [18:42:12.730] Packages needed by future strategies (n = 0): [18:42:12.731] { [18:42:12.731] { [18:42:12.731] { [18:42:12.731] ...future.startTime <- base::Sys.time() [18:42:12.731] { [18:42:12.731] { [18:42:12.731] { [18:42:12.731] base::local({ [18:42:12.731] has_future <- base::requireNamespace("future", [18:42:12.731] quietly = TRUE) [18:42:12.731] if (has_future) { [18:42:12.731] ns <- base::getNamespace("future") [18:42:12.731] version <- ns[[".package"]][["version"]] [18:42:12.731] if (is.null(version)) [18:42:12.731] version <- utils::packageVersion("future") [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] version <- NULL [18:42:12.731] } [18:42:12.731] if (!has_future || version < "1.8.0") { [18:42:12.731] info <- base::c(r_version = base::gsub("R version ", [18:42:12.731] "", base::R.version$version.string), [18:42:12.731] platform = base::sprintf("%s (%s-bit)", [18:42:12.731] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:12.731] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:12.731] "release", "version")], collapse = " "), [18:42:12.731] hostname = base::Sys.info()[["nodename"]]) [18:42:12.731] info <- base::sprintf("%s: %s", base::names(info), [18:42:12.731] info) [18:42:12.731] info <- base::paste(info, collapse = "; ") [18:42:12.731] if (!has_future) { [18:42:12.731] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:12.731] info) [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:12.731] info, version) [18:42:12.731] } [18:42:12.731] base::stop(msg) [18:42:12.731] } [18:42:12.731] }) [18:42:12.731] } [18:42:12.731] ...future.strategy.old <- future::plan("list") [18:42:12.731] options(future.plan = NULL) [18:42:12.731] Sys.unsetenv("R_FUTURE_PLAN") [18:42:12.731] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:12.731] } [18:42:12.731] ...future.workdir <- getwd() [18:42:12.731] } [18:42:12.731] ...future.oldOptions <- base::as.list(base::.Options) [18:42:12.731] ...future.oldEnvVars <- base::Sys.getenv() [18:42:12.731] } [18:42:12.731] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:12.731] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:12.731] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:12.731] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:12.731] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:12.731] future.stdout.windows.reencode = NULL, width = 80L) [18:42:12.731] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:12.731] base::names(...future.oldOptions)) [18:42:12.731] } [18:42:12.731] if (FALSE) { [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] if (TRUE) { [18:42:12.731] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:12.731] open = "w") [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:12.731] windows = "NUL", "/dev/null"), open = "w") [18:42:12.731] } [18:42:12.731] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:12.731] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:12.731] base::sink(type = "output", split = FALSE) [18:42:12.731] base::close(...future.stdout) [18:42:12.731] }, add = TRUE) [18:42:12.731] } [18:42:12.731] ...future.frame <- base::sys.nframe() [18:42:12.731] ...future.conditions <- base::list() [18:42:12.731] ...future.rng <- base::globalenv()$.Random.seed [18:42:12.731] if (FALSE) { [18:42:12.731] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:12.731] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:12.731] } [18:42:12.731] ...future.result <- base::tryCatch({ [18:42:12.731] base::withCallingHandlers({ [18:42:12.731] ...future.value <- base::withVisible(base::local(NA)) [18:42:12.731] future::FutureResult(value = ...future.value$value, [18:42:12.731] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:12.731] ...future.rng), globalenv = if (FALSE) [18:42:12.731] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:12.731] ...future.globalenv.names)) [18:42:12.731] else NULL, started = ...future.startTime, version = "1.8") [18:42:12.731] }, condition = base::local({ [18:42:12.731] c <- base::c [18:42:12.731] inherits <- base::inherits [18:42:12.731] invokeRestart <- base::invokeRestart [18:42:12.731] length <- base::length [18:42:12.731] list <- base::list [18:42:12.731] seq.int <- base::seq.int [18:42:12.731] signalCondition <- base::signalCondition [18:42:12.731] sys.calls <- base::sys.calls [18:42:12.731] `[[` <- base::`[[` [18:42:12.731] `+` <- base::`+` [18:42:12.731] `<<-` <- base::`<<-` [18:42:12.731] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:12.731] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:12.731] 3L)] [18:42:12.731] } [18:42:12.731] function(cond) { [18:42:12.731] is_error <- inherits(cond, "error") [18:42:12.731] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:12.731] NULL) [18:42:12.731] if (is_error) { [18:42:12.731] sessionInformation <- function() { [18:42:12.731] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:12.731] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:12.731] search = base::search(), system = base::Sys.info()) [18:42:12.731] } [18:42:12.731] ...future.conditions[[length(...future.conditions) + [18:42:12.731] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:12.731] cond$call), session = sessionInformation(), [18:42:12.731] timestamp = base::Sys.time(), signaled = 0L) [18:42:12.731] signalCondition(cond) [18:42:12.731] } [18:42:12.731] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:12.731] "immediateCondition"))) { [18:42:12.731] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:12.731] ...future.conditions[[length(...future.conditions) + [18:42:12.731] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:12.731] if (TRUE && !signal) { [18:42:12.731] muffleCondition <- function (cond, pattern = "^muffle") [18:42:12.731] { [18:42:12.731] inherits <- base::inherits [18:42:12.731] invokeRestart <- base::invokeRestart [18:42:12.731] is.null <- base::is.null [18:42:12.731] muffled <- FALSE [18:42:12.731] if (inherits(cond, "message")) { [18:42:12.731] muffled <- grepl(pattern, "muffleMessage") [18:42:12.731] if (muffled) [18:42:12.731] invokeRestart("muffleMessage") [18:42:12.731] } [18:42:12.731] else if (inherits(cond, "warning")) { [18:42:12.731] muffled <- grepl(pattern, "muffleWarning") [18:42:12.731] if (muffled) [18:42:12.731] invokeRestart("muffleWarning") [18:42:12.731] } [18:42:12.731] else if (inherits(cond, "condition")) { [18:42:12.731] if (!is.null(pattern)) { [18:42:12.731] computeRestarts <- base::computeRestarts [18:42:12.731] grepl <- base::grepl [18:42:12.731] restarts <- computeRestarts(cond) [18:42:12.731] for (restart in restarts) { [18:42:12.731] name <- restart$name [18:42:12.731] if (is.null(name)) [18:42:12.731] next [18:42:12.731] if (!grepl(pattern, name)) [18:42:12.731] next [18:42:12.731] invokeRestart(restart) [18:42:12.731] muffled <- TRUE [18:42:12.731] break [18:42:12.731] } [18:42:12.731] } [18:42:12.731] } [18:42:12.731] invisible(muffled) [18:42:12.731] } [18:42:12.731] muffleCondition(cond, pattern = "^muffle") [18:42:12.731] } [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] if (TRUE) { [18:42:12.731] muffleCondition <- function (cond, pattern = "^muffle") [18:42:12.731] { [18:42:12.731] inherits <- base::inherits [18:42:12.731] invokeRestart <- base::invokeRestart [18:42:12.731] is.null <- base::is.null [18:42:12.731] muffled <- FALSE [18:42:12.731] if (inherits(cond, "message")) { [18:42:12.731] muffled <- grepl(pattern, "muffleMessage") [18:42:12.731] if (muffled) [18:42:12.731] invokeRestart("muffleMessage") [18:42:12.731] } [18:42:12.731] else if (inherits(cond, "warning")) { [18:42:12.731] muffled <- grepl(pattern, "muffleWarning") [18:42:12.731] if (muffled) [18:42:12.731] invokeRestart("muffleWarning") [18:42:12.731] } [18:42:12.731] else if (inherits(cond, "condition")) { [18:42:12.731] if (!is.null(pattern)) { [18:42:12.731] computeRestarts <- base::computeRestarts [18:42:12.731] grepl <- base::grepl [18:42:12.731] restarts <- computeRestarts(cond) [18:42:12.731] for (restart in restarts) { [18:42:12.731] name <- restart$name [18:42:12.731] if (is.null(name)) [18:42:12.731] next [18:42:12.731] if (!grepl(pattern, name)) [18:42:12.731] next [18:42:12.731] invokeRestart(restart) [18:42:12.731] muffled <- TRUE [18:42:12.731] break [18:42:12.731] } [18:42:12.731] } [18:42:12.731] } [18:42:12.731] invisible(muffled) [18:42:12.731] } [18:42:12.731] muffleCondition(cond, pattern = "^muffle") [18:42:12.731] } [18:42:12.731] } [18:42:12.731] } [18:42:12.731] })) [18:42:12.731] }, error = function(ex) { [18:42:12.731] base::structure(base::list(value = NULL, visible = NULL, [18:42:12.731] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:12.731] ...future.rng), started = ...future.startTime, [18:42:12.731] finished = Sys.time(), session_uuid = NA_character_, [18:42:12.731] version = "1.8"), class = "FutureResult") [18:42:12.731] }, finally = { [18:42:12.731] if (!identical(...future.workdir, getwd())) [18:42:12.731] setwd(...future.workdir) [18:42:12.731] { [18:42:12.731] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:12.731] ...future.oldOptions$nwarnings <- NULL [18:42:12.731] } [18:42:12.731] base::options(...future.oldOptions) [18:42:12.731] if (.Platform$OS.type == "windows") { [18:42:12.731] old_names <- names(...future.oldEnvVars) [18:42:12.731] envs <- base::Sys.getenv() [18:42:12.731] names <- names(envs) [18:42:12.731] common <- intersect(names, old_names) [18:42:12.731] added <- setdiff(names, old_names) [18:42:12.731] removed <- setdiff(old_names, names) [18:42:12.731] changed <- common[...future.oldEnvVars[common] != [18:42:12.731] envs[common]] [18:42:12.731] NAMES <- toupper(changed) [18:42:12.731] args <- list() [18:42:12.731] for (kk in seq_along(NAMES)) { [18:42:12.731] name <- changed[[kk]] [18:42:12.731] NAME <- NAMES[[kk]] [18:42:12.731] if (name != NAME && is.element(NAME, old_names)) [18:42:12.731] next [18:42:12.731] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:12.731] } [18:42:12.731] NAMES <- toupper(added) [18:42:12.731] for (kk in seq_along(NAMES)) { [18:42:12.731] name <- added[[kk]] [18:42:12.731] NAME <- NAMES[[kk]] [18:42:12.731] if (name != NAME && is.element(NAME, old_names)) [18:42:12.731] next [18:42:12.731] args[[name]] <- "" [18:42:12.731] } [18:42:12.731] NAMES <- toupper(removed) [18:42:12.731] for (kk in seq_along(NAMES)) { [18:42:12.731] name <- removed[[kk]] [18:42:12.731] NAME <- NAMES[[kk]] [18:42:12.731] if (name != NAME && is.element(NAME, old_names)) [18:42:12.731] next [18:42:12.731] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:12.731] } [18:42:12.731] if (length(args) > 0) [18:42:12.731] base::do.call(base::Sys.setenv, args = args) [18:42:12.731] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:12.731] } [18:42:12.731] { [18:42:12.731] if (base::length(...future.futureOptionsAdded) > [18:42:12.731] 0L) { [18:42:12.731] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:12.731] base::names(opts) <- ...future.futureOptionsAdded [18:42:12.731] base::options(opts) [18:42:12.731] } [18:42:12.731] { [18:42:12.731] { [18:42:12.731] NULL [18:42:12.731] RNGkind("Mersenne-Twister") [18:42:12.731] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:12.731] inherits = FALSE) [18:42:12.731] } [18:42:12.731] options(future.plan = NULL) [18:42:12.731] if (is.na(NA_character_)) [18:42:12.731] Sys.unsetenv("R_FUTURE_PLAN") [18:42:12.731] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:12.731] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:12.731] .init = FALSE) [18:42:12.731] } [18:42:12.731] } [18:42:12.731] } [18:42:12.731] }) [18:42:12.731] if (TRUE) { [18:42:12.731] base::sink(type = "output", split = FALSE) [18:42:12.731] if (TRUE) { [18:42:12.731] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:12.731] } [18:42:12.731] else { [18:42:12.731] ...future.result["stdout"] <- base::list(NULL) [18:42:12.731] } [18:42:12.731] base::close(...future.stdout) [18:42:12.731] ...future.stdout <- NULL [18:42:12.731] } [18:42:12.731] ...future.result$conditions <- ...future.conditions [18:42:12.731] ...future.result$finished <- base::Sys.time() [18:42:12.731] ...future.result [18:42:12.731] } [18:42:12.735] plan(): Setting new future strategy stack: [18:42:12.735] List of future strategies: [18:42:12.735] 1. sequential: [18:42:12.735] - args: function (..., envir = parent.frame(), workers = "") [18:42:12.735] - tweaked: FALSE [18:42:12.735] - call: NULL [18:42:12.736] plan(): nbrOfWorkers() = 1 [18:42:12.737] plan(): Setting new future strategy stack: [18:42:12.737] List of future strategies: [18:42:12.737] 1. multisession: [18:42:12.737] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:12.737] - tweaked: FALSE [18:42:12.737] - call: plan(strategy) [18:42:12.740] plan(): nbrOfWorkers() = 1 [18:42:12.740] SequentialFuture started (and completed) [18:42:12.740] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:42:12.744] plan(): nbrOfWorkers() = 1 * future_lapply(x, ..., future.stdout = FALSE) ... [18:42:12.744] future_lapply() ... [18:42:12.747] Number of chunks: 1 [18:42:12.748] getGlobalsAndPackagesXApply() ... [18:42:12.748] - future.globals: TRUE [18:42:12.748] getGlobalsAndPackages() ... [18:42:12.748] Searching for globals... [18:42:12.750] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:12.750] Searching for globals ... DONE [18:42:12.751] Resolving globals: FALSE [18:42:12.751] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:12.752] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:12.752] - globals: [1] 'FUN' [18:42:12.752] [18:42:12.752] getGlobalsAndPackages() ... DONE [18:42:12.752] - globals found/used: [n=1] 'FUN' [18:42:12.753] - needed namespaces: [n=0] [18:42:12.753] Finding globals ... DONE [18:42:12.753] - use_args: TRUE [18:42:12.753] - Getting '...' globals ... [18:42:12.754] resolve() on list ... [18:42:12.754] recursive: 0 [18:42:12.754] length: 1 [18:42:12.754] elements: '...' [18:42:12.755] length: 0 (resolved future 1) [18:42:12.755] resolve() on list ... DONE [18:42:12.755] - '...' content: [n=0] [18:42:12.755] List of 1 [18:42:12.755] $ ...: list() [18:42:12.755] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:12.755] - attr(*, "where")=List of 1 [18:42:12.755] ..$ ...: [18:42:12.755] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:12.755] - attr(*, "resolved")= logi TRUE [18:42:12.755] - attr(*, "total_size")= num NA [18:42:12.759] - Getting '...' globals ... DONE [18:42:12.759] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:12.759] List of 2 [18:42:12.759] $ ...future.FUN:function (x) [18:42:12.759] $ ... : list() [18:42:12.759] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:12.759] - attr(*, "where")=List of 2 [18:42:12.759] ..$ ...future.FUN: [18:42:12.759] ..$ ... : [18:42:12.759] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:12.759] - attr(*, "resolved")= logi FALSE [18:42:12.759] - attr(*, "total_size")= int 5632 [18:42:12.765] Packages to be attached in all futures: [n=0] [18:42:12.766] getGlobalsAndPackagesXApply() ... DONE [18:42:12.766] Number of futures (= number of chunks): 1 [18:42:12.766] Launching 1 futures (chunks) ... [18:42:12.766] Chunk #1 of 1 ... [18:42:12.766] - Finding globals in 'X' for chunk #1 ... [18:42:12.767] getGlobalsAndPackages() ... [18:42:12.767] Searching for globals... [18:42:12.767] [18:42:12.767] Searching for globals ... DONE [18:42:12.768] - globals: [0] [18:42:12.768] getGlobalsAndPackages() ... DONE [18:42:12.768] + additional globals found: [n=0] [18:42:12.768] + additional namespaces needed: [n=0] [18:42:12.768] - Finding globals in 'X' for chunk #1 ... DONE [18:42:12.768] - seeds: [18:42:12.768] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:12.769] getGlobalsAndPackages() ... [18:42:12.769] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:12.769] Resolving globals: FALSE [18:42:12.769] Tweak future expression to call with '...' arguments ... [18:42:12.769] { [18:42:12.769] do.call(function(...) { [18:42:12.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:12.769] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:12.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:12.769] on.exit(options(oopts), add = TRUE) [18:42:12.769] } [18:42:12.769] { [18:42:12.769] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:12.769] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:12.769] ...future.FUN(...future.X_jj, ...) [18:42:12.769] }) [18:42:12.769] } [18:42:12.769] }, args = future.call.arguments) [18:42:12.769] } [18:42:12.770] Tweak future expression to call with '...' arguments ... DONE [18:42:12.770] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:12.771] [18:42:12.771] getGlobalsAndPackages() ... DONE [18:42:12.771] run() for 'Future' ... [18:42:12.771] - state: 'created' [18:42:12.772] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:12.774] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:12.775] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:12.775] - Field: 'label' [18:42:12.775] - Field: 'local' [18:42:12.775] - Field: 'owner' [18:42:12.775] - Field: 'envir' [18:42:12.775] - Field: 'packages' [18:42:12.776] - Field: 'gc' [18:42:12.776] - Field: 'conditions' [18:42:12.776] - Field: 'expr' [18:42:12.776] - Field: 'uuid' [18:42:12.776] - Field: 'seed' [18:42:12.777] - Field: 'version' [18:42:12.777] - Field: 'result' [18:42:12.777] - Field: 'asynchronous' [18:42:12.777] - Field: 'calls' [18:42:12.777] - Field: 'globals' [18:42:12.777] - Field: 'stdout' [18:42:12.778] - Field: 'earlySignal' [18:42:12.778] - Field: 'lazy' [18:42:12.778] - Field: 'state' [18:42:12.778] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:12.778] - Launch lazy future ... [18:42:12.779] Packages needed by the future expression (n = 0): [18:42:12.779] Packages needed by future strategies (n = 0): [18:42:12.779] { [18:42:12.779] { [18:42:12.779] { [18:42:12.779] ...future.startTime <- base::Sys.time() [18:42:12.779] { [18:42:12.779] { [18:42:12.779] { [18:42:12.779] base::local({ [18:42:12.779] has_future <- base::requireNamespace("future", [18:42:12.779] quietly = TRUE) [18:42:12.779] if (has_future) { [18:42:12.779] ns <- base::getNamespace("future") [18:42:12.779] version <- ns[[".package"]][["version"]] [18:42:12.779] if (is.null(version)) [18:42:12.779] version <- utils::packageVersion("future") [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] version <- NULL [18:42:12.779] } [18:42:12.779] if (!has_future || version < "1.8.0") { [18:42:12.779] info <- base::c(r_version = base::gsub("R version ", [18:42:12.779] "", base::R.version$version.string), [18:42:12.779] platform = base::sprintf("%s (%s-bit)", [18:42:12.779] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:12.779] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:12.779] "release", "version")], collapse = " "), [18:42:12.779] hostname = base::Sys.info()[["nodename"]]) [18:42:12.779] info <- base::sprintf("%s: %s", base::names(info), [18:42:12.779] info) [18:42:12.779] info <- base::paste(info, collapse = "; ") [18:42:12.779] if (!has_future) { [18:42:12.779] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:12.779] info) [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:12.779] info, version) [18:42:12.779] } [18:42:12.779] base::stop(msg) [18:42:12.779] } [18:42:12.779] }) [18:42:12.779] } [18:42:12.779] ...future.strategy.old <- future::plan("list") [18:42:12.779] options(future.plan = NULL) [18:42:12.779] Sys.unsetenv("R_FUTURE_PLAN") [18:42:12.779] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:12.779] } [18:42:12.779] ...future.workdir <- getwd() [18:42:12.779] } [18:42:12.779] ...future.oldOptions <- base::as.list(base::.Options) [18:42:12.779] ...future.oldEnvVars <- base::Sys.getenv() [18:42:12.779] } [18:42:12.779] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:12.779] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:12.779] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:12.779] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:12.779] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:12.779] future.stdout.windows.reencode = NULL, width = 80L) [18:42:12.779] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:12.779] base::names(...future.oldOptions)) [18:42:12.779] } [18:42:12.779] if (FALSE) { [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] if (FALSE) { [18:42:12.779] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:12.779] open = "w") [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:12.779] windows = "NUL", "/dev/null"), open = "w") [18:42:12.779] } [18:42:12.779] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:12.779] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:12.779] base::sink(type = "output", split = FALSE) [18:42:12.779] base::close(...future.stdout) [18:42:12.779] }, add = TRUE) [18:42:12.779] } [18:42:12.779] ...future.frame <- base::sys.nframe() [18:42:12.779] ...future.conditions <- base::list() [18:42:12.779] ...future.rng <- base::globalenv()$.Random.seed [18:42:12.779] if (FALSE) { [18:42:12.779] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:12.779] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:12.779] } [18:42:12.779] ...future.result <- base::tryCatch({ [18:42:12.779] base::withCallingHandlers({ [18:42:12.779] ...future.value <- base::withVisible(base::local({ [18:42:12.779] do.call(function(...) { [18:42:12.779] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:12.779] if (!identical(...future.globals.maxSize.org, [18:42:12.779] ...future.globals.maxSize)) { [18:42:12.779] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:12.779] on.exit(options(oopts), add = TRUE) [18:42:12.779] } [18:42:12.779] { [18:42:12.779] lapply(seq_along(...future.elements_ii), [18:42:12.779] FUN = function(jj) { [18:42:12.779] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:12.779] ...future.FUN(...future.X_jj, ...) [18:42:12.779] }) [18:42:12.779] } [18:42:12.779] }, args = future.call.arguments) [18:42:12.779] })) [18:42:12.779] future::FutureResult(value = ...future.value$value, [18:42:12.779] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:12.779] ...future.rng), globalenv = if (FALSE) [18:42:12.779] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:12.779] ...future.globalenv.names)) [18:42:12.779] else NULL, started = ...future.startTime, version = "1.8") [18:42:12.779] }, condition = base::local({ [18:42:12.779] c <- base::c [18:42:12.779] inherits <- base::inherits [18:42:12.779] invokeRestart <- base::invokeRestart [18:42:12.779] length <- base::length [18:42:12.779] list <- base::list [18:42:12.779] seq.int <- base::seq.int [18:42:12.779] signalCondition <- base::signalCondition [18:42:12.779] sys.calls <- base::sys.calls [18:42:12.779] `[[` <- base::`[[` [18:42:12.779] `+` <- base::`+` [18:42:12.779] `<<-` <- base::`<<-` [18:42:12.779] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:12.779] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:12.779] 3L)] [18:42:12.779] } [18:42:12.779] function(cond) { [18:42:12.779] is_error <- inherits(cond, "error") [18:42:12.779] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:12.779] NULL) [18:42:12.779] if (is_error) { [18:42:12.779] sessionInformation <- function() { [18:42:12.779] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:12.779] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:12.779] search = base::search(), system = base::Sys.info()) [18:42:12.779] } [18:42:12.779] ...future.conditions[[length(...future.conditions) + [18:42:12.779] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:12.779] cond$call), session = sessionInformation(), [18:42:12.779] timestamp = base::Sys.time(), signaled = 0L) [18:42:12.779] signalCondition(cond) [18:42:12.779] } [18:42:12.779] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:12.779] "immediateCondition"))) { [18:42:12.779] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:12.779] ...future.conditions[[length(...future.conditions) + [18:42:12.779] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:12.779] if (TRUE && !signal) { [18:42:12.779] muffleCondition <- function (cond, pattern = "^muffle") [18:42:12.779] { [18:42:12.779] inherits <- base::inherits [18:42:12.779] invokeRestart <- base::invokeRestart [18:42:12.779] is.null <- base::is.null [18:42:12.779] muffled <- FALSE [18:42:12.779] if (inherits(cond, "message")) { [18:42:12.779] muffled <- grepl(pattern, "muffleMessage") [18:42:12.779] if (muffled) [18:42:12.779] invokeRestart("muffleMessage") [18:42:12.779] } [18:42:12.779] else if (inherits(cond, "warning")) { [18:42:12.779] muffled <- grepl(pattern, "muffleWarning") [18:42:12.779] if (muffled) [18:42:12.779] invokeRestart("muffleWarning") [18:42:12.779] } [18:42:12.779] else if (inherits(cond, "condition")) { [18:42:12.779] if (!is.null(pattern)) { [18:42:12.779] computeRestarts <- base::computeRestarts [18:42:12.779] grepl <- base::grepl [18:42:12.779] restarts <- computeRestarts(cond) [18:42:12.779] for (restart in restarts) { [18:42:12.779] name <- restart$name [18:42:12.779] if (is.null(name)) [18:42:12.779] next [18:42:12.779] if (!grepl(pattern, name)) [18:42:12.779] next [18:42:12.779] invokeRestart(restart) [18:42:12.779] muffled <- TRUE [18:42:12.779] break [18:42:12.779] } [18:42:12.779] } [18:42:12.779] } [18:42:12.779] invisible(muffled) [18:42:12.779] } [18:42:12.779] muffleCondition(cond, pattern = "^muffle") [18:42:12.779] } [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] if (TRUE) { [18:42:12.779] muffleCondition <- function (cond, pattern = "^muffle") [18:42:12.779] { [18:42:12.779] inherits <- base::inherits [18:42:12.779] invokeRestart <- base::invokeRestart [18:42:12.779] is.null <- base::is.null [18:42:12.779] muffled <- FALSE [18:42:12.779] if (inherits(cond, "message")) { [18:42:12.779] muffled <- grepl(pattern, "muffleMessage") [18:42:12.779] if (muffled) [18:42:12.779] invokeRestart("muffleMessage") [18:42:12.779] } [18:42:12.779] else if (inherits(cond, "warning")) { [18:42:12.779] muffled <- grepl(pattern, "muffleWarning") [18:42:12.779] if (muffled) [18:42:12.779] invokeRestart("muffleWarning") [18:42:12.779] } [18:42:12.779] else if (inherits(cond, "condition")) { [18:42:12.779] if (!is.null(pattern)) { [18:42:12.779] computeRestarts <- base::computeRestarts [18:42:12.779] grepl <- base::grepl [18:42:12.779] restarts <- computeRestarts(cond) [18:42:12.779] for (restart in restarts) { [18:42:12.779] name <- restart$name [18:42:12.779] if (is.null(name)) [18:42:12.779] next [18:42:12.779] if (!grepl(pattern, name)) [18:42:12.779] next [18:42:12.779] invokeRestart(restart) [18:42:12.779] muffled <- TRUE [18:42:12.779] break [18:42:12.779] } [18:42:12.779] } [18:42:12.779] } [18:42:12.779] invisible(muffled) [18:42:12.779] } [18:42:12.779] muffleCondition(cond, pattern = "^muffle") [18:42:12.779] } [18:42:12.779] } [18:42:12.779] } [18:42:12.779] })) [18:42:12.779] }, error = function(ex) { [18:42:12.779] base::structure(base::list(value = NULL, visible = NULL, [18:42:12.779] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:12.779] ...future.rng), started = ...future.startTime, [18:42:12.779] finished = Sys.time(), session_uuid = NA_character_, [18:42:12.779] version = "1.8"), class = "FutureResult") [18:42:12.779] }, finally = { [18:42:12.779] if (!identical(...future.workdir, getwd())) [18:42:12.779] setwd(...future.workdir) [18:42:12.779] { [18:42:12.779] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:12.779] ...future.oldOptions$nwarnings <- NULL [18:42:12.779] } [18:42:12.779] base::options(...future.oldOptions) [18:42:12.779] if (.Platform$OS.type == "windows") { [18:42:12.779] old_names <- names(...future.oldEnvVars) [18:42:12.779] envs <- base::Sys.getenv() [18:42:12.779] names <- names(envs) [18:42:12.779] common <- intersect(names, old_names) [18:42:12.779] added <- setdiff(names, old_names) [18:42:12.779] removed <- setdiff(old_names, names) [18:42:12.779] changed <- common[...future.oldEnvVars[common] != [18:42:12.779] envs[common]] [18:42:12.779] NAMES <- toupper(changed) [18:42:12.779] args <- list() [18:42:12.779] for (kk in seq_along(NAMES)) { [18:42:12.779] name <- changed[[kk]] [18:42:12.779] NAME <- NAMES[[kk]] [18:42:12.779] if (name != NAME && is.element(NAME, old_names)) [18:42:12.779] next [18:42:12.779] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:12.779] } [18:42:12.779] NAMES <- toupper(added) [18:42:12.779] for (kk in seq_along(NAMES)) { [18:42:12.779] name <- added[[kk]] [18:42:12.779] NAME <- NAMES[[kk]] [18:42:12.779] if (name != NAME && is.element(NAME, old_names)) [18:42:12.779] next [18:42:12.779] args[[name]] <- "" [18:42:12.779] } [18:42:12.779] NAMES <- toupper(removed) [18:42:12.779] for (kk in seq_along(NAMES)) { [18:42:12.779] name <- removed[[kk]] [18:42:12.779] NAME <- NAMES[[kk]] [18:42:12.779] if (name != NAME && is.element(NAME, old_names)) [18:42:12.779] next [18:42:12.779] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:12.779] } [18:42:12.779] if (length(args) > 0) [18:42:12.779] base::do.call(base::Sys.setenv, args = args) [18:42:12.779] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:12.779] } [18:42:12.779] { [18:42:12.779] if (base::length(...future.futureOptionsAdded) > [18:42:12.779] 0L) { [18:42:12.779] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:12.779] base::names(opts) <- ...future.futureOptionsAdded [18:42:12.779] base::options(opts) [18:42:12.779] } [18:42:12.779] { [18:42:12.779] { [18:42:12.779] NULL [18:42:12.779] RNGkind("Mersenne-Twister") [18:42:12.779] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:12.779] inherits = FALSE) [18:42:12.779] } [18:42:12.779] options(future.plan = NULL) [18:42:12.779] if (is.na(NA_character_)) [18:42:12.779] Sys.unsetenv("R_FUTURE_PLAN") [18:42:12.779] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:12.779] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:12.779] .init = FALSE) [18:42:12.779] } [18:42:12.779] } [18:42:12.779] } [18:42:12.779] }) [18:42:12.779] if (TRUE) { [18:42:12.779] base::sink(type = "output", split = FALSE) [18:42:12.779] if (FALSE) { [18:42:12.779] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:12.779] } [18:42:12.779] else { [18:42:12.779] ...future.result["stdout"] <- base::list(NULL) [18:42:12.779] } [18:42:12.779] base::close(...future.stdout) [18:42:12.779] ...future.stdout <- NULL [18:42:12.779] } [18:42:12.779] ...future.result$conditions <- ...future.conditions [18:42:12.779] ...future.result$finished <- base::Sys.time() [18:42:12.779] ...future.result [18:42:12.779] } [18:42:12.783] assign_globals() ... [18:42:12.784] List of 5 [18:42:12.784] $ ...future.FUN :function (x) [18:42:12.784] $ future.call.arguments : list() [18:42:12.784] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:12.784] $ ...future.elements_ii :List of 2 [18:42:12.784] ..$ : int 1 [18:42:12.784] ..$ : int 0 [18:42:12.784] $ ...future.seeds_ii : NULL [18:42:12.784] $ ...future.globals.maxSize: NULL [18:42:12.784] - attr(*, "where")=List of 5 [18:42:12.784] ..$ ...future.FUN : [18:42:12.784] ..$ future.call.arguments : [18:42:12.784] ..$ ...future.elements_ii : [18:42:12.784] ..$ ...future.seeds_ii : [18:42:12.784] ..$ ...future.globals.maxSize: [18:42:12.784] - attr(*, "resolved")= logi FALSE [18:42:12.784] - attr(*, "total_size")= num 5632 [18:42:12.784] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:12.784] - attr(*, "already-done")= logi TRUE [18:42:12.791] - reassign environment for '...future.FUN' [18:42:12.791] - copied '...future.FUN' to environment [18:42:12.791] - copied 'future.call.arguments' to environment [18:42:12.791] - copied '...future.elements_ii' to environment [18:42:12.791] - copied '...future.seeds_ii' to environment [18:42:12.791] - copied '...future.globals.maxSize' to environment [18:42:12.792] assign_globals() ... done [18:42:12.792] plan(): Setting new future strategy stack: [18:42:12.792] List of future strategies: [18:42:12.792] 1. sequential: [18:42:12.792] - args: function (..., envir = parent.frame(), workers = "") [18:42:12.792] - tweaked: FALSE [18:42:12.792] - call: NULL [18:42:12.794] plan(): nbrOfWorkers() = 1 [18:42:13.305] plan(): Setting new future strategy stack: [18:42:13.306] List of future strategies: [18:42:13.306] 1. multisession: [18:42:13.306] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:13.306] - tweaked: FALSE [18:42:13.306] - call: plan(strategy) [18:42:13.311] plan(): nbrOfWorkers() = 1 [18:42:13.311] SequentialFuture started (and completed) [18:42:13.312] - Launch lazy future ... done [18:42:13.312] run() for 'SequentialFuture' ... done [18:42:13.312] Created future: [18:42:13.313] SequentialFuture: [18:42:13.313] Label: 'future_lapply-1' [18:42:13.313] Expression: [18:42:13.313] { [18:42:13.313] do.call(function(...) { [18:42:13.313] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:13.313] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:13.313] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:13.313] on.exit(options(oopts), add = TRUE) [18:42:13.313] } [18:42:13.313] { [18:42:13.313] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:13.313] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:13.313] ...future.FUN(...future.X_jj, ...) [18:42:13.313] }) [18:42:13.313] } [18:42:13.313] }, args = future.call.arguments) [18:42:13.313] } [18:42:13.313] Lazy evaluation: FALSE [18:42:13.313] Asynchronous evaluation: FALSE [18:42:13.313] Local evaluation: TRUE [18:42:13.313] Environment: R_GlobalEnv [18:42:13.313] Capture standard output: FALSE [18:42:13.313] Capture condition classes: 'condition' (excluding 'nothing') [18:42:13.313] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:13.313] Packages: [18:42:13.313] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:13.313] Resolved: TRUE [18:42:13.313] Value: 55 bytes of class 'list' [18:42:13.313] Early signaling: FALSE [18:42:13.313] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:13.313] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:13.315] Chunk #1 of 1 ... DONE [18:42:13.315] Launching 1 futures (chunks) ... DONE [18:42:13.315] Resolving 1 futures (chunks) ... [18:42:13.315] resolve() on list ... [18:42:13.316] recursive: 0 [18:42:13.316] length: 1 [18:42:13.316] [18:42:13.316] resolved() for 'SequentialFuture' ... [18:42:13.317] - state: 'finished' [18:42:13.317] - run: TRUE [18:42:13.317] - result: 'FutureResult' [18:42:13.318] resolved() for 'SequentialFuture' ... done [18:42:13.318] Future #1 [18:42:13.318] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:13.319] - nx: 1 [18:42:13.319] - relay: TRUE [18:42:13.319] - stdout: TRUE [18:42:13.319] - signal: TRUE [18:42:13.320] - resignal: FALSE [18:42:13.320] - force: TRUE [18:42:13.320] - relayed: [n=1] FALSE [18:42:13.320] - queued futures: [n=1] FALSE [18:42:13.321] - until=1 [18:42:13.321] - relaying element #1 [18:42:13.321] - relayed: [n=1] TRUE [18:42:13.322] - queued futures: [n=1] TRUE [18:42:13.322] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:13.322] length: 0 (resolved future 1) [18:42:13.322] Relaying remaining futures [18:42:13.323] signalConditionsASAP(NULL, pos=0) ... [18:42:13.323] - nx: 1 [18:42:13.323] - relay: TRUE [18:42:13.323] - stdout: TRUE [18:42:13.324] - signal: TRUE [18:42:13.324] - resignal: FALSE [18:42:13.324] - force: TRUE [18:42:13.324] - relayed: [n=1] TRUE [18:42:13.325] - queued futures: [n=1] TRUE - flush all [18:42:13.325] - relayed: [n=1] TRUE [18:42:13.325] - queued futures: [n=1] TRUE [18:42:13.326] signalConditionsASAP(NULL, pos=0) ... done [18:42:13.326] resolve() on list ... DONE [18:42:13.326] - Number of value chunks collected: 1 [18:42:13.327] Resolving 1 futures (chunks) ... DONE [18:42:13.327] Reducing values from 1 chunks ... [18:42:13.327] - Number of values collected after concatenation: 2 [18:42:13.327] - Number of values expected: 2 [18:42:13.328] Reducing values from 1 chunks ... DONE [18:42:13.328] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = FALSE) ... DONE * future_lapply(x, ..., future.stdout = TRUE) ... [18:42:13.329] future_lapply() ... [18:42:13.334] Number of chunks: 1 [18:42:13.334] getGlobalsAndPackagesXApply() ... [18:42:13.334] - future.globals: TRUE [18:42:13.335] getGlobalsAndPackages() ... [18:42:13.335] Searching for globals... [18:42:13.338] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:13.338] Searching for globals ... DONE [18:42:13.338] Resolving globals: FALSE [18:42:13.339] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:13.340] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:13.340] - globals: [1] 'FUN' [18:42:13.341] [18:42:13.341] getGlobalsAndPackages() ... DONE [18:42:13.341] - globals found/used: [n=1] 'FUN' [18:42:13.342] - needed namespaces: [n=0] [18:42:13.342] Finding globals ... DONE [18:42:13.342] - use_args: TRUE [18:42:13.342] - Getting '...' globals ... [18:42:13.343] resolve() on list ... [18:42:13.343] recursive: 0 [18:42:13.344] length: 1 [18:42:13.344] elements: '...' [18:42:13.344] length: 0 (resolved future 1) [18:42:13.345] resolve() on list ... DONE [18:42:13.345] - '...' content: [n=0] [18:42:13.345] List of 1 [18:42:13.345] $ ...: list() [18:42:13.345] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:13.345] - attr(*, "where")=List of 1 [18:42:13.345] ..$ ...: [18:42:13.345] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:13.345] - attr(*, "resolved")= logi TRUE [18:42:13.345] - attr(*, "total_size")= num NA [18:42:13.354] - Getting '...' globals ... DONE [18:42:13.354] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:13.355] List of 2 [18:42:13.355] $ ...future.FUN:function (x) [18:42:13.355] $ ... : list() [18:42:13.355] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:13.355] - attr(*, "where")=List of 2 [18:42:13.355] ..$ ...future.FUN: [18:42:13.355] ..$ ... : [18:42:13.355] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:13.355] - attr(*, "resolved")= logi FALSE [18:42:13.355] - attr(*, "total_size")= int 5632 [18:42:13.360] Packages to be attached in all futures: [n=0] [18:42:13.360] getGlobalsAndPackagesXApply() ... DONE [18:42:13.361] Number of futures (= number of chunks): 1 [18:42:13.361] Launching 1 futures (chunks) ... [18:42:13.361] Chunk #1 of 1 ... [18:42:13.362] - Finding globals in 'X' for chunk #1 ... [18:42:13.362] getGlobalsAndPackages() ... [18:42:13.362] Searching for globals... [18:42:13.363] [18:42:13.363] Searching for globals ... DONE [18:42:13.363] - globals: [0] [18:42:13.364] getGlobalsAndPackages() ... DONE [18:42:13.364] + additional globals found: [n=0] [18:42:13.364] + additional namespaces needed: [n=0] [18:42:13.364] - Finding globals in 'X' for chunk #1 ... DONE [18:42:13.365] - seeds: [18:42:13.365] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:13.365] getGlobalsAndPackages() ... [18:42:13.365] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:13.366] Resolving globals: FALSE [18:42:13.366] Tweak future expression to call with '...' arguments ... [18:42:13.366] { [18:42:13.366] do.call(function(...) { [18:42:13.366] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:13.366] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:13.366] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:13.366] on.exit(options(oopts), add = TRUE) [18:42:13.366] } [18:42:13.366] { [18:42:13.366] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:13.366] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:13.366] ...future.FUN(...future.X_jj, ...) [18:42:13.366] }) [18:42:13.366] } [18:42:13.366] }, args = future.call.arguments) [18:42:13.366] } [18:42:13.367] Tweak future expression to call with '...' arguments ... DONE [18:42:13.368] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:13.368] [18:42:13.368] getGlobalsAndPackages() ... DONE [18:42:13.369] run() for 'Future' ... [18:42:13.369] - state: 'created' [18:42:13.370] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:13.374] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:13.374] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:13.374] - Field: 'label' [18:42:13.375] - Field: 'local' [18:42:13.375] - Field: 'owner' [18:42:13.375] - Field: 'envir' [18:42:13.375] - Field: 'packages' [18:42:13.376] - Field: 'gc' [18:42:13.376] - Field: 'conditions' [18:42:13.376] - Field: 'expr' [18:42:13.377] - Field: 'uuid' [18:42:13.377] - Field: 'seed' [18:42:13.377] - Field: 'version' [18:42:13.377] - Field: 'result' [18:42:13.378] - Field: 'asynchronous' [18:42:13.378] - Field: 'calls' [18:42:13.378] - Field: 'globals' [18:42:13.379] - Field: 'stdout' [18:42:13.379] - Field: 'earlySignal' [18:42:13.379] - Field: 'lazy' [18:42:13.379] - Field: 'state' [18:42:13.380] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:13.380] - Launch lazy future ... [18:42:13.380] Packages needed by the future expression (n = 0): [18:42:13.381] Packages needed by future strategies (n = 0): [18:42:13.382] { [18:42:13.382] { [18:42:13.382] { [18:42:13.382] ...future.startTime <- base::Sys.time() [18:42:13.382] { [18:42:13.382] { [18:42:13.382] { [18:42:13.382] base::local({ [18:42:13.382] has_future <- base::requireNamespace("future", [18:42:13.382] quietly = TRUE) [18:42:13.382] if (has_future) { [18:42:13.382] ns <- base::getNamespace("future") [18:42:13.382] version <- ns[[".package"]][["version"]] [18:42:13.382] if (is.null(version)) [18:42:13.382] version <- utils::packageVersion("future") [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] version <- NULL [18:42:13.382] } [18:42:13.382] if (!has_future || version < "1.8.0") { [18:42:13.382] info <- base::c(r_version = base::gsub("R version ", [18:42:13.382] "", base::R.version$version.string), [18:42:13.382] platform = base::sprintf("%s (%s-bit)", [18:42:13.382] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:13.382] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:13.382] "release", "version")], collapse = " "), [18:42:13.382] hostname = base::Sys.info()[["nodename"]]) [18:42:13.382] info <- base::sprintf("%s: %s", base::names(info), [18:42:13.382] info) [18:42:13.382] info <- base::paste(info, collapse = "; ") [18:42:13.382] if (!has_future) { [18:42:13.382] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:13.382] info) [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:13.382] info, version) [18:42:13.382] } [18:42:13.382] base::stop(msg) [18:42:13.382] } [18:42:13.382] }) [18:42:13.382] } [18:42:13.382] ...future.strategy.old <- future::plan("list") [18:42:13.382] options(future.plan = NULL) [18:42:13.382] Sys.unsetenv("R_FUTURE_PLAN") [18:42:13.382] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:13.382] } [18:42:13.382] ...future.workdir <- getwd() [18:42:13.382] } [18:42:13.382] ...future.oldOptions <- base::as.list(base::.Options) [18:42:13.382] ...future.oldEnvVars <- base::Sys.getenv() [18:42:13.382] } [18:42:13.382] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:13.382] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:13.382] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:13.382] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:13.382] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:13.382] future.stdout.windows.reencode = NULL, width = 80L) [18:42:13.382] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:13.382] base::names(...future.oldOptions)) [18:42:13.382] } [18:42:13.382] if (FALSE) { [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] if (TRUE) { [18:42:13.382] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:13.382] open = "w") [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:13.382] windows = "NUL", "/dev/null"), open = "w") [18:42:13.382] } [18:42:13.382] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:13.382] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:13.382] base::sink(type = "output", split = FALSE) [18:42:13.382] base::close(...future.stdout) [18:42:13.382] }, add = TRUE) [18:42:13.382] } [18:42:13.382] ...future.frame <- base::sys.nframe() [18:42:13.382] ...future.conditions <- base::list() [18:42:13.382] ...future.rng <- base::globalenv()$.Random.seed [18:42:13.382] if (FALSE) { [18:42:13.382] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:13.382] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:13.382] } [18:42:13.382] ...future.result <- base::tryCatch({ [18:42:13.382] base::withCallingHandlers({ [18:42:13.382] ...future.value <- base::withVisible(base::local({ [18:42:13.382] do.call(function(...) { [18:42:13.382] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:13.382] if (!identical(...future.globals.maxSize.org, [18:42:13.382] ...future.globals.maxSize)) { [18:42:13.382] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:13.382] on.exit(options(oopts), add = TRUE) [18:42:13.382] } [18:42:13.382] { [18:42:13.382] lapply(seq_along(...future.elements_ii), [18:42:13.382] FUN = function(jj) { [18:42:13.382] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:13.382] ...future.FUN(...future.X_jj, ...) [18:42:13.382] }) [18:42:13.382] } [18:42:13.382] }, args = future.call.arguments) [18:42:13.382] })) [18:42:13.382] future::FutureResult(value = ...future.value$value, [18:42:13.382] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:13.382] ...future.rng), globalenv = if (FALSE) [18:42:13.382] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:13.382] ...future.globalenv.names)) [18:42:13.382] else NULL, started = ...future.startTime, version = "1.8") [18:42:13.382] }, condition = base::local({ [18:42:13.382] c <- base::c [18:42:13.382] inherits <- base::inherits [18:42:13.382] invokeRestart <- base::invokeRestart [18:42:13.382] length <- base::length [18:42:13.382] list <- base::list [18:42:13.382] seq.int <- base::seq.int [18:42:13.382] signalCondition <- base::signalCondition [18:42:13.382] sys.calls <- base::sys.calls [18:42:13.382] `[[` <- base::`[[` [18:42:13.382] `+` <- base::`+` [18:42:13.382] `<<-` <- base::`<<-` [18:42:13.382] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:13.382] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:13.382] 3L)] [18:42:13.382] } [18:42:13.382] function(cond) { [18:42:13.382] is_error <- inherits(cond, "error") [18:42:13.382] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:13.382] NULL) [18:42:13.382] if (is_error) { [18:42:13.382] sessionInformation <- function() { [18:42:13.382] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:13.382] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:13.382] search = base::search(), system = base::Sys.info()) [18:42:13.382] } [18:42:13.382] ...future.conditions[[length(...future.conditions) + [18:42:13.382] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:13.382] cond$call), session = sessionInformation(), [18:42:13.382] timestamp = base::Sys.time(), signaled = 0L) [18:42:13.382] signalCondition(cond) [18:42:13.382] } [18:42:13.382] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:13.382] "immediateCondition"))) { [18:42:13.382] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:13.382] ...future.conditions[[length(...future.conditions) + [18:42:13.382] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:13.382] if (TRUE && !signal) { [18:42:13.382] muffleCondition <- function (cond, pattern = "^muffle") [18:42:13.382] { [18:42:13.382] inherits <- base::inherits [18:42:13.382] invokeRestart <- base::invokeRestart [18:42:13.382] is.null <- base::is.null [18:42:13.382] muffled <- FALSE [18:42:13.382] if (inherits(cond, "message")) { [18:42:13.382] muffled <- grepl(pattern, "muffleMessage") [18:42:13.382] if (muffled) [18:42:13.382] invokeRestart("muffleMessage") [18:42:13.382] } [18:42:13.382] else if (inherits(cond, "warning")) { [18:42:13.382] muffled <- grepl(pattern, "muffleWarning") [18:42:13.382] if (muffled) [18:42:13.382] invokeRestart("muffleWarning") [18:42:13.382] } [18:42:13.382] else if (inherits(cond, "condition")) { [18:42:13.382] if (!is.null(pattern)) { [18:42:13.382] computeRestarts <- base::computeRestarts [18:42:13.382] grepl <- base::grepl [18:42:13.382] restarts <- computeRestarts(cond) [18:42:13.382] for (restart in restarts) { [18:42:13.382] name <- restart$name [18:42:13.382] if (is.null(name)) [18:42:13.382] next [18:42:13.382] if (!grepl(pattern, name)) [18:42:13.382] next [18:42:13.382] invokeRestart(restart) [18:42:13.382] muffled <- TRUE [18:42:13.382] break [18:42:13.382] } [18:42:13.382] } [18:42:13.382] } [18:42:13.382] invisible(muffled) [18:42:13.382] } [18:42:13.382] muffleCondition(cond, pattern = "^muffle") [18:42:13.382] } [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] if (TRUE) { [18:42:13.382] muffleCondition <- function (cond, pattern = "^muffle") [18:42:13.382] { [18:42:13.382] inherits <- base::inherits [18:42:13.382] invokeRestart <- base::invokeRestart [18:42:13.382] is.null <- base::is.null [18:42:13.382] muffled <- FALSE [18:42:13.382] if (inherits(cond, "message")) { [18:42:13.382] muffled <- grepl(pattern, "muffleMessage") [18:42:13.382] if (muffled) [18:42:13.382] invokeRestart("muffleMessage") [18:42:13.382] } [18:42:13.382] else if (inherits(cond, "warning")) { [18:42:13.382] muffled <- grepl(pattern, "muffleWarning") [18:42:13.382] if (muffled) [18:42:13.382] invokeRestart("muffleWarning") [18:42:13.382] } [18:42:13.382] else if (inherits(cond, "condition")) { [18:42:13.382] if (!is.null(pattern)) { [18:42:13.382] computeRestarts <- base::computeRestarts [18:42:13.382] grepl <- base::grepl [18:42:13.382] restarts <- computeRestarts(cond) [18:42:13.382] for (restart in restarts) { [18:42:13.382] name <- restart$name [18:42:13.382] if (is.null(name)) [18:42:13.382] next [18:42:13.382] if (!grepl(pattern, name)) [18:42:13.382] next [18:42:13.382] invokeRestart(restart) [18:42:13.382] muffled <- TRUE [18:42:13.382] break [18:42:13.382] } [18:42:13.382] } [18:42:13.382] } [18:42:13.382] invisible(muffled) [18:42:13.382] } [18:42:13.382] muffleCondition(cond, pattern = "^muffle") [18:42:13.382] } [18:42:13.382] } [18:42:13.382] } [18:42:13.382] })) [18:42:13.382] }, error = function(ex) { [18:42:13.382] base::structure(base::list(value = NULL, visible = NULL, [18:42:13.382] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:13.382] ...future.rng), started = ...future.startTime, [18:42:13.382] finished = Sys.time(), session_uuid = NA_character_, [18:42:13.382] version = "1.8"), class = "FutureResult") [18:42:13.382] }, finally = { [18:42:13.382] if (!identical(...future.workdir, getwd())) [18:42:13.382] setwd(...future.workdir) [18:42:13.382] { [18:42:13.382] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:13.382] ...future.oldOptions$nwarnings <- NULL [18:42:13.382] } [18:42:13.382] base::options(...future.oldOptions) [18:42:13.382] if (.Platform$OS.type == "windows") { [18:42:13.382] old_names <- names(...future.oldEnvVars) [18:42:13.382] envs <- base::Sys.getenv() [18:42:13.382] names <- names(envs) [18:42:13.382] common <- intersect(names, old_names) [18:42:13.382] added <- setdiff(names, old_names) [18:42:13.382] removed <- setdiff(old_names, names) [18:42:13.382] changed <- common[...future.oldEnvVars[common] != [18:42:13.382] envs[common]] [18:42:13.382] NAMES <- toupper(changed) [18:42:13.382] args <- list() [18:42:13.382] for (kk in seq_along(NAMES)) { [18:42:13.382] name <- changed[[kk]] [18:42:13.382] NAME <- NAMES[[kk]] [18:42:13.382] if (name != NAME && is.element(NAME, old_names)) [18:42:13.382] next [18:42:13.382] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:13.382] } [18:42:13.382] NAMES <- toupper(added) [18:42:13.382] for (kk in seq_along(NAMES)) { [18:42:13.382] name <- added[[kk]] [18:42:13.382] NAME <- NAMES[[kk]] [18:42:13.382] if (name != NAME && is.element(NAME, old_names)) [18:42:13.382] next [18:42:13.382] args[[name]] <- "" [18:42:13.382] } [18:42:13.382] NAMES <- toupper(removed) [18:42:13.382] for (kk in seq_along(NAMES)) { [18:42:13.382] name <- removed[[kk]] [18:42:13.382] NAME <- NAMES[[kk]] [18:42:13.382] if (name != NAME && is.element(NAME, old_names)) [18:42:13.382] next [18:42:13.382] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:13.382] } [18:42:13.382] if (length(args) > 0) [18:42:13.382] base::do.call(base::Sys.setenv, args = args) [18:42:13.382] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:13.382] } [18:42:13.382] { [18:42:13.382] if (base::length(...future.futureOptionsAdded) > [18:42:13.382] 0L) { [18:42:13.382] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:13.382] base::names(opts) <- ...future.futureOptionsAdded [18:42:13.382] base::options(opts) [18:42:13.382] } [18:42:13.382] { [18:42:13.382] { [18:42:13.382] NULL [18:42:13.382] RNGkind("Mersenne-Twister") [18:42:13.382] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:13.382] inherits = FALSE) [18:42:13.382] } [18:42:13.382] options(future.plan = NULL) [18:42:13.382] if (is.na(NA_character_)) [18:42:13.382] Sys.unsetenv("R_FUTURE_PLAN") [18:42:13.382] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:13.382] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:13.382] .init = FALSE) [18:42:13.382] } [18:42:13.382] } [18:42:13.382] } [18:42:13.382] }) [18:42:13.382] if (TRUE) { [18:42:13.382] base::sink(type = "output", split = FALSE) [18:42:13.382] if (TRUE) { [18:42:13.382] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:13.382] } [18:42:13.382] else { [18:42:13.382] ...future.result["stdout"] <- base::list(NULL) [18:42:13.382] } [18:42:13.382] base::close(...future.stdout) [18:42:13.382] ...future.stdout <- NULL [18:42:13.382] } [18:42:13.382] ...future.result$conditions <- ...future.conditions [18:42:13.382] ...future.result$finished <- base::Sys.time() [18:42:13.382] ...future.result [18:42:13.382] } [18:42:13.389] assign_globals() ... [18:42:13.389] List of 5 [18:42:13.389] $ ...future.FUN :function (x) [18:42:13.389] $ future.call.arguments : list() [18:42:13.389] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:13.389] $ ...future.elements_ii :List of 2 [18:42:13.389] ..$ : int 1 [18:42:13.389] ..$ : int 0 [18:42:13.389] $ ...future.seeds_ii : NULL [18:42:13.389] $ ...future.globals.maxSize: NULL [18:42:13.389] - attr(*, "where")=List of 5 [18:42:13.389] ..$ ...future.FUN : [18:42:13.389] ..$ future.call.arguments : [18:42:13.389] ..$ ...future.elements_ii : [18:42:13.389] ..$ ...future.seeds_ii : [18:42:13.389] ..$ ...future.globals.maxSize: [18:42:13.389] - attr(*, "resolved")= logi FALSE [18:42:13.389] - attr(*, "total_size")= num 5632 [18:42:13.389] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:13.389] - attr(*, "already-done")= logi TRUE [18:42:13.402] - reassign environment for '...future.FUN' [18:42:13.402] - copied '...future.FUN' to environment [18:42:13.403] - copied 'future.call.arguments' to environment [18:42:13.403] - copied '...future.elements_ii' to environment [18:42:13.403] - copied '...future.seeds_ii' to environment [18:42:13.404] - copied '...future.globals.maxSize' to environment [18:42:13.404] assign_globals() ... done [18:42:13.405] plan(): Setting new future strategy stack: [18:42:13.405] List of future strategies: [18:42:13.405] 1. sequential: [18:42:13.405] - args: function (..., envir = parent.frame(), workers = "") [18:42:13.405] - tweaked: FALSE [18:42:13.405] - call: NULL [18:42:13.406] plan(): nbrOfWorkers() = 1 [18:42:13.914] plan(): Setting new future strategy stack: [18:42:13.915] List of future strategies: [18:42:13.915] 1. multisession: [18:42:13.915] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:13.915] - tweaked: FALSE [18:42:13.915] - call: plan(strategy) [18:42:13.919] plan(): nbrOfWorkers() = 1 [18:42:13.920] SequentialFuture started (and completed) [18:42:13.920] - Launch lazy future ... done [18:42:13.920] run() for 'SequentialFuture' ... done [18:42:13.921] Created future: [18:42:13.921] SequentialFuture: [18:42:13.921] Label: 'future_lapply-1' [18:42:13.921] Expression: [18:42:13.921] { [18:42:13.921] do.call(function(...) { [18:42:13.921] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:13.921] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:13.921] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:13.921] on.exit(options(oopts), add = TRUE) [18:42:13.921] } [18:42:13.921] { [18:42:13.921] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:13.921] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:13.921] ...future.FUN(...future.X_jj, ...) [18:42:13.921] }) [18:42:13.921] } [18:42:13.921] }, args = future.call.arguments) [18:42:13.921] } [18:42:13.921] Lazy evaluation: FALSE [18:42:13.921] Asynchronous evaluation: FALSE [18:42:13.921] Local evaluation: TRUE [18:42:13.921] Environment: R_GlobalEnv [18:42:13.921] Capture standard output: TRUE [18:42:13.921] Capture condition classes: 'condition' (excluding 'nothing') [18:42:13.921] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:13.921] Packages: [18:42:13.921] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:13.921] Resolved: TRUE [18:42:13.921] Value: 55 bytes of class 'list' [18:42:13.921] Early signaling: FALSE [18:42:13.921] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:13.921] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:13.923] Chunk #1 of 1 ... DONE [18:42:13.923] Launching 1 futures (chunks) ... DONE [18:42:13.923] Resolving 1 futures (chunks) ... [18:42:13.924] resolve() on list ... [18:42:13.924] recursive: 0 [18:42:13.924] length: 1 [18:42:13.925] [18:42:13.925] resolved() for 'SequentialFuture' ... [18:42:13.925] - state: 'finished' [18:42:13.925] - run: TRUE [18:42:13.926] - result: 'FutureResult' [18:42:13.926] resolved() for 'SequentialFuture' ... done [18:42:13.926] Future #1 [18:42:13.927] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:13.927] - nx: 1 [18:42:13.927] - relay: TRUE [18:42:13.928] - stdout: TRUE [18:42:13.928] - signal: TRUE [18:42:13.928] - resignal: FALSE [18:42:13.928] - force: TRUE [18:42:13.929] - relayed: [n=1] FALSE [18:42:13.929] - queued futures: [n=1] FALSE [18:42:13.929] - until=1 [18:42:13.929] - relaying element #1 [18:42:13.930] - relayed: [n=1] TRUE [18:42:13.930] - queued futures: [n=1] TRUE [18:42:13.930] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:13.931] length: 0 (resolved future 1) [18:42:13.931] Relaying remaining futures [18:42:13.931] signalConditionsASAP(NULL, pos=0) ... [18:42:13.932] - nx: 1 [18:42:13.932] - relay: TRUE [18:42:13.932] - stdout: TRUE [18:42:13.932] - signal: TRUE [18:42:13.933] - resignal: FALSE [18:42:13.933] - force: TRUE [18:42:13.933] - relayed: [n=1] TRUE [18:42:13.933] - queued futures: [n=1] TRUE - flush all [18:42:13.934] - relayed: [n=1] TRUE [18:42:13.934] - queued futures: [n=1] TRUE [18:42:13.934] signalConditionsASAP(NULL, pos=0) ... done [18:42:13.935] resolve() on list ... DONE [18:42:13.935] - Number of value chunks collected: 1 [18:42:13.935] Resolving 1 futures (chunks) ... DONE [18:42:13.935] Reducing values from 1 chunks ... [18:42:13.936] - Number of values collected after concatenation: 2 [18:42:13.936] - Number of values expected: 2 [18:42:13.936] Reducing values from 1 chunks ... DONE [18:42:13.937] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = TRUE) ... DONE * future_lapply(x, ..., future.stdout = NA) ... [18:42:13.937] future_lapply() ... [18:42:13.942] Number of chunks: 1 [18:42:13.942] getGlobalsAndPackagesXApply() ... [18:42:13.943] - future.globals: TRUE [18:42:13.943] getGlobalsAndPackages() ... [18:42:13.943] Searching for globals... [18:42:13.946] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:13.947] Searching for globals ... DONE [18:42:13.947] Resolving globals: FALSE [18:42:13.948] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:13.949] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:13.949] - globals: [1] 'FUN' [18:42:13.949] [18:42:13.949] getGlobalsAndPackages() ... DONE [18:42:13.950] - globals found/used: [n=1] 'FUN' [18:42:13.950] - needed namespaces: [n=0] [18:42:13.950] Finding globals ... DONE [18:42:13.951] - use_args: TRUE [18:42:13.951] - Getting '...' globals ... [18:42:13.952] resolve() on list ... [18:42:13.952] recursive: 0 [18:42:13.952] length: 1 [18:42:13.952] elements: '...' [18:42:13.953] length: 0 (resolved future 1) [18:42:13.953] resolve() on list ... DONE [18:42:13.956] - '...' content: [n=0] [18:42:13.957] List of 1 [18:42:13.957] $ ...: list() [18:42:13.957] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:13.957] - attr(*, "where")=List of 1 [18:42:13.957] ..$ ...: [18:42:13.957] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:13.957] - attr(*, "resolved")= logi TRUE [18:42:13.957] - attr(*, "total_size")= num NA [18:42:13.962] - Getting '...' globals ... DONE [18:42:13.962] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:13.963] List of 2 [18:42:13.963] $ ...future.FUN:function (x) [18:42:13.963] $ ... : list() [18:42:13.963] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:13.963] - attr(*, "where")=List of 2 [18:42:13.963] ..$ ...future.FUN: [18:42:13.963] ..$ ... : [18:42:13.963] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:13.963] - attr(*, "resolved")= logi FALSE [18:42:13.963] - attr(*, "total_size")= int 5632 [18:42:13.968] Packages to be attached in all futures: [n=0] [18:42:13.968] getGlobalsAndPackagesXApply() ... DONE [18:42:13.969] Number of futures (= number of chunks): 1 [18:42:13.969] Launching 1 futures (chunks) ... [18:42:13.969] Chunk #1 of 1 ... [18:42:13.970] - Finding globals in 'X' for chunk #1 ... [18:42:13.970] getGlobalsAndPackages() ... [18:42:13.970] Searching for globals... [18:42:13.971] [18:42:13.971] Searching for globals ... DONE [18:42:13.971] - globals: [0] [18:42:13.972] getGlobalsAndPackages() ... DONE [18:42:13.972] + additional globals found: [n=0] [18:42:13.972] + additional namespaces needed: [n=0] [18:42:13.972] - Finding globals in 'X' for chunk #1 ... DONE [18:42:13.973] - seeds: [18:42:13.973] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:13.973] getGlobalsAndPackages() ... [18:42:13.973] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:13.974] Resolving globals: FALSE [18:42:13.974] Tweak future expression to call with '...' arguments ... [18:42:13.974] { [18:42:13.974] do.call(function(...) { [18:42:13.974] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:13.974] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:13.974] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:13.974] on.exit(options(oopts), add = TRUE) [18:42:13.974] } [18:42:13.974] { [18:42:13.974] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:13.974] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:13.974] ...future.FUN(...future.X_jj, ...) [18:42:13.974] }) [18:42:13.974] } [18:42:13.974] }, args = future.call.arguments) [18:42:13.974] } [18:42:13.975] Tweak future expression to call with '...' arguments ... DONE [18:42:13.976] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:13.976] [18:42:13.976] getGlobalsAndPackages() ... DONE [18:42:13.977] run() for 'Future' ... [18:42:13.977] - state: 'created' [18:42:13.978] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:13.981] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:13.982] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:13.982] - Field: 'label' [18:42:13.982] - Field: 'local' [18:42:13.983] - Field: 'owner' [18:42:13.983] - Field: 'envir' [18:42:13.983] - Field: 'packages' [18:42:13.983] - Field: 'gc' [18:42:13.984] - Field: 'conditions' [18:42:13.984] - Field: 'expr' [18:42:13.984] - Field: 'uuid' [18:42:13.985] - Field: 'seed' [18:42:13.985] - Field: 'version' [18:42:13.985] - Field: 'result' [18:42:13.986] - Field: 'asynchronous' [18:42:13.986] - Field: 'calls' [18:42:13.986] - Field: 'globals' [18:42:13.986] - Field: 'stdout' [18:42:13.987] - Field: 'earlySignal' [18:42:13.987] - Field: 'lazy' [18:42:13.987] - Field: 'state' [18:42:13.988] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:13.988] - Launch lazy future ... [18:42:13.988] Packages needed by the future expression (n = 0): [18:42:13.989] Packages needed by future strategies (n = 0): [18:42:13.990] { [18:42:13.990] { [18:42:13.990] { [18:42:13.990] ...future.startTime <- base::Sys.time() [18:42:13.990] { [18:42:13.990] { [18:42:13.990] { [18:42:13.990] base::local({ [18:42:13.990] has_future <- base::requireNamespace("future", [18:42:13.990] quietly = TRUE) [18:42:13.990] if (has_future) { [18:42:13.990] ns <- base::getNamespace("future") [18:42:13.990] version <- ns[[".package"]][["version"]] [18:42:13.990] if (is.null(version)) [18:42:13.990] version <- utils::packageVersion("future") [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] version <- NULL [18:42:13.990] } [18:42:13.990] if (!has_future || version < "1.8.0") { [18:42:13.990] info <- base::c(r_version = base::gsub("R version ", [18:42:13.990] "", base::R.version$version.string), [18:42:13.990] platform = base::sprintf("%s (%s-bit)", [18:42:13.990] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:13.990] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:13.990] "release", "version")], collapse = " "), [18:42:13.990] hostname = base::Sys.info()[["nodename"]]) [18:42:13.990] info <- base::sprintf("%s: %s", base::names(info), [18:42:13.990] info) [18:42:13.990] info <- base::paste(info, collapse = "; ") [18:42:13.990] if (!has_future) { [18:42:13.990] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:13.990] info) [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:13.990] info, version) [18:42:13.990] } [18:42:13.990] base::stop(msg) [18:42:13.990] } [18:42:13.990] }) [18:42:13.990] } [18:42:13.990] ...future.strategy.old <- future::plan("list") [18:42:13.990] options(future.plan = NULL) [18:42:13.990] Sys.unsetenv("R_FUTURE_PLAN") [18:42:13.990] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:13.990] } [18:42:13.990] ...future.workdir <- getwd() [18:42:13.990] } [18:42:13.990] ...future.oldOptions <- base::as.list(base::.Options) [18:42:13.990] ...future.oldEnvVars <- base::Sys.getenv() [18:42:13.990] } [18:42:13.990] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:13.990] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:13.990] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:13.990] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:13.990] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:13.990] future.stdout.windows.reencode = NULL, width = 80L) [18:42:13.990] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:13.990] base::names(...future.oldOptions)) [18:42:13.990] } [18:42:13.990] if (TRUE) { [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] if (NA) { [18:42:13.990] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:13.990] open = "w") [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:13.990] windows = "NUL", "/dev/null"), open = "w") [18:42:13.990] } [18:42:13.990] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:13.990] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:13.990] base::sink(type = "output", split = FALSE) [18:42:13.990] base::close(...future.stdout) [18:42:13.990] }, add = TRUE) [18:42:13.990] } [18:42:13.990] ...future.frame <- base::sys.nframe() [18:42:13.990] ...future.conditions <- base::list() [18:42:13.990] ...future.rng <- base::globalenv()$.Random.seed [18:42:13.990] if (FALSE) { [18:42:13.990] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:13.990] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:13.990] } [18:42:13.990] ...future.result <- base::tryCatch({ [18:42:13.990] base::withCallingHandlers({ [18:42:13.990] ...future.value <- base::withVisible(base::local({ [18:42:13.990] do.call(function(...) { [18:42:13.990] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:13.990] if (!identical(...future.globals.maxSize.org, [18:42:13.990] ...future.globals.maxSize)) { [18:42:13.990] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:13.990] on.exit(options(oopts), add = TRUE) [18:42:13.990] } [18:42:13.990] { [18:42:13.990] lapply(seq_along(...future.elements_ii), [18:42:13.990] FUN = function(jj) { [18:42:13.990] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:13.990] ...future.FUN(...future.X_jj, ...) [18:42:13.990] }) [18:42:13.990] } [18:42:13.990] }, args = future.call.arguments) [18:42:13.990] })) [18:42:13.990] future::FutureResult(value = ...future.value$value, [18:42:13.990] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:13.990] ...future.rng), globalenv = if (FALSE) [18:42:13.990] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:13.990] ...future.globalenv.names)) [18:42:13.990] else NULL, started = ...future.startTime, version = "1.8") [18:42:13.990] }, condition = base::local({ [18:42:13.990] c <- base::c [18:42:13.990] inherits <- base::inherits [18:42:13.990] invokeRestart <- base::invokeRestart [18:42:13.990] length <- base::length [18:42:13.990] list <- base::list [18:42:13.990] seq.int <- base::seq.int [18:42:13.990] signalCondition <- base::signalCondition [18:42:13.990] sys.calls <- base::sys.calls [18:42:13.990] `[[` <- base::`[[` [18:42:13.990] `+` <- base::`+` [18:42:13.990] `<<-` <- base::`<<-` [18:42:13.990] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:13.990] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:13.990] 3L)] [18:42:13.990] } [18:42:13.990] function(cond) { [18:42:13.990] is_error <- inherits(cond, "error") [18:42:13.990] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:13.990] NULL) [18:42:13.990] if (is_error) { [18:42:13.990] sessionInformation <- function() { [18:42:13.990] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:13.990] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:13.990] search = base::search(), system = base::Sys.info()) [18:42:13.990] } [18:42:13.990] ...future.conditions[[length(...future.conditions) + [18:42:13.990] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:13.990] cond$call), session = sessionInformation(), [18:42:13.990] timestamp = base::Sys.time(), signaled = 0L) [18:42:13.990] signalCondition(cond) [18:42:13.990] } [18:42:13.990] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:13.990] "immediateCondition"))) { [18:42:13.990] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:13.990] ...future.conditions[[length(...future.conditions) + [18:42:13.990] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:13.990] if (TRUE && !signal) { [18:42:13.990] muffleCondition <- function (cond, pattern = "^muffle") [18:42:13.990] { [18:42:13.990] inherits <- base::inherits [18:42:13.990] invokeRestart <- base::invokeRestart [18:42:13.990] is.null <- base::is.null [18:42:13.990] muffled <- FALSE [18:42:13.990] if (inherits(cond, "message")) { [18:42:13.990] muffled <- grepl(pattern, "muffleMessage") [18:42:13.990] if (muffled) [18:42:13.990] invokeRestart("muffleMessage") [18:42:13.990] } [18:42:13.990] else if (inherits(cond, "warning")) { [18:42:13.990] muffled <- grepl(pattern, "muffleWarning") [18:42:13.990] if (muffled) [18:42:13.990] invokeRestart("muffleWarning") [18:42:13.990] } [18:42:13.990] else if (inherits(cond, "condition")) { [18:42:13.990] if (!is.null(pattern)) { [18:42:13.990] computeRestarts <- base::computeRestarts [18:42:13.990] grepl <- base::grepl [18:42:13.990] restarts <- computeRestarts(cond) [18:42:13.990] for (restart in restarts) { [18:42:13.990] name <- restart$name [18:42:13.990] if (is.null(name)) [18:42:13.990] next [18:42:13.990] if (!grepl(pattern, name)) [18:42:13.990] next [18:42:13.990] invokeRestart(restart) [18:42:13.990] muffled <- TRUE [18:42:13.990] break [18:42:13.990] } [18:42:13.990] } [18:42:13.990] } [18:42:13.990] invisible(muffled) [18:42:13.990] } [18:42:13.990] muffleCondition(cond, pattern = "^muffle") [18:42:13.990] } [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] if (TRUE) { [18:42:13.990] muffleCondition <- function (cond, pattern = "^muffle") [18:42:13.990] { [18:42:13.990] inherits <- base::inherits [18:42:13.990] invokeRestart <- base::invokeRestart [18:42:13.990] is.null <- base::is.null [18:42:13.990] muffled <- FALSE [18:42:13.990] if (inherits(cond, "message")) { [18:42:13.990] muffled <- grepl(pattern, "muffleMessage") [18:42:13.990] if (muffled) [18:42:13.990] invokeRestart("muffleMessage") [18:42:13.990] } [18:42:13.990] else if (inherits(cond, "warning")) { [18:42:13.990] muffled <- grepl(pattern, "muffleWarning") [18:42:13.990] if (muffled) [18:42:13.990] invokeRestart("muffleWarning") [18:42:13.990] } [18:42:13.990] else if (inherits(cond, "condition")) { [18:42:13.990] if (!is.null(pattern)) { [18:42:13.990] computeRestarts <- base::computeRestarts [18:42:13.990] grepl <- base::grepl [18:42:13.990] restarts <- computeRestarts(cond) [18:42:13.990] for (restart in restarts) { [18:42:13.990] name <- restart$name [18:42:13.990] if (is.null(name)) [18:42:13.990] next [18:42:13.990] if (!grepl(pattern, name)) [18:42:13.990] next [18:42:13.990] invokeRestart(restart) [18:42:13.990] muffled <- TRUE [18:42:13.990] break [18:42:13.990] } [18:42:13.990] } [18:42:13.990] } [18:42:13.990] invisible(muffled) [18:42:13.990] } [18:42:13.990] muffleCondition(cond, pattern = "^muffle") [18:42:13.990] } [18:42:13.990] } [18:42:13.990] } [18:42:13.990] })) [18:42:13.990] }, error = function(ex) { [18:42:13.990] base::structure(base::list(value = NULL, visible = NULL, [18:42:13.990] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:13.990] ...future.rng), started = ...future.startTime, [18:42:13.990] finished = Sys.time(), session_uuid = NA_character_, [18:42:13.990] version = "1.8"), class = "FutureResult") [18:42:13.990] }, finally = { [18:42:13.990] if (!identical(...future.workdir, getwd())) [18:42:13.990] setwd(...future.workdir) [18:42:13.990] { [18:42:13.990] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:13.990] ...future.oldOptions$nwarnings <- NULL [18:42:13.990] } [18:42:13.990] base::options(...future.oldOptions) [18:42:13.990] if (.Platform$OS.type == "windows") { [18:42:13.990] old_names <- names(...future.oldEnvVars) [18:42:13.990] envs <- base::Sys.getenv() [18:42:13.990] names <- names(envs) [18:42:13.990] common <- intersect(names, old_names) [18:42:13.990] added <- setdiff(names, old_names) [18:42:13.990] removed <- setdiff(old_names, names) [18:42:13.990] changed <- common[...future.oldEnvVars[common] != [18:42:13.990] envs[common]] [18:42:13.990] NAMES <- toupper(changed) [18:42:13.990] args <- list() [18:42:13.990] for (kk in seq_along(NAMES)) { [18:42:13.990] name <- changed[[kk]] [18:42:13.990] NAME <- NAMES[[kk]] [18:42:13.990] if (name != NAME && is.element(NAME, old_names)) [18:42:13.990] next [18:42:13.990] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:13.990] } [18:42:13.990] NAMES <- toupper(added) [18:42:13.990] for (kk in seq_along(NAMES)) { [18:42:13.990] name <- added[[kk]] [18:42:13.990] NAME <- NAMES[[kk]] [18:42:13.990] if (name != NAME && is.element(NAME, old_names)) [18:42:13.990] next [18:42:13.990] args[[name]] <- "" [18:42:13.990] } [18:42:13.990] NAMES <- toupper(removed) [18:42:13.990] for (kk in seq_along(NAMES)) { [18:42:13.990] name <- removed[[kk]] [18:42:13.990] NAME <- NAMES[[kk]] [18:42:13.990] if (name != NAME && is.element(NAME, old_names)) [18:42:13.990] next [18:42:13.990] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:13.990] } [18:42:13.990] if (length(args) > 0) [18:42:13.990] base::do.call(base::Sys.setenv, args = args) [18:42:13.990] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:13.990] } [18:42:13.990] { [18:42:13.990] if (base::length(...future.futureOptionsAdded) > [18:42:13.990] 0L) { [18:42:13.990] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:13.990] base::names(opts) <- ...future.futureOptionsAdded [18:42:13.990] base::options(opts) [18:42:13.990] } [18:42:13.990] { [18:42:13.990] { [18:42:13.990] NULL [18:42:13.990] RNGkind("Mersenne-Twister") [18:42:13.990] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:13.990] inherits = FALSE) [18:42:13.990] } [18:42:13.990] options(future.plan = NULL) [18:42:13.990] if (is.na(NA_character_)) [18:42:13.990] Sys.unsetenv("R_FUTURE_PLAN") [18:42:13.990] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:13.990] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:13.990] .init = FALSE) [18:42:13.990] } [18:42:13.990] } [18:42:13.990] } [18:42:13.990] }) [18:42:13.990] if (FALSE) { [18:42:13.990] base::sink(type = "output", split = FALSE) [18:42:13.990] if (NA) { [18:42:13.990] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:13.990] } [18:42:13.990] else { [18:42:13.990] ...future.result["stdout"] <- base::list(NULL) [18:42:13.990] } [18:42:13.990] base::close(...future.stdout) [18:42:13.990] ...future.stdout <- NULL [18:42:13.990] } [18:42:13.990] ...future.result$conditions <- ...future.conditions [18:42:13.990] ...future.result$finished <- base::Sys.time() [18:42:13.990] ...future.result [18:42:13.990] } [18:42:13.996] assign_globals() ... [18:42:13.996] List of 5 [18:42:13.996] $ ...future.FUN :function (x) [18:42:13.996] $ future.call.arguments : list() [18:42:13.996] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:13.996] $ ...future.elements_ii :List of 2 [18:42:13.996] ..$ : int 1 [18:42:13.996] ..$ : int 0 [18:42:13.996] $ ...future.seeds_ii : NULL [18:42:13.996] $ ...future.globals.maxSize: NULL [18:42:13.996] - attr(*, "where")=List of 5 [18:42:13.996] ..$ ...future.FUN : [18:42:13.996] ..$ future.call.arguments : [18:42:13.996] ..$ ...future.elements_ii : [18:42:13.996] ..$ ...future.seeds_ii : [18:42:13.996] ..$ ...future.globals.maxSize: [18:42:13.996] - attr(*, "resolved")= logi FALSE [18:42:13.996] - attr(*, "total_size")= num 5632 [18:42:13.996] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:13.996] - attr(*, "already-done")= logi TRUE [18:42:14.010] - reassign environment for '...future.FUN' [18:42:14.011] - copied '...future.FUN' to environment [18:42:14.011] - copied 'future.call.arguments' to environment [18:42:14.011] - copied '...future.elements_ii' to environment [18:42:14.011] - copied '...future.seeds_ii' to environment [18:42:14.012] - copied '...future.globals.maxSize' to environment [18:42:14.012] assign_globals() ... done [18:42:14.012] plan(): Setting new future strategy stack: [18:42:14.013] List of future strategies: [18:42:14.013] 1. sequential: [18:42:14.013] - args: function (..., envir = parent.frame(), workers = "") [18:42:14.013] - tweaked: FALSE [18:42:14.013] - call: NULL [18:42:14.014] plan(): nbrOfWorkers() = 1 [18:42:14.524] plan(): Setting new future strategy stack: [18:42:14.524] List of future strategies: [18:42:14.524] 1. multisession: [18:42:14.524] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:14.524] - tweaked: FALSE [18:42:14.524] - call: plan(strategy) [18:42:14.529] plan(): nbrOfWorkers() = 1 [18:42:14.530] SequentialFuture started (and completed) [18:42:14.530] - Launch lazy future ... done [18:42:14.531] run() for 'SequentialFuture' ... done [18:42:14.531] Created future: [18:42:14.531] SequentialFuture: [18:42:14.531] Label: 'future_lapply-1' [18:42:14.531] Expression: [18:42:14.531] { [18:42:14.531] do.call(function(...) { [18:42:14.531] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:14.531] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:14.531] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:14.531] on.exit(options(oopts), add = TRUE) [18:42:14.531] } [18:42:14.531] { [18:42:14.531] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:14.531] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:14.531] ...future.FUN(...future.X_jj, ...) [18:42:14.531] }) [18:42:14.531] } [18:42:14.531] }, args = future.call.arguments) [18:42:14.531] } [18:42:14.531] Lazy evaluation: FALSE [18:42:14.531] Asynchronous evaluation: FALSE [18:42:14.531] Local evaluation: TRUE [18:42:14.531] Environment: R_GlobalEnv [18:42:14.531] Capture standard output: NA [18:42:14.531] Capture condition classes: 'condition' (excluding 'nothing') [18:42:14.531] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:14.531] Packages: [18:42:14.531] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:14.531] Resolved: TRUE [18:42:14.531] Value: 55 bytes of class 'list' [18:42:14.531] Early signaling: FALSE [18:42:14.531] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:14.531] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:14.534] Chunk #1 of 1 ... DONE [18:42:14.534] Launching 1 futures (chunks) ... DONE [18:42:14.534] Resolving 1 futures (chunks) ... [18:42:14.535] resolve() on list ... [18:42:14.535] recursive: 0 [18:42:14.535] length: 1 [18:42:14.536] [18:42:14.536] resolved() for 'SequentialFuture' ... [18:42:14.536] - state: 'finished' [18:42:14.537] - run: TRUE [18:42:14.537] - result: 'FutureResult' [18:42:14.537] resolved() for 'SequentialFuture' ... done [18:42:14.538] Future #1 [18:42:14.538] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:14.539] - nx: 1 [18:42:14.539] - relay: TRUE [18:42:14.539] - stdout: TRUE [18:42:14.539] - signal: TRUE [18:42:14.540] - resignal: FALSE [18:42:14.540] - force: TRUE [18:42:14.540] - relayed: [n=1] FALSE [18:42:14.541] - queued futures: [n=1] FALSE [18:42:14.541] - until=1 [18:42:14.541] - relaying element #1 [18:42:14.542] - relayed: [n=1] TRUE [18:42:14.542] - queued futures: [n=1] TRUE [18:42:14.542] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:14.543] length: 0 (resolved future 1) [18:42:14.543] Relaying remaining futures [18:42:14.543] signalConditionsASAP(NULL, pos=0) ... [18:42:14.544] - nx: 1 [18:42:14.544] - relay: TRUE [18:42:14.544] - stdout: TRUE [18:42:14.544] - signal: TRUE [18:42:14.545] - resignal: FALSE [18:42:14.545] - force: TRUE [18:42:14.545] - relayed: [n=1] TRUE [18:42:14.546] - queued futures: [n=1] TRUE - flush all [18:42:14.546] - relayed: [n=1] TRUE [18:42:14.546] - queued futures: [n=1] TRUE [18:42:14.547] signalConditionsASAP(NULL, pos=0) ... done [18:42:14.547] resolve() on list ... DONE [18:42:14.547] - Number of value chunks collected: 1 [18:42:14.548] Resolving 1 futures (chunks) ... DONE [18:42:14.548] Reducing values from 1 chunks ... [18:42:14.548] - Number of values collected after concatenation: 2 [18:42:14.549] - Number of values expected: 2 [18:42:14.549] Reducing values from 1 chunks ... DONE [18:42:14.549] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = NA) ... DONE * future_mapply(x, ..., future.stdout = FALSE) ... [18:42:14.550] future_mapply() ... [18:42:14.555] Number of chunks: 1 [18:42:14.555] getGlobalsAndPackagesXApply() ... [18:42:14.555] - future.globals: TRUE [18:42:14.556] getGlobalsAndPackages() ... [18:42:14.556] Searching for globals... [18:42:14.560] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:14.560] Searching for globals ... DONE [18:42:14.560] Resolving globals: FALSE [18:42:14.561] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:14.562] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:14.566] - globals: [1] 'FUN' [18:42:14.566] [18:42:14.566] getGlobalsAndPackages() ... DONE [18:42:14.567] - globals found/used: [n=1] 'FUN' [18:42:14.567] - needed namespaces: [n=0] [18:42:14.567] Finding globals ... DONE [18:42:14.568] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:14.569] List of 2 [18:42:14.569] $ ...future.FUN:function (x, y) [18:42:14.569] $ MoreArgs : NULL [18:42:14.569] - attr(*, "where")=List of 2 [18:42:14.569] ..$ ...future.FUN: [18:42:14.569] ..$ MoreArgs : [18:42:14.569] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:14.569] - attr(*, "resolved")= logi FALSE [18:42:14.569] - attr(*, "total_size")= num NA [18:42:14.575] Packages to be attached in all futures: [n=0] [18:42:14.575] getGlobalsAndPackagesXApply() ... DONE [18:42:14.576] Number of futures (= number of chunks): 1 [18:42:14.576] Launching 1 futures (chunks) ... [18:42:14.576] Chunk #1 of 1 ... [18:42:14.577] - Finding globals in '...' for chunk #1 ... [18:42:14.577] getGlobalsAndPackages() ... [18:42:14.577] Searching for globals... [18:42:14.578] [18:42:14.579] Searching for globals ... DONE [18:42:14.579] - globals: [0] [18:42:14.579] getGlobalsAndPackages() ... DONE [18:42:14.579] + additional globals found: [n=0] [18:42:14.580] + additional namespaces needed: [n=0] [18:42:14.580] - Finding globals in '...' for chunk #1 ... DONE [18:42:14.580] - seeds: [18:42:14.581] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:14.581] getGlobalsAndPackages() ... [18:42:14.581] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:14.582] Resolving globals: FALSE [18:42:14.583] The total size of the 5 globals is 1.21 KiB (1242 bytes) [18:42:14.584] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (95 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:14.584] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:14.584] [18:42:14.585] getGlobalsAndPackages() ... DONE [18:42:14.585] run() for 'Future' ... [18:42:14.586] - state: 'created' [18:42:14.586] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:14.591] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:14.591] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:14.591] - Field: 'label' [18:42:14.592] - Field: 'local' [18:42:14.592] - Field: 'owner' [18:42:14.592] - Field: 'envir' [18:42:14.593] - Field: 'packages' [18:42:14.593] - Field: 'gc' [18:42:14.593] - Field: 'conditions' [18:42:14.594] - Field: 'expr' [18:42:14.594] - Field: 'uuid' [18:42:14.594] - Field: 'seed' [18:42:14.595] - Field: 'version' [18:42:14.595] - Field: 'result' [18:42:14.595] - Field: 'asynchronous' [18:42:14.596] - Field: 'calls' [18:42:14.596] - Field: 'globals' [18:42:14.596] - Field: 'stdout' [18:42:14.597] - Field: 'earlySignal' [18:42:14.597] - Field: 'lazy' [18:42:14.597] - Field: 'state' [18:42:14.597] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:14.598] - Launch lazy future ... [18:42:14.598] Packages needed by the future expression (n = 0): [18:42:14.599] Packages needed by future strategies (n = 0): [18:42:14.600] { [18:42:14.600] { [18:42:14.600] { [18:42:14.600] ...future.startTime <- base::Sys.time() [18:42:14.600] { [18:42:14.600] { [18:42:14.600] { [18:42:14.600] base::local({ [18:42:14.600] has_future <- base::requireNamespace("future", [18:42:14.600] quietly = TRUE) [18:42:14.600] if (has_future) { [18:42:14.600] ns <- base::getNamespace("future") [18:42:14.600] version <- ns[[".package"]][["version"]] [18:42:14.600] if (is.null(version)) [18:42:14.600] version <- utils::packageVersion("future") [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] version <- NULL [18:42:14.600] } [18:42:14.600] if (!has_future || version < "1.8.0") { [18:42:14.600] info <- base::c(r_version = base::gsub("R version ", [18:42:14.600] "", base::R.version$version.string), [18:42:14.600] platform = base::sprintf("%s (%s-bit)", [18:42:14.600] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:14.600] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:14.600] "release", "version")], collapse = " "), [18:42:14.600] hostname = base::Sys.info()[["nodename"]]) [18:42:14.600] info <- base::sprintf("%s: %s", base::names(info), [18:42:14.600] info) [18:42:14.600] info <- base::paste(info, collapse = "; ") [18:42:14.600] if (!has_future) { [18:42:14.600] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:14.600] info) [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:14.600] info, version) [18:42:14.600] } [18:42:14.600] base::stop(msg) [18:42:14.600] } [18:42:14.600] }) [18:42:14.600] } [18:42:14.600] ...future.strategy.old <- future::plan("list") [18:42:14.600] options(future.plan = NULL) [18:42:14.600] Sys.unsetenv("R_FUTURE_PLAN") [18:42:14.600] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:14.600] } [18:42:14.600] ...future.workdir <- getwd() [18:42:14.600] } [18:42:14.600] ...future.oldOptions <- base::as.list(base::.Options) [18:42:14.600] ...future.oldEnvVars <- base::Sys.getenv() [18:42:14.600] } [18:42:14.600] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:14.600] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:14.600] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:14.600] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:14.600] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:14.600] future.stdout.windows.reencode = NULL, width = 80L) [18:42:14.600] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:14.600] base::names(...future.oldOptions)) [18:42:14.600] } [18:42:14.600] if (FALSE) { [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] if (FALSE) { [18:42:14.600] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:14.600] open = "w") [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:14.600] windows = "NUL", "/dev/null"), open = "w") [18:42:14.600] } [18:42:14.600] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:14.600] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:14.600] base::sink(type = "output", split = FALSE) [18:42:14.600] base::close(...future.stdout) [18:42:14.600] }, add = TRUE) [18:42:14.600] } [18:42:14.600] ...future.frame <- base::sys.nframe() [18:42:14.600] ...future.conditions <- base::list() [18:42:14.600] ...future.rng <- base::globalenv()$.Random.seed [18:42:14.600] if (FALSE) { [18:42:14.600] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:14.600] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:14.600] } [18:42:14.600] ...future.result <- base::tryCatch({ [18:42:14.600] base::withCallingHandlers({ [18:42:14.600] ...future.value <- base::withVisible(base::local({ [18:42:14.600] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:14.600] if (!identical(...future.globals.maxSize.org, [18:42:14.600] ...future.globals.maxSize)) { [18:42:14.600] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:14.600] on.exit(options(oopts), add = TRUE) [18:42:14.600] } [18:42:14.600] { [18:42:14.600] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:14.600] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:14.600] USE.NAMES = FALSE) [18:42:14.600] do.call(mapply, args = args) [18:42:14.600] } [18:42:14.600] })) [18:42:14.600] future::FutureResult(value = ...future.value$value, [18:42:14.600] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:14.600] ...future.rng), globalenv = if (FALSE) [18:42:14.600] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:14.600] ...future.globalenv.names)) [18:42:14.600] else NULL, started = ...future.startTime, version = "1.8") [18:42:14.600] }, condition = base::local({ [18:42:14.600] c <- base::c [18:42:14.600] inherits <- base::inherits [18:42:14.600] invokeRestart <- base::invokeRestart [18:42:14.600] length <- base::length [18:42:14.600] list <- base::list [18:42:14.600] seq.int <- base::seq.int [18:42:14.600] signalCondition <- base::signalCondition [18:42:14.600] sys.calls <- base::sys.calls [18:42:14.600] `[[` <- base::`[[` [18:42:14.600] `+` <- base::`+` [18:42:14.600] `<<-` <- base::`<<-` [18:42:14.600] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:14.600] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:14.600] 3L)] [18:42:14.600] } [18:42:14.600] function(cond) { [18:42:14.600] is_error <- inherits(cond, "error") [18:42:14.600] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:14.600] NULL) [18:42:14.600] if (is_error) { [18:42:14.600] sessionInformation <- function() { [18:42:14.600] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:14.600] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:14.600] search = base::search(), system = base::Sys.info()) [18:42:14.600] } [18:42:14.600] ...future.conditions[[length(...future.conditions) + [18:42:14.600] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:14.600] cond$call), session = sessionInformation(), [18:42:14.600] timestamp = base::Sys.time(), signaled = 0L) [18:42:14.600] signalCondition(cond) [18:42:14.600] } [18:42:14.600] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:14.600] "immediateCondition"))) { [18:42:14.600] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:14.600] ...future.conditions[[length(...future.conditions) + [18:42:14.600] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:14.600] if (TRUE && !signal) { [18:42:14.600] muffleCondition <- function (cond, pattern = "^muffle") [18:42:14.600] { [18:42:14.600] inherits <- base::inherits [18:42:14.600] invokeRestart <- base::invokeRestart [18:42:14.600] is.null <- base::is.null [18:42:14.600] muffled <- FALSE [18:42:14.600] if (inherits(cond, "message")) { [18:42:14.600] muffled <- grepl(pattern, "muffleMessage") [18:42:14.600] if (muffled) [18:42:14.600] invokeRestart("muffleMessage") [18:42:14.600] } [18:42:14.600] else if (inherits(cond, "warning")) { [18:42:14.600] muffled <- grepl(pattern, "muffleWarning") [18:42:14.600] if (muffled) [18:42:14.600] invokeRestart("muffleWarning") [18:42:14.600] } [18:42:14.600] else if (inherits(cond, "condition")) { [18:42:14.600] if (!is.null(pattern)) { [18:42:14.600] computeRestarts <- base::computeRestarts [18:42:14.600] grepl <- base::grepl [18:42:14.600] restarts <- computeRestarts(cond) [18:42:14.600] for (restart in restarts) { [18:42:14.600] name <- restart$name [18:42:14.600] if (is.null(name)) [18:42:14.600] next [18:42:14.600] if (!grepl(pattern, name)) [18:42:14.600] next [18:42:14.600] invokeRestart(restart) [18:42:14.600] muffled <- TRUE [18:42:14.600] break [18:42:14.600] } [18:42:14.600] } [18:42:14.600] } [18:42:14.600] invisible(muffled) [18:42:14.600] } [18:42:14.600] muffleCondition(cond, pattern = "^muffle") [18:42:14.600] } [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] if (TRUE) { [18:42:14.600] muffleCondition <- function (cond, pattern = "^muffle") [18:42:14.600] { [18:42:14.600] inherits <- base::inherits [18:42:14.600] invokeRestart <- base::invokeRestart [18:42:14.600] is.null <- base::is.null [18:42:14.600] muffled <- FALSE [18:42:14.600] if (inherits(cond, "message")) { [18:42:14.600] muffled <- grepl(pattern, "muffleMessage") [18:42:14.600] if (muffled) [18:42:14.600] invokeRestart("muffleMessage") [18:42:14.600] } [18:42:14.600] else if (inherits(cond, "warning")) { [18:42:14.600] muffled <- grepl(pattern, "muffleWarning") [18:42:14.600] if (muffled) [18:42:14.600] invokeRestart("muffleWarning") [18:42:14.600] } [18:42:14.600] else if (inherits(cond, "condition")) { [18:42:14.600] if (!is.null(pattern)) { [18:42:14.600] computeRestarts <- base::computeRestarts [18:42:14.600] grepl <- base::grepl [18:42:14.600] restarts <- computeRestarts(cond) [18:42:14.600] for (restart in restarts) { [18:42:14.600] name <- restart$name [18:42:14.600] if (is.null(name)) [18:42:14.600] next [18:42:14.600] if (!grepl(pattern, name)) [18:42:14.600] next [18:42:14.600] invokeRestart(restart) [18:42:14.600] muffled <- TRUE [18:42:14.600] break [18:42:14.600] } [18:42:14.600] } [18:42:14.600] } [18:42:14.600] invisible(muffled) [18:42:14.600] } [18:42:14.600] muffleCondition(cond, pattern = "^muffle") [18:42:14.600] } [18:42:14.600] } [18:42:14.600] } [18:42:14.600] })) [18:42:14.600] }, error = function(ex) { [18:42:14.600] base::structure(base::list(value = NULL, visible = NULL, [18:42:14.600] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:14.600] ...future.rng), started = ...future.startTime, [18:42:14.600] finished = Sys.time(), session_uuid = NA_character_, [18:42:14.600] version = "1.8"), class = "FutureResult") [18:42:14.600] }, finally = { [18:42:14.600] if (!identical(...future.workdir, getwd())) [18:42:14.600] setwd(...future.workdir) [18:42:14.600] { [18:42:14.600] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:14.600] ...future.oldOptions$nwarnings <- NULL [18:42:14.600] } [18:42:14.600] base::options(...future.oldOptions) [18:42:14.600] if (.Platform$OS.type == "windows") { [18:42:14.600] old_names <- names(...future.oldEnvVars) [18:42:14.600] envs <- base::Sys.getenv() [18:42:14.600] names <- names(envs) [18:42:14.600] common <- intersect(names, old_names) [18:42:14.600] added <- setdiff(names, old_names) [18:42:14.600] removed <- setdiff(old_names, names) [18:42:14.600] changed <- common[...future.oldEnvVars[common] != [18:42:14.600] envs[common]] [18:42:14.600] NAMES <- toupper(changed) [18:42:14.600] args <- list() [18:42:14.600] for (kk in seq_along(NAMES)) { [18:42:14.600] name <- changed[[kk]] [18:42:14.600] NAME <- NAMES[[kk]] [18:42:14.600] if (name != NAME && is.element(NAME, old_names)) [18:42:14.600] next [18:42:14.600] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:14.600] } [18:42:14.600] NAMES <- toupper(added) [18:42:14.600] for (kk in seq_along(NAMES)) { [18:42:14.600] name <- added[[kk]] [18:42:14.600] NAME <- NAMES[[kk]] [18:42:14.600] if (name != NAME && is.element(NAME, old_names)) [18:42:14.600] next [18:42:14.600] args[[name]] <- "" [18:42:14.600] } [18:42:14.600] NAMES <- toupper(removed) [18:42:14.600] for (kk in seq_along(NAMES)) { [18:42:14.600] name <- removed[[kk]] [18:42:14.600] NAME <- NAMES[[kk]] [18:42:14.600] if (name != NAME && is.element(NAME, old_names)) [18:42:14.600] next [18:42:14.600] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:14.600] } [18:42:14.600] if (length(args) > 0) [18:42:14.600] base::do.call(base::Sys.setenv, args = args) [18:42:14.600] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:14.600] } [18:42:14.600] { [18:42:14.600] if (base::length(...future.futureOptionsAdded) > [18:42:14.600] 0L) { [18:42:14.600] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:14.600] base::names(opts) <- ...future.futureOptionsAdded [18:42:14.600] base::options(opts) [18:42:14.600] } [18:42:14.600] { [18:42:14.600] { [18:42:14.600] NULL [18:42:14.600] RNGkind("Mersenne-Twister") [18:42:14.600] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:14.600] inherits = FALSE) [18:42:14.600] } [18:42:14.600] options(future.plan = NULL) [18:42:14.600] if (is.na(NA_character_)) [18:42:14.600] Sys.unsetenv("R_FUTURE_PLAN") [18:42:14.600] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:14.600] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:14.600] .init = FALSE) [18:42:14.600] } [18:42:14.600] } [18:42:14.600] } [18:42:14.600] }) [18:42:14.600] if (TRUE) { [18:42:14.600] base::sink(type = "output", split = FALSE) [18:42:14.600] if (FALSE) { [18:42:14.600] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:14.600] } [18:42:14.600] else { [18:42:14.600] ...future.result["stdout"] <- base::list(NULL) [18:42:14.600] } [18:42:14.600] base::close(...future.stdout) [18:42:14.600] ...future.stdout <- NULL [18:42:14.600] } [18:42:14.600] ...future.result$conditions <- ...future.conditions [18:42:14.600] ...future.result$finished <- base::Sys.time() [18:42:14.600] ...future.result [18:42:14.600] } [18:42:14.607] assign_globals() ... [18:42:14.607] List of 5 [18:42:14.607] $ ...future.FUN :function (x, y) [18:42:14.607] $ MoreArgs : NULL [18:42:14.607] $ ...future.elements_ii :List of 2 [18:42:14.607] ..$ :List of 2 [18:42:14.607] .. ..$ : int 1 [18:42:14.607] .. ..$ : int 0 [18:42:14.607] ..$ :List of 2 [18:42:14.607] .. ..$ : int 0 [18:42:14.607] .. ..$ : int 1 [18:42:14.607] $ ...future.seeds_ii : NULL [18:42:14.607] $ ...future.globals.maxSize: NULL [18:42:14.607] - attr(*, "where")=List of 5 [18:42:14.607] ..$ ...future.FUN : [18:42:14.607] ..$ MoreArgs : [18:42:14.607] ..$ ...future.elements_ii : [18:42:14.607] ..$ ...future.seeds_ii : [18:42:14.607] ..$ ...future.globals.maxSize: [18:42:14.607] - attr(*, "resolved")= logi FALSE [18:42:14.607] - attr(*, "total_size")= int 1242 [18:42:14.607] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:14.607] - attr(*, "already-done")= logi TRUE [18:42:14.623] - reassign environment for '...future.FUN' [18:42:14.623] - copied '...future.FUN' to environment [18:42:14.624] - copied 'MoreArgs' to environment [18:42:14.624] - copied '...future.elements_ii' to environment [18:42:14.624] - copied '...future.seeds_ii' to environment [18:42:14.625] - copied '...future.globals.maxSize' to environment [18:42:14.625] assign_globals() ... done [18:42:14.626] plan(): Setting new future strategy stack: [18:42:14.626] List of future strategies: [18:42:14.626] 1. sequential: [18:42:14.626] - args: function (..., envir = parent.frame(), workers = "") [18:42:14.626] - tweaked: FALSE [18:42:14.626] - call: NULL [18:42:14.627] plan(): nbrOfWorkers() = 1 [18:42:15.133] plan(): Setting new future strategy stack: [18:42:15.134] List of future strategies: [18:42:15.134] 1. multisession: [18:42:15.134] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:15.134] - tweaked: FALSE [18:42:15.134] - call: plan(strategy) [18:42:15.139] plan(): nbrOfWorkers() = 1 [18:42:15.140] SequentialFuture started (and completed) [18:42:15.140] - Launch lazy future ... done [18:42:15.141] run() for 'SequentialFuture' ... done [18:42:15.141] Created future: [18:42:15.141] SequentialFuture: [18:42:15.141] Label: 'future_mapply-1' [18:42:15.141] Expression: [18:42:15.141] { [18:42:15.141] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:15.141] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:15.141] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:15.141] on.exit(options(oopts), add = TRUE) [18:42:15.141] } [18:42:15.141] { [18:42:15.141] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:15.141] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:15.141] do.call(mapply, args = args) [18:42:15.141] } [18:42:15.141] } [18:42:15.141] Lazy evaluation: FALSE [18:42:15.141] Asynchronous evaluation: FALSE [18:42:15.141] Local evaluation: TRUE [18:42:15.141] Environment: R_GlobalEnv [18:42:15.141] Capture standard output: FALSE [18:42:15.141] Capture condition classes: 'condition' (excluding 'nothing') [18:42:15.141] Globals: 5 objects totaling 1.21 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 95 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:15.141] Packages: [18:42:15.141] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:15.141] Resolved: TRUE [18:42:15.141] Value: 184 bytes of class 'list' [18:42:15.141] Early signaling: FALSE [18:42:15.141] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:15.141] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:15.143] Chunk #1 of 1 ... DONE [18:42:15.144] Launching 1 futures (chunks) ... DONE [18:42:15.144] Resolving 1 futures (chunks) ... [18:42:15.144] resolve() on list ... [18:42:15.145] recursive: 0 [18:42:15.145] length: 1 [18:42:15.145] [18:42:15.146] resolved() for 'SequentialFuture' ... [18:42:15.146] - state: 'finished' [18:42:15.146] - run: TRUE [18:42:15.147] - result: 'FutureResult' [18:42:15.147] resolved() for 'SequentialFuture' ... done [18:42:15.148] Future #1 [18:42:15.148] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:15.148] - nx: 1 [18:42:15.149] - relay: TRUE [18:42:15.149] - stdout: TRUE [18:42:15.149] - signal: TRUE [18:42:15.149] - resignal: FALSE [18:42:15.150] - force: TRUE [18:42:15.150] - relayed: [n=1] FALSE [18:42:15.150] - queued futures: [n=1] FALSE [18:42:15.151] - until=1 [18:42:15.151] - relaying element #1 [18:42:15.151] - relayed: [n=1] TRUE [18:42:15.152] - queued futures: [n=1] TRUE [18:42:15.152] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:15.152] length: 0 (resolved future 1) [18:42:15.153] Relaying remaining futures [18:42:15.153] signalConditionsASAP(NULL, pos=0) ... [18:42:15.153] - nx: 1 [18:42:15.154] - relay: TRUE [18:42:15.154] - stdout: TRUE [18:42:15.154] - signal: TRUE [18:42:15.154] - resignal: FALSE [18:42:15.155] - force: TRUE [18:42:15.155] - relayed: [n=1] TRUE [18:42:15.155] - queued futures: [n=1] TRUE - flush all [18:42:15.156] - relayed: [n=1] TRUE [18:42:15.156] - queued futures: [n=1] TRUE [18:42:15.156] signalConditionsASAP(NULL, pos=0) ... done [18:42:15.157] resolve() on list ... DONE [18:42:15.157] - Number of value chunks collected: 1 [18:42:15.157] Resolving 1 futures (chunks) ... DONE [18:42:15.158] Reducing values from 1 chunks ... [18:42:15.158] - Number of values collected after concatenation: 2 [18:42:15.158] - Number of values expected: 2 [18:42:15.159] Reducing values from 1 chunks ... DONE [18:42:15.159] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = FALSE) ... DONE * future_mapply(x, ..., future.stdout = TRUE) ... [18:42:15.160] future_mapply() ... [18:42:15.164] Number of chunks: 1 [18:42:15.165] getGlobalsAndPackagesXApply() ... [18:42:15.165] - future.globals: TRUE [18:42:15.165] getGlobalsAndPackages() ... [18:42:15.166] Searching for globals... [18:42:15.169] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:15.170] Searching for globals ... DONE [18:42:15.170] Resolving globals: FALSE [18:42:15.171] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:15.172] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:15.172] - globals: [1] 'FUN' [18:42:15.173] [18:42:15.173] getGlobalsAndPackages() ... DONE [18:42:15.173] - globals found/used: [n=1] 'FUN' [18:42:15.174] - needed namespaces: [n=0] [18:42:15.174] Finding globals ... DONE [18:42:15.175] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:15.175] List of 2 [18:42:15.175] $ ...future.FUN:function (x, y) [18:42:15.175] $ MoreArgs : NULL [18:42:15.175] - attr(*, "where")=List of 2 [18:42:15.175] ..$ ...future.FUN: [18:42:15.175] ..$ MoreArgs : [18:42:15.175] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:15.175] - attr(*, "resolved")= logi FALSE [18:42:15.175] - attr(*, "total_size")= num NA [18:42:15.185] Packages to be attached in all futures: [n=0] [18:42:15.185] getGlobalsAndPackagesXApply() ... DONE [18:42:15.185] Number of futures (= number of chunks): 1 [18:42:15.186] Launching 1 futures (chunks) ... [18:42:15.186] Chunk #1 of 1 ... [18:42:15.187] - Finding globals in '...' for chunk #1 ... [18:42:15.187] getGlobalsAndPackages() ... [18:42:15.187] Searching for globals... [18:42:15.188] [18:42:15.188] Searching for globals ... DONE [18:42:15.188] - globals: [0] [18:42:15.189] getGlobalsAndPackages() ... DONE [18:42:15.189] + additional globals found: [n=0] [18:42:15.189] + additional namespaces needed: [n=0] [18:42:15.190] - Finding globals in '...' for chunk #1 ... DONE [18:42:15.190] - seeds: [18:42:15.190] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:15.191] getGlobalsAndPackages() ... [18:42:15.191] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:15.191] Resolving globals: FALSE [18:42:15.192] The total size of the 5 globals is 1.21 KiB (1242 bytes) [18:42:15.193] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (95 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:15.194] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:15.194] [18:42:15.194] getGlobalsAndPackages() ... DONE [18:42:15.195] run() for 'Future' ... [18:42:15.195] - state: 'created' [18:42:15.196] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:15.200] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:15.201] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:15.201] - Field: 'label' [18:42:15.201] - Field: 'local' [18:42:15.202] - Field: 'owner' [18:42:15.202] - Field: 'envir' [18:42:15.202] - Field: 'packages' [18:42:15.203] - Field: 'gc' [18:42:15.203] - Field: 'conditions' [18:42:15.203] - Field: 'expr' [18:42:15.204] - Field: 'uuid' [18:42:15.204] - Field: 'seed' [18:42:15.204] - Field: 'version' [18:42:15.205] - Field: 'result' [18:42:15.205] - Field: 'asynchronous' [18:42:15.205] - Field: 'calls' [18:42:15.205] - Field: 'globals' [18:42:15.206] - Field: 'stdout' [18:42:15.206] - Field: 'earlySignal' [18:42:15.206] - Field: 'lazy' [18:42:15.207] - Field: 'state' [18:42:15.207] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:15.207] - Launch lazy future ... [18:42:15.208] Packages needed by the future expression (n = 0): [18:42:15.208] Packages needed by future strategies (n = 0): [18:42:15.209] { [18:42:15.209] { [18:42:15.209] { [18:42:15.209] ...future.startTime <- base::Sys.time() [18:42:15.209] { [18:42:15.209] { [18:42:15.209] { [18:42:15.209] base::local({ [18:42:15.209] has_future <- base::requireNamespace("future", [18:42:15.209] quietly = TRUE) [18:42:15.209] if (has_future) { [18:42:15.209] ns <- base::getNamespace("future") [18:42:15.209] version <- ns[[".package"]][["version"]] [18:42:15.209] if (is.null(version)) [18:42:15.209] version <- utils::packageVersion("future") [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] version <- NULL [18:42:15.209] } [18:42:15.209] if (!has_future || version < "1.8.0") { [18:42:15.209] info <- base::c(r_version = base::gsub("R version ", [18:42:15.209] "", base::R.version$version.string), [18:42:15.209] platform = base::sprintf("%s (%s-bit)", [18:42:15.209] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:15.209] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:15.209] "release", "version")], collapse = " "), [18:42:15.209] hostname = base::Sys.info()[["nodename"]]) [18:42:15.209] info <- base::sprintf("%s: %s", base::names(info), [18:42:15.209] info) [18:42:15.209] info <- base::paste(info, collapse = "; ") [18:42:15.209] if (!has_future) { [18:42:15.209] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:15.209] info) [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:15.209] info, version) [18:42:15.209] } [18:42:15.209] base::stop(msg) [18:42:15.209] } [18:42:15.209] }) [18:42:15.209] } [18:42:15.209] ...future.strategy.old <- future::plan("list") [18:42:15.209] options(future.plan = NULL) [18:42:15.209] Sys.unsetenv("R_FUTURE_PLAN") [18:42:15.209] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:15.209] } [18:42:15.209] ...future.workdir <- getwd() [18:42:15.209] } [18:42:15.209] ...future.oldOptions <- base::as.list(base::.Options) [18:42:15.209] ...future.oldEnvVars <- base::Sys.getenv() [18:42:15.209] } [18:42:15.209] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:15.209] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:15.209] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:15.209] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:15.209] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:15.209] future.stdout.windows.reencode = NULL, width = 80L) [18:42:15.209] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:15.209] base::names(...future.oldOptions)) [18:42:15.209] } [18:42:15.209] if (FALSE) { [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] if (TRUE) { [18:42:15.209] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:15.209] open = "w") [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:15.209] windows = "NUL", "/dev/null"), open = "w") [18:42:15.209] } [18:42:15.209] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:15.209] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:15.209] base::sink(type = "output", split = FALSE) [18:42:15.209] base::close(...future.stdout) [18:42:15.209] }, add = TRUE) [18:42:15.209] } [18:42:15.209] ...future.frame <- base::sys.nframe() [18:42:15.209] ...future.conditions <- base::list() [18:42:15.209] ...future.rng <- base::globalenv()$.Random.seed [18:42:15.209] if (FALSE) { [18:42:15.209] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:15.209] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:15.209] } [18:42:15.209] ...future.result <- base::tryCatch({ [18:42:15.209] base::withCallingHandlers({ [18:42:15.209] ...future.value <- base::withVisible(base::local({ [18:42:15.209] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:15.209] if (!identical(...future.globals.maxSize.org, [18:42:15.209] ...future.globals.maxSize)) { [18:42:15.209] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:15.209] on.exit(options(oopts), add = TRUE) [18:42:15.209] } [18:42:15.209] { [18:42:15.209] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:15.209] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:15.209] USE.NAMES = FALSE) [18:42:15.209] do.call(mapply, args = args) [18:42:15.209] } [18:42:15.209] })) [18:42:15.209] future::FutureResult(value = ...future.value$value, [18:42:15.209] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:15.209] ...future.rng), globalenv = if (FALSE) [18:42:15.209] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:15.209] ...future.globalenv.names)) [18:42:15.209] else NULL, started = ...future.startTime, version = "1.8") [18:42:15.209] }, condition = base::local({ [18:42:15.209] c <- base::c [18:42:15.209] inherits <- base::inherits [18:42:15.209] invokeRestart <- base::invokeRestart [18:42:15.209] length <- base::length [18:42:15.209] list <- base::list [18:42:15.209] seq.int <- base::seq.int [18:42:15.209] signalCondition <- base::signalCondition [18:42:15.209] sys.calls <- base::sys.calls [18:42:15.209] `[[` <- base::`[[` [18:42:15.209] `+` <- base::`+` [18:42:15.209] `<<-` <- base::`<<-` [18:42:15.209] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:15.209] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:15.209] 3L)] [18:42:15.209] } [18:42:15.209] function(cond) { [18:42:15.209] is_error <- inherits(cond, "error") [18:42:15.209] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:15.209] NULL) [18:42:15.209] if (is_error) { [18:42:15.209] sessionInformation <- function() { [18:42:15.209] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:15.209] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:15.209] search = base::search(), system = base::Sys.info()) [18:42:15.209] } [18:42:15.209] ...future.conditions[[length(...future.conditions) + [18:42:15.209] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:15.209] cond$call), session = sessionInformation(), [18:42:15.209] timestamp = base::Sys.time(), signaled = 0L) [18:42:15.209] signalCondition(cond) [18:42:15.209] } [18:42:15.209] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:15.209] "immediateCondition"))) { [18:42:15.209] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:15.209] ...future.conditions[[length(...future.conditions) + [18:42:15.209] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:15.209] if (TRUE && !signal) { [18:42:15.209] muffleCondition <- function (cond, pattern = "^muffle") [18:42:15.209] { [18:42:15.209] inherits <- base::inherits [18:42:15.209] invokeRestart <- base::invokeRestart [18:42:15.209] is.null <- base::is.null [18:42:15.209] muffled <- FALSE [18:42:15.209] if (inherits(cond, "message")) { [18:42:15.209] muffled <- grepl(pattern, "muffleMessage") [18:42:15.209] if (muffled) [18:42:15.209] invokeRestart("muffleMessage") [18:42:15.209] } [18:42:15.209] else if (inherits(cond, "warning")) { [18:42:15.209] muffled <- grepl(pattern, "muffleWarning") [18:42:15.209] if (muffled) [18:42:15.209] invokeRestart("muffleWarning") [18:42:15.209] } [18:42:15.209] else if (inherits(cond, "condition")) { [18:42:15.209] if (!is.null(pattern)) { [18:42:15.209] computeRestarts <- base::computeRestarts [18:42:15.209] grepl <- base::grepl [18:42:15.209] restarts <- computeRestarts(cond) [18:42:15.209] for (restart in restarts) { [18:42:15.209] name <- restart$name [18:42:15.209] if (is.null(name)) [18:42:15.209] next [18:42:15.209] if (!grepl(pattern, name)) [18:42:15.209] next [18:42:15.209] invokeRestart(restart) [18:42:15.209] muffled <- TRUE [18:42:15.209] break [18:42:15.209] } [18:42:15.209] } [18:42:15.209] } [18:42:15.209] invisible(muffled) [18:42:15.209] } [18:42:15.209] muffleCondition(cond, pattern = "^muffle") [18:42:15.209] } [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] if (TRUE) { [18:42:15.209] muffleCondition <- function (cond, pattern = "^muffle") [18:42:15.209] { [18:42:15.209] inherits <- base::inherits [18:42:15.209] invokeRestart <- base::invokeRestart [18:42:15.209] is.null <- base::is.null [18:42:15.209] muffled <- FALSE [18:42:15.209] if (inherits(cond, "message")) { [18:42:15.209] muffled <- grepl(pattern, "muffleMessage") [18:42:15.209] if (muffled) [18:42:15.209] invokeRestart("muffleMessage") [18:42:15.209] } [18:42:15.209] else if (inherits(cond, "warning")) { [18:42:15.209] muffled <- grepl(pattern, "muffleWarning") [18:42:15.209] if (muffled) [18:42:15.209] invokeRestart("muffleWarning") [18:42:15.209] } [18:42:15.209] else if (inherits(cond, "condition")) { [18:42:15.209] if (!is.null(pattern)) { [18:42:15.209] computeRestarts <- base::computeRestarts [18:42:15.209] grepl <- base::grepl [18:42:15.209] restarts <- computeRestarts(cond) [18:42:15.209] for (restart in restarts) { [18:42:15.209] name <- restart$name [18:42:15.209] if (is.null(name)) [18:42:15.209] next [18:42:15.209] if (!grepl(pattern, name)) [18:42:15.209] next [18:42:15.209] invokeRestart(restart) [18:42:15.209] muffled <- TRUE [18:42:15.209] break [18:42:15.209] } [18:42:15.209] } [18:42:15.209] } [18:42:15.209] invisible(muffled) [18:42:15.209] } [18:42:15.209] muffleCondition(cond, pattern = "^muffle") [18:42:15.209] } [18:42:15.209] } [18:42:15.209] } [18:42:15.209] })) [18:42:15.209] }, error = function(ex) { [18:42:15.209] base::structure(base::list(value = NULL, visible = NULL, [18:42:15.209] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:15.209] ...future.rng), started = ...future.startTime, [18:42:15.209] finished = Sys.time(), session_uuid = NA_character_, [18:42:15.209] version = "1.8"), class = "FutureResult") [18:42:15.209] }, finally = { [18:42:15.209] if (!identical(...future.workdir, getwd())) [18:42:15.209] setwd(...future.workdir) [18:42:15.209] { [18:42:15.209] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:15.209] ...future.oldOptions$nwarnings <- NULL [18:42:15.209] } [18:42:15.209] base::options(...future.oldOptions) [18:42:15.209] if (.Platform$OS.type == "windows") { [18:42:15.209] old_names <- names(...future.oldEnvVars) [18:42:15.209] envs <- base::Sys.getenv() [18:42:15.209] names <- names(envs) [18:42:15.209] common <- intersect(names, old_names) [18:42:15.209] added <- setdiff(names, old_names) [18:42:15.209] removed <- setdiff(old_names, names) [18:42:15.209] changed <- common[...future.oldEnvVars[common] != [18:42:15.209] envs[common]] [18:42:15.209] NAMES <- toupper(changed) [18:42:15.209] args <- list() [18:42:15.209] for (kk in seq_along(NAMES)) { [18:42:15.209] name <- changed[[kk]] [18:42:15.209] NAME <- NAMES[[kk]] [18:42:15.209] if (name != NAME && is.element(NAME, old_names)) [18:42:15.209] next [18:42:15.209] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:15.209] } [18:42:15.209] NAMES <- toupper(added) [18:42:15.209] for (kk in seq_along(NAMES)) { [18:42:15.209] name <- added[[kk]] [18:42:15.209] NAME <- NAMES[[kk]] [18:42:15.209] if (name != NAME && is.element(NAME, old_names)) [18:42:15.209] next [18:42:15.209] args[[name]] <- "" [18:42:15.209] } [18:42:15.209] NAMES <- toupper(removed) [18:42:15.209] for (kk in seq_along(NAMES)) { [18:42:15.209] name <- removed[[kk]] [18:42:15.209] NAME <- NAMES[[kk]] [18:42:15.209] if (name != NAME && is.element(NAME, old_names)) [18:42:15.209] next [18:42:15.209] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:15.209] } [18:42:15.209] if (length(args) > 0) [18:42:15.209] base::do.call(base::Sys.setenv, args = args) [18:42:15.209] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:15.209] } [18:42:15.209] { [18:42:15.209] if (base::length(...future.futureOptionsAdded) > [18:42:15.209] 0L) { [18:42:15.209] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:15.209] base::names(opts) <- ...future.futureOptionsAdded [18:42:15.209] base::options(opts) [18:42:15.209] } [18:42:15.209] { [18:42:15.209] { [18:42:15.209] NULL [18:42:15.209] RNGkind("Mersenne-Twister") [18:42:15.209] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:15.209] inherits = FALSE) [18:42:15.209] } [18:42:15.209] options(future.plan = NULL) [18:42:15.209] if (is.na(NA_character_)) [18:42:15.209] Sys.unsetenv("R_FUTURE_PLAN") [18:42:15.209] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:15.209] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:15.209] .init = FALSE) [18:42:15.209] } [18:42:15.209] } [18:42:15.209] } [18:42:15.209] }) [18:42:15.209] if (TRUE) { [18:42:15.209] base::sink(type = "output", split = FALSE) [18:42:15.209] if (TRUE) { [18:42:15.209] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:15.209] } [18:42:15.209] else { [18:42:15.209] ...future.result["stdout"] <- base::list(NULL) [18:42:15.209] } [18:42:15.209] base::close(...future.stdout) [18:42:15.209] ...future.stdout <- NULL [18:42:15.209] } [18:42:15.209] ...future.result$conditions <- ...future.conditions [18:42:15.209] ...future.result$finished <- base::Sys.time() [18:42:15.209] ...future.result [18:42:15.209] } [18:42:15.216] assign_globals() ... [18:42:15.216] List of 5 [18:42:15.216] $ ...future.FUN :function (x, y) [18:42:15.216] $ MoreArgs : NULL [18:42:15.216] $ ...future.elements_ii :List of 2 [18:42:15.216] ..$ :List of 2 [18:42:15.216] .. ..$ : int 1 [18:42:15.216] .. ..$ : int 0 [18:42:15.216] ..$ :List of 2 [18:42:15.216] .. ..$ : int 0 [18:42:15.216] .. ..$ : int 1 [18:42:15.216] $ ...future.seeds_ii : NULL [18:42:15.216] $ ...future.globals.maxSize: NULL [18:42:15.216] - attr(*, "where")=List of 5 [18:42:15.216] ..$ ...future.FUN : [18:42:15.216] ..$ MoreArgs : [18:42:15.216] ..$ ...future.elements_ii : [18:42:15.216] ..$ ...future.seeds_ii : [18:42:15.216] ..$ ...future.globals.maxSize: [18:42:15.216] - attr(*, "resolved")= logi FALSE [18:42:15.216] - attr(*, "total_size")= int 1242 [18:42:15.216] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:15.216] - attr(*, "already-done")= logi TRUE [18:42:15.232] - reassign environment for '...future.FUN' [18:42:15.233] - copied '...future.FUN' to environment [18:42:15.233] - copied 'MoreArgs' to environment [18:42:15.233] - copied '...future.elements_ii' to environment [18:42:15.233] - copied '...future.seeds_ii' to environment [18:42:15.234] - copied '...future.globals.maxSize' to environment [18:42:15.234] assign_globals() ... done [18:42:15.235] plan(): Setting new future strategy stack: [18:42:15.235] List of future strategies: [18:42:15.235] 1. sequential: [18:42:15.235] - args: function (..., envir = parent.frame(), workers = "") [18:42:15.235] - tweaked: FALSE [18:42:15.235] - call: NULL [18:42:15.236] plan(): nbrOfWorkers() = 1 [18:42:15.743] plan(): Setting new future strategy stack: [18:42:15.743] List of future strategies: [18:42:15.743] 1. multisession: [18:42:15.743] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:15.743] - tweaked: FALSE [18:42:15.743] - call: plan(strategy) [18:42:15.748] plan(): nbrOfWorkers() = 1 [18:42:15.749] SequentialFuture started (and completed) [18:42:15.749] - Launch lazy future ... done [18:42:15.750] run() for 'SequentialFuture' ... done [18:42:15.750] Created future: [18:42:15.750] SequentialFuture: [18:42:15.750] Label: 'future_mapply-1' [18:42:15.750] Expression: [18:42:15.750] { [18:42:15.750] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:15.750] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:15.750] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:15.750] on.exit(options(oopts), add = TRUE) [18:42:15.750] } [18:42:15.750] { [18:42:15.750] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:15.750] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:15.750] do.call(mapply, args = args) [18:42:15.750] } [18:42:15.750] } [18:42:15.750] Lazy evaluation: FALSE [18:42:15.750] Asynchronous evaluation: FALSE [18:42:15.750] Local evaluation: TRUE [18:42:15.750] Environment: R_GlobalEnv [18:42:15.750] Capture standard output: TRUE [18:42:15.750] Capture condition classes: 'condition' (excluding 'nothing') [18:42:15.750] Globals: 5 objects totaling 1.21 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 95 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:15.750] Packages: [18:42:15.750] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:15.750] Resolved: TRUE [18:42:15.750] Value: 184 bytes of class 'list' [18:42:15.750] Early signaling: FALSE [18:42:15.750] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:15.750] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:15.753] Chunk #1 of 1 ... DONE [18:42:15.753] Launching 1 futures (chunks) ... DONE [18:42:15.753] Resolving 1 futures (chunks) ... [18:42:15.753] resolve() on list ... [18:42:15.754] recursive: 0 [18:42:15.754] length: 1 [18:42:15.754] [18:42:15.755] resolved() for 'SequentialFuture' ... [18:42:15.755] - state: 'finished' [18:42:15.755] - run: TRUE [18:42:15.756] - result: 'FutureResult' [18:42:15.756] resolved() for 'SequentialFuture' ... done [18:42:15.756] Future #1 [18:42:15.757] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:15.757] - nx: 1 [18:42:15.757] - relay: TRUE [18:42:15.758] - stdout: TRUE [18:42:15.758] - signal: TRUE [18:42:15.758] - resignal: FALSE [18:42:15.759] - force: TRUE [18:42:15.759] - relayed: [n=1] FALSE [18:42:15.759] - queued futures: [n=1] FALSE [18:42:15.759] - until=1 [18:42:15.760] - relaying element #1 [18:42:15.760] - relayed: [n=1] TRUE [18:42:15.761] - queued futures: [n=1] TRUE [18:42:15.761] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:15.761] length: 0 (resolved future 1) [18:42:15.762] Relaying remaining futures [18:42:15.762] signalConditionsASAP(NULL, pos=0) ... [18:42:15.762] - nx: 1 [18:42:15.762] - relay: TRUE [18:42:15.763] - stdout: TRUE [18:42:15.763] - signal: TRUE [18:42:15.763] - resignal: FALSE [18:42:15.763] - force: TRUE [18:42:15.764] - relayed: [n=1] TRUE [18:42:15.764] - queued futures: [n=1] TRUE - flush all [18:42:15.765] - relayed: [n=1] TRUE [18:42:15.765] - queued futures: [n=1] TRUE [18:42:15.765] signalConditionsASAP(NULL, pos=0) ... done [18:42:15.765] resolve() on list ... DONE [18:42:15.766] - Number of value chunks collected: 1 [18:42:15.766] Resolving 1 futures (chunks) ... DONE [18:42:15.766] Reducing values from 1 chunks ... [18:42:15.767] - Number of values collected after concatenation: 2 [18:42:15.767] - Number of values expected: 2 [18:42:15.767] Reducing values from 1 chunks ... DONE [18:42:15.768] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = TRUE) ... DONE * future_mapply(x, ..., future.stdout = NA) ... [18:42:15.769] future_mapply() ... [18:42:15.773] Number of chunks: 1 [18:42:15.773] getGlobalsAndPackagesXApply() ... [18:42:15.773] - future.globals: TRUE [18:42:15.774] getGlobalsAndPackages() ... [18:42:15.774] Searching for globals... [18:42:15.778] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:15.778] Searching for globals ... DONE [18:42:15.779] Resolving globals: FALSE [18:42:15.780] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:15.781] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:15.781] - globals: [1] 'FUN' [18:42:15.781] [18:42:15.782] getGlobalsAndPackages() ... DONE [18:42:15.782] - globals found/used: [n=1] 'FUN' [18:42:15.782] - needed namespaces: [n=0] [18:42:15.782] Finding globals ... DONE [18:42:15.783] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:15.783] List of 2 [18:42:15.783] $ ...future.FUN:function (x, y) [18:42:15.783] $ MoreArgs : NULL [18:42:15.783] - attr(*, "where")=List of 2 [18:42:15.783] ..$ ...future.FUN: [18:42:15.783] ..$ MoreArgs : [18:42:15.783] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:15.783] - attr(*, "resolved")= logi FALSE [18:42:15.783] - attr(*, "total_size")= num NA [18:42:15.793] Packages to be attached in all futures: [n=0] [18:42:15.794] getGlobalsAndPackagesXApply() ... DONE [18:42:15.794] Number of futures (= number of chunks): 1 [18:42:15.794] Launching 1 futures (chunks) ... [18:42:15.795] Chunk #1 of 1 ... [18:42:15.795] - Finding globals in '...' for chunk #1 ... [18:42:15.795] getGlobalsAndPackages() ... [18:42:15.796] Searching for globals... [18:42:15.796] [18:42:15.797] Searching for globals ... DONE [18:42:15.797] - globals: [0] [18:42:15.797] getGlobalsAndPackages() ... DONE [18:42:15.798] + additional globals found: [n=0] [18:42:15.798] + additional namespaces needed: [n=0] [18:42:15.798] - Finding globals in '...' for chunk #1 ... DONE [18:42:15.798] - seeds: [18:42:15.799] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:15.799] getGlobalsAndPackages() ... [18:42:15.799] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:15.800] Resolving globals: FALSE [18:42:15.801] The total size of the 5 globals is 1.21 KiB (1242 bytes) [18:42:15.802] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (95 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:15.802] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:15.803] [18:42:15.803] getGlobalsAndPackages() ... DONE [18:42:15.804] run() for 'Future' ... [18:42:15.804] - state: 'created' [18:42:15.804] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:15.809] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:15.809] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:42:15.810] - Field: 'label' [18:42:15.810] - Field: 'local' [18:42:15.810] - Field: 'owner' [18:42:15.811] - Field: 'envir' [18:42:15.811] - Field: 'packages' [18:42:15.811] - Field: 'gc' [18:42:15.811] - Field: 'conditions' [18:42:15.812] - Field: 'expr' [18:42:15.812] - Field: 'uuid' [18:42:15.812] - Field: 'seed' [18:42:15.813] - Field: 'version' [18:42:15.813] - Field: 'result' [18:42:15.814] - Field: 'asynchronous' [18:42:15.814] - Field: 'calls' [18:42:15.814] - Field: 'globals' [18:42:15.814] - Field: 'stdout' [18:42:15.815] - Field: 'earlySignal' [18:42:15.815] - Field: 'lazy' [18:42:15.815] - Field: 'state' [18:42:15.816] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:42:15.816] - Launch lazy future ... [18:42:15.817] Packages needed by the future expression (n = 0): [18:42:15.817] Packages needed by future strategies (n = 0): [18:42:15.818] { [18:42:15.818] { [18:42:15.818] { [18:42:15.818] ...future.startTime <- base::Sys.time() [18:42:15.818] { [18:42:15.818] { [18:42:15.818] { [18:42:15.818] base::local({ [18:42:15.818] has_future <- base::requireNamespace("future", [18:42:15.818] quietly = TRUE) [18:42:15.818] if (has_future) { [18:42:15.818] ns <- base::getNamespace("future") [18:42:15.818] version <- ns[[".package"]][["version"]] [18:42:15.818] if (is.null(version)) [18:42:15.818] version <- utils::packageVersion("future") [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] version <- NULL [18:42:15.818] } [18:42:15.818] if (!has_future || version < "1.8.0") { [18:42:15.818] info <- base::c(r_version = base::gsub("R version ", [18:42:15.818] "", base::R.version$version.string), [18:42:15.818] platform = base::sprintf("%s (%s-bit)", [18:42:15.818] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:15.818] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:15.818] "release", "version")], collapse = " "), [18:42:15.818] hostname = base::Sys.info()[["nodename"]]) [18:42:15.818] info <- base::sprintf("%s: %s", base::names(info), [18:42:15.818] info) [18:42:15.818] info <- base::paste(info, collapse = "; ") [18:42:15.818] if (!has_future) { [18:42:15.818] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:15.818] info) [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:15.818] info, version) [18:42:15.818] } [18:42:15.818] base::stop(msg) [18:42:15.818] } [18:42:15.818] }) [18:42:15.818] } [18:42:15.818] ...future.strategy.old <- future::plan("list") [18:42:15.818] options(future.plan = NULL) [18:42:15.818] Sys.unsetenv("R_FUTURE_PLAN") [18:42:15.818] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:15.818] } [18:42:15.818] ...future.workdir <- getwd() [18:42:15.818] } [18:42:15.818] ...future.oldOptions <- base::as.list(base::.Options) [18:42:15.818] ...future.oldEnvVars <- base::Sys.getenv() [18:42:15.818] } [18:42:15.818] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:15.818] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:15.818] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:15.818] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:15.818] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:15.818] future.stdout.windows.reencode = NULL, width = 80L) [18:42:15.818] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:15.818] base::names(...future.oldOptions)) [18:42:15.818] } [18:42:15.818] if (TRUE) { [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] if (NA) { [18:42:15.818] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:15.818] open = "w") [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:15.818] windows = "NUL", "/dev/null"), open = "w") [18:42:15.818] } [18:42:15.818] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:15.818] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:15.818] base::sink(type = "output", split = FALSE) [18:42:15.818] base::close(...future.stdout) [18:42:15.818] }, add = TRUE) [18:42:15.818] } [18:42:15.818] ...future.frame <- base::sys.nframe() [18:42:15.818] ...future.conditions <- base::list() [18:42:15.818] ...future.rng <- base::globalenv()$.Random.seed [18:42:15.818] if (FALSE) { [18:42:15.818] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:15.818] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:15.818] } [18:42:15.818] ...future.result <- base::tryCatch({ [18:42:15.818] base::withCallingHandlers({ [18:42:15.818] ...future.value <- base::withVisible(base::local({ [18:42:15.818] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:15.818] if (!identical(...future.globals.maxSize.org, [18:42:15.818] ...future.globals.maxSize)) { [18:42:15.818] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:15.818] on.exit(options(oopts), add = TRUE) [18:42:15.818] } [18:42:15.818] { [18:42:15.818] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:15.818] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:15.818] USE.NAMES = FALSE) [18:42:15.818] do.call(mapply, args = args) [18:42:15.818] } [18:42:15.818] })) [18:42:15.818] future::FutureResult(value = ...future.value$value, [18:42:15.818] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:15.818] ...future.rng), globalenv = if (FALSE) [18:42:15.818] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:15.818] ...future.globalenv.names)) [18:42:15.818] else NULL, started = ...future.startTime, version = "1.8") [18:42:15.818] }, condition = base::local({ [18:42:15.818] c <- base::c [18:42:15.818] inherits <- base::inherits [18:42:15.818] invokeRestart <- base::invokeRestart [18:42:15.818] length <- base::length [18:42:15.818] list <- base::list [18:42:15.818] seq.int <- base::seq.int [18:42:15.818] signalCondition <- base::signalCondition [18:42:15.818] sys.calls <- base::sys.calls [18:42:15.818] `[[` <- base::`[[` [18:42:15.818] `+` <- base::`+` [18:42:15.818] `<<-` <- base::`<<-` [18:42:15.818] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:15.818] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:15.818] 3L)] [18:42:15.818] } [18:42:15.818] function(cond) { [18:42:15.818] is_error <- inherits(cond, "error") [18:42:15.818] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:15.818] NULL) [18:42:15.818] if (is_error) { [18:42:15.818] sessionInformation <- function() { [18:42:15.818] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:15.818] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:15.818] search = base::search(), system = base::Sys.info()) [18:42:15.818] } [18:42:15.818] ...future.conditions[[length(...future.conditions) + [18:42:15.818] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:15.818] cond$call), session = sessionInformation(), [18:42:15.818] timestamp = base::Sys.time(), signaled = 0L) [18:42:15.818] signalCondition(cond) [18:42:15.818] } [18:42:15.818] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:15.818] "immediateCondition"))) { [18:42:15.818] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:15.818] ...future.conditions[[length(...future.conditions) + [18:42:15.818] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:15.818] if (TRUE && !signal) { [18:42:15.818] muffleCondition <- function (cond, pattern = "^muffle") [18:42:15.818] { [18:42:15.818] inherits <- base::inherits [18:42:15.818] invokeRestart <- base::invokeRestart [18:42:15.818] is.null <- base::is.null [18:42:15.818] muffled <- FALSE [18:42:15.818] if (inherits(cond, "message")) { [18:42:15.818] muffled <- grepl(pattern, "muffleMessage") [18:42:15.818] if (muffled) [18:42:15.818] invokeRestart("muffleMessage") [18:42:15.818] } [18:42:15.818] else if (inherits(cond, "warning")) { [18:42:15.818] muffled <- grepl(pattern, "muffleWarning") [18:42:15.818] if (muffled) [18:42:15.818] invokeRestart("muffleWarning") [18:42:15.818] } [18:42:15.818] else if (inherits(cond, "condition")) { [18:42:15.818] if (!is.null(pattern)) { [18:42:15.818] computeRestarts <- base::computeRestarts [18:42:15.818] grepl <- base::grepl [18:42:15.818] restarts <- computeRestarts(cond) [18:42:15.818] for (restart in restarts) { [18:42:15.818] name <- restart$name [18:42:15.818] if (is.null(name)) [18:42:15.818] next [18:42:15.818] if (!grepl(pattern, name)) [18:42:15.818] next [18:42:15.818] invokeRestart(restart) [18:42:15.818] muffled <- TRUE [18:42:15.818] break [18:42:15.818] } [18:42:15.818] } [18:42:15.818] } [18:42:15.818] invisible(muffled) [18:42:15.818] } [18:42:15.818] muffleCondition(cond, pattern = "^muffle") [18:42:15.818] } [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] if (TRUE) { [18:42:15.818] muffleCondition <- function (cond, pattern = "^muffle") [18:42:15.818] { [18:42:15.818] inherits <- base::inherits [18:42:15.818] invokeRestart <- base::invokeRestart [18:42:15.818] is.null <- base::is.null [18:42:15.818] muffled <- FALSE [18:42:15.818] if (inherits(cond, "message")) { [18:42:15.818] muffled <- grepl(pattern, "muffleMessage") [18:42:15.818] if (muffled) [18:42:15.818] invokeRestart("muffleMessage") [18:42:15.818] } [18:42:15.818] else if (inherits(cond, "warning")) { [18:42:15.818] muffled <- grepl(pattern, "muffleWarning") [18:42:15.818] if (muffled) [18:42:15.818] invokeRestart("muffleWarning") [18:42:15.818] } [18:42:15.818] else if (inherits(cond, "condition")) { [18:42:15.818] if (!is.null(pattern)) { [18:42:15.818] computeRestarts <- base::computeRestarts [18:42:15.818] grepl <- base::grepl [18:42:15.818] restarts <- computeRestarts(cond) [18:42:15.818] for (restart in restarts) { [18:42:15.818] name <- restart$name [18:42:15.818] if (is.null(name)) [18:42:15.818] next [18:42:15.818] if (!grepl(pattern, name)) [18:42:15.818] next [18:42:15.818] invokeRestart(restart) [18:42:15.818] muffled <- TRUE [18:42:15.818] break [18:42:15.818] } [18:42:15.818] } [18:42:15.818] } [18:42:15.818] invisible(muffled) [18:42:15.818] } [18:42:15.818] muffleCondition(cond, pattern = "^muffle") [18:42:15.818] } [18:42:15.818] } [18:42:15.818] } [18:42:15.818] })) [18:42:15.818] }, error = function(ex) { [18:42:15.818] base::structure(base::list(value = NULL, visible = NULL, [18:42:15.818] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:15.818] ...future.rng), started = ...future.startTime, [18:42:15.818] finished = Sys.time(), session_uuid = NA_character_, [18:42:15.818] version = "1.8"), class = "FutureResult") [18:42:15.818] }, finally = { [18:42:15.818] if (!identical(...future.workdir, getwd())) [18:42:15.818] setwd(...future.workdir) [18:42:15.818] { [18:42:15.818] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:15.818] ...future.oldOptions$nwarnings <- NULL [18:42:15.818] } [18:42:15.818] base::options(...future.oldOptions) [18:42:15.818] if (.Platform$OS.type == "windows") { [18:42:15.818] old_names <- names(...future.oldEnvVars) [18:42:15.818] envs <- base::Sys.getenv() [18:42:15.818] names <- names(envs) [18:42:15.818] common <- intersect(names, old_names) [18:42:15.818] added <- setdiff(names, old_names) [18:42:15.818] removed <- setdiff(old_names, names) [18:42:15.818] changed <- common[...future.oldEnvVars[common] != [18:42:15.818] envs[common]] [18:42:15.818] NAMES <- toupper(changed) [18:42:15.818] args <- list() [18:42:15.818] for (kk in seq_along(NAMES)) { [18:42:15.818] name <- changed[[kk]] [18:42:15.818] NAME <- NAMES[[kk]] [18:42:15.818] if (name != NAME && is.element(NAME, old_names)) [18:42:15.818] next [18:42:15.818] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:15.818] } [18:42:15.818] NAMES <- toupper(added) [18:42:15.818] for (kk in seq_along(NAMES)) { [18:42:15.818] name <- added[[kk]] [18:42:15.818] NAME <- NAMES[[kk]] [18:42:15.818] if (name != NAME && is.element(NAME, old_names)) [18:42:15.818] next [18:42:15.818] args[[name]] <- "" [18:42:15.818] } [18:42:15.818] NAMES <- toupper(removed) [18:42:15.818] for (kk in seq_along(NAMES)) { [18:42:15.818] name <- removed[[kk]] [18:42:15.818] NAME <- NAMES[[kk]] [18:42:15.818] if (name != NAME && is.element(NAME, old_names)) [18:42:15.818] next [18:42:15.818] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:15.818] } [18:42:15.818] if (length(args) > 0) [18:42:15.818] base::do.call(base::Sys.setenv, args = args) [18:42:15.818] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:15.818] } [18:42:15.818] { [18:42:15.818] if (base::length(...future.futureOptionsAdded) > [18:42:15.818] 0L) { [18:42:15.818] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:15.818] base::names(opts) <- ...future.futureOptionsAdded [18:42:15.818] base::options(opts) [18:42:15.818] } [18:42:15.818] { [18:42:15.818] { [18:42:15.818] NULL [18:42:15.818] RNGkind("Mersenne-Twister") [18:42:15.818] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:42:15.818] inherits = FALSE) [18:42:15.818] } [18:42:15.818] options(future.plan = NULL) [18:42:15.818] if (is.na(NA_character_)) [18:42:15.818] Sys.unsetenv("R_FUTURE_PLAN") [18:42:15.818] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:15.818] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:15.818] .init = FALSE) [18:42:15.818] } [18:42:15.818] } [18:42:15.818] } [18:42:15.818] }) [18:42:15.818] if (FALSE) { [18:42:15.818] base::sink(type = "output", split = FALSE) [18:42:15.818] if (NA) { [18:42:15.818] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:15.818] } [18:42:15.818] else { [18:42:15.818] ...future.result["stdout"] <- base::list(NULL) [18:42:15.818] } [18:42:15.818] base::close(...future.stdout) [18:42:15.818] ...future.stdout <- NULL [18:42:15.818] } [18:42:15.818] ...future.result$conditions <- ...future.conditions [18:42:15.818] ...future.result$finished <- base::Sys.time() [18:42:15.818] ...future.result [18:42:15.818] } [18:42:15.823] assign_globals() ... [18:42:15.823] List of 5 [18:42:15.823] $ ...future.FUN :function (x, y) [18:42:15.823] $ MoreArgs : NULL [18:42:15.823] $ ...future.elements_ii :List of 2 [18:42:15.823] ..$ :List of 2 [18:42:15.823] .. ..$ : int 1 [18:42:15.823] .. ..$ : int 0 [18:42:15.823] ..$ :List of 2 [18:42:15.823] .. ..$ : int 0 [18:42:15.823] .. ..$ : int 1 [18:42:15.823] $ ...future.seeds_ii : NULL [18:42:15.823] $ ...future.globals.maxSize: NULL [18:42:15.823] - attr(*, "where")=List of 5 [18:42:15.823] ..$ ...future.FUN : [18:42:15.823] ..$ MoreArgs : [18:42:15.823] ..$ ...future.elements_ii : [18:42:15.823] ..$ ...future.seeds_ii : [18:42:15.823] ..$ ...future.globals.maxSize: [18:42:15.823] - attr(*, "resolved")= logi FALSE [18:42:15.823] - attr(*, "total_size")= int 1242 [18:42:15.823] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:15.823] - attr(*, "already-done")= logi TRUE [18:42:15.834] - reassign environment for '...future.FUN' [18:42:15.834] - copied '...future.FUN' to environment [18:42:15.835] - copied 'MoreArgs' to environment [18:42:15.835] - copied '...future.elements_ii' to environment [18:42:15.835] - copied '...future.seeds_ii' to environment [18:42:15.835] - copied '...future.globals.maxSize' to environment [18:42:15.835] assign_globals() ... done [18:42:15.836] plan(): Setting new future strategy stack: [18:42:15.836] List of future strategies: [18:42:15.836] 1. sequential: [18:42:15.836] - args: function (..., envir = parent.frame(), workers = "") [18:42:15.836] - tweaked: FALSE [18:42:15.836] - call: NULL [18:42:15.837] plan(): nbrOfWorkers() = 1 [18:42:16.351] plan(): Setting new future strategy stack: [18:42:16.351] List of future strategies: [18:42:16.351] 1. multisession: [18:42:16.351] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:16.351] - tweaked: FALSE [18:42:16.351] - call: plan(strategy) [18:42:16.354] plan(): nbrOfWorkers() = 1 [18:42:16.354] SequentialFuture started (and completed) [18:42:16.354] - Launch lazy future ... done [18:42:16.355] run() for 'SequentialFuture' ... done [18:42:16.355] Created future: [18:42:16.355] SequentialFuture: [18:42:16.355] Label: 'future_mapply-1' [18:42:16.355] Expression: [18:42:16.355] { [18:42:16.355] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:16.355] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:16.355] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:16.355] on.exit(options(oopts), add = TRUE) [18:42:16.355] } [18:42:16.355] { [18:42:16.355] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:16.355] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:16.355] do.call(mapply, args = args) [18:42:16.355] } [18:42:16.355] } [18:42:16.355] Lazy evaluation: FALSE [18:42:16.355] Asynchronous evaluation: FALSE [18:42:16.355] Local evaluation: TRUE [18:42:16.355] Environment: R_GlobalEnv [18:42:16.355] Capture standard output: NA [18:42:16.355] Capture condition classes: 'condition' (excluding 'nothing') [18:42:16.355] Globals: 5 objects totaling 1.21 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 95 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:16.355] Packages: [18:42:16.355] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:16.355] Resolved: TRUE [18:42:16.355] Value: 184 bytes of class 'list' [18:42:16.355] Early signaling: FALSE [18:42:16.355] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:16.355] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:42:16.356] Chunk #1 of 1 ... DONE [18:42:16.356] Launching 1 futures (chunks) ... DONE [18:42:16.356] Resolving 1 futures (chunks) ... [18:42:16.357] resolve() on list ... [18:42:16.357] recursive: 0 [18:42:16.357] length: 1 [18:42:16.357] [18:42:16.357] resolved() for 'SequentialFuture' ... [18:42:16.358] - state: 'finished' [18:42:16.358] - run: TRUE [18:42:16.358] - result: 'FutureResult' [18:42:16.358] resolved() for 'SequentialFuture' ... done [18:42:16.358] Future #1 [18:42:16.358] signalConditionsASAP(SequentialFuture, pos=1) ... [18:42:16.359] - nx: 1 [18:42:16.359] - relay: TRUE [18:42:16.359] - stdout: TRUE [18:42:16.359] - signal: TRUE [18:42:16.359] - resignal: FALSE [18:42:16.359] - force: TRUE [18:42:16.359] - relayed: [n=1] FALSE [18:42:16.360] - queued futures: [n=1] FALSE [18:42:16.360] - until=1 [18:42:16.360] - relaying element #1 [18:42:16.360] - relayed: [n=1] TRUE [18:42:16.360] - queued futures: [n=1] TRUE [18:42:16.361] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:42:16.361] length: 0 (resolved future 1) [18:42:16.361] Relaying remaining futures [18:42:16.361] signalConditionsASAP(NULL, pos=0) ... [18:42:16.361] - nx: 1 [18:42:16.361] - relay: TRUE [18:42:16.361] - stdout: TRUE [18:42:16.362] - signal: TRUE [18:42:16.362] - resignal: FALSE [18:42:16.362] - force: TRUE [18:42:16.362] - relayed: [n=1] TRUE [18:42:16.362] - queued futures: [n=1] TRUE - flush all [18:42:16.362] - relayed: [n=1] TRUE [18:42:16.363] - queued futures: [n=1] TRUE [18:42:16.363] signalConditionsASAP(NULL, pos=0) ... done [18:42:16.363] resolve() on list ... DONE [18:42:16.363] - Number of value chunks collected: 1 [18:42:16.363] Resolving 1 futures (chunks) ... DONE [18:42:16.363] Reducing values from 1 chunks ... [18:42:16.364] - Number of values collected after concatenation: 2 [18:42:16.364] - Number of values expected: 2 [18:42:16.364] Reducing values from 1 chunks ... DONE [18:42:16.364] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = NA) ... DONE * plan('multisession') ... DONE - Testing with 1 cores ... DONE - Testing with 2 cores ... * plan('multisession') ... [18:42:16.369] plan(): Setting new future strategy stack: [18:42:16.369] List of future strategies: [18:42:16.369] 1. multisession: [18:42:16.369] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:16.369] - tweaked: FALSE [18:42:16.369] - call: plan(strategy) [18:42:16.369] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:42:16.370] multisession: [18:42:16.370] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:42:16.370] - tweaked: FALSE [18:42:16.370] - call: plan(strategy) [18:42:16.375] getGlobalsAndPackages() ... [18:42:16.376] Not searching for globals [18:42:16.376] - globals: [0] [18:42:16.376] getGlobalsAndPackages() ... DONE [18:42:16.377] [local output] makeClusterPSOCK() ... [18:42:16.413] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:42:16.419] [local output] Base port: 23631 [18:42:16.419] [local output] Getting setup options for 2 cluster nodes ... [18:42:16.419] [local output] - Node #1 of 2 ... [18:42:16.420] [local output] localMachine=TRUE => revtunnel=FALSE [18:42:16.421] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpuwXEEm/worker.rank=1.parallelly.parent=167964.2901c5b887917.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpuwXEEm/worker.rank=1.parallelly.parent=167964.2901c5b887917.pid\")"' [18:42:16.866] - Possible to infer worker's PID: TRUE [18:42:16.867] [local output] Rscript port: 23631 [18:42:16.868] [local output] - Node #2 of 2 ... [18:42:16.869] [local output] localMachine=TRUE => revtunnel=FALSE [18:42:16.870] [local output] Rscript port: 23631 [18:42:16.871] [local output] Getting setup options for 2 cluster nodes ... done [18:42:16.871] [local output] - Parallel setup requested for some PSOCK nodes [18:42:16.872] [local output] Setting up PSOCK nodes in parallel [18:42:16.872] List of 36 [18:42:16.872] $ worker : chr "localhost" [18:42:16.872] ..- attr(*, "localhost")= logi TRUE [18:42:16.872] $ master : chr "localhost" [18:42:16.872] $ port : int 23631 [18:42:16.872] $ connectTimeout : num 120 [18:42:16.872] $ timeout : num 120 [18:42:16.872] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:42:16.872] $ homogeneous : logi TRUE [18:42:16.872] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=stdout.R:167964:CRANWIN3:CRAN\" "| __truncated__ [18:42:16.872] $ rscript_envs : NULL [18:42:16.872] $ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:42:16.872] $ rscript_startup : NULL [18:42:16.872] $ rscript_sh : chr [1:2] "cmd" "cmd" [18:42:16.872] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:42:16.872] $ methods : logi TRUE [18:42:16.872] $ socketOptions : chr "no-delay" [18:42:16.872] $ useXDR : logi FALSE [18:42:16.872] $ outfile : chr "/dev/null" [18:42:16.872] $ renice : int NA [18:42:16.872] $ rshcmd : NULL [18:42:16.872] $ user : chr(0) [18:42:16.872] $ revtunnel : logi FALSE [18:42:16.872] $ rshlogfile : NULL [18:42:16.872] $ rshopts : chr(0) [18:42:16.872] $ rank : int 1 [18:42:16.872] $ manual : logi FALSE [18:42:16.872] $ dryrun : logi FALSE [18:42:16.872] $ quiet : logi FALSE [18:42:16.872] $ setup_strategy : chr "parallel" [18:42:16.872] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:42:16.872] $ pidfile : chr "D:/temp/RtmpuwXEEm/worker.rank=1.parallelly.parent=167964.2901c5b887917.pid" [18:42:16.872] $ rshcmd_label : NULL [18:42:16.872] $ rsh_call : NULL [18:42:16.872] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:42:16.872] $ localMachine : logi TRUE [18:42:16.872] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:42:16.872] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:42:16.872] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:42:16.872] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:42:16.872] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:42:16.872] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [18:42:16.872] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [18:42:16.872] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:42:16.872] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:42:16.872] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:42:16.872] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:42:16.872] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:42:16.872] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:42:16.872] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:42:16.872] $ arguments :List of 28 [18:42:16.872] ..$ worker : chr "localhost" [18:42:16.872] ..$ master : NULL [18:42:16.872] ..$ port : int 23631 [18:42:16.872] ..$ connectTimeout : num 120 [18:42:16.872] ..$ timeout : num 120 [18:42:16.872] ..$ rscript : NULL [18:42:16.872] ..$ homogeneous : NULL [18:42:16.872] ..$ rscript_args : NULL [18:42:16.872] ..$ rscript_envs : NULL [18:42:16.872] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:42:16.872] ..$ rscript_startup : NULL [18:42:16.872] ..$ rscript_sh : chr "auto" [18:42:16.872] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:42:16.872] ..$ methods : logi TRUE [18:42:16.872] ..$ socketOptions : chr "no-delay" [18:42:16.872] ..$ useXDR : logi FALSE [18:42:16.872] ..$ outfile : chr "/dev/null" [18:42:16.872] ..$ renice : int NA [18:42:16.872] ..$ rshcmd : NULL [18:42:16.872] ..$ user : NULL [18:42:16.872] ..$ revtunnel : logi NA [18:42:16.872] ..$ rshlogfile : NULL [18:42:16.872] ..$ rshopts : NULL [18:42:16.872] ..$ rank : int 1 [18:42:16.872] ..$ manual : logi FALSE [18:42:16.872] ..$ dryrun : logi FALSE [18:42:16.872] ..$ quiet : logi FALSE [18:42:16.872] ..$ setup_strategy : chr "parallel" [18:42:16.872] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:42:16.895] [local output] System call to launch all workers: [18:42:16.895] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=stdout.R:167964:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpuwXEEm/worker.rank=1.parallelly.parent=167964.2901c5b887917.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=23631 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:42:16.895] [local output] Starting PSOCK main server [18:42:16.903] [local output] Workers launched [18:42:16.903] [local output] Waiting for workers to connect back [18:42:16.904] - [local output] 0 workers out of 2 ready [18:42:17.147] - [local output] 0 workers out of 2 ready [18:42:17.149] - [local output] 1 workers out of 2 ready [18:42:17.149] - [local output] 2 workers out of 2 ready [18:42:17.149] [local output] Launching of 2 workers completed [18:42:17.150] [local output] Number of nodes in cluster: 2 [18:42:17.150] [local output] Collecting session information from 2 workers [18:42:17.151] [local output] - Worker #1 of 2 [18:42:17.152] [local output] - Worker #2 of 2 [18:42:17.152] [local output] makeClusterPSOCK() ... done [18:42:17.167] Packages needed by the future expression (n = 0): [18:42:17.167] Packages needed by future strategies (n = 0): [18:42:17.168] { [18:42:17.168] { [18:42:17.168] { [18:42:17.168] ...future.startTime <- base::Sys.time() [18:42:17.168] { [18:42:17.168] { [18:42:17.168] { [18:42:17.168] { [18:42:17.168] base::local({ [18:42:17.168] has_future <- base::requireNamespace("future", [18:42:17.168] quietly = TRUE) [18:42:17.168] if (has_future) { [18:42:17.168] ns <- base::getNamespace("future") [18:42:17.168] version <- ns[[".package"]][["version"]] [18:42:17.168] if (is.null(version)) [18:42:17.168] version <- utils::packageVersion("future") [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] version <- NULL [18:42:17.168] } [18:42:17.168] if (!has_future || version < "1.8.0") { [18:42:17.168] info <- base::c(r_version = base::gsub("R version ", [18:42:17.168] "", base::R.version$version.string), [18:42:17.168] platform = base::sprintf("%s (%s-bit)", [18:42:17.168] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:17.168] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:17.168] "release", "version")], collapse = " "), [18:42:17.168] hostname = base::Sys.info()[["nodename"]]) [18:42:17.168] info <- base::sprintf("%s: %s", base::names(info), [18:42:17.168] info) [18:42:17.168] info <- base::paste(info, collapse = "; ") [18:42:17.168] if (!has_future) { [18:42:17.168] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:17.168] info) [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:17.168] info, version) [18:42:17.168] } [18:42:17.168] base::stop(msg) [18:42:17.168] } [18:42:17.168] }) [18:42:17.168] } [18:42:17.168] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:17.168] base::options(mc.cores = 1L) [18:42:17.168] } [18:42:17.168] ...future.strategy.old <- future::plan("list") [18:42:17.168] options(future.plan = NULL) [18:42:17.168] Sys.unsetenv("R_FUTURE_PLAN") [18:42:17.168] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:17.168] } [18:42:17.168] ...future.workdir <- getwd() [18:42:17.168] } [18:42:17.168] ...future.oldOptions <- base::as.list(base::.Options) [18:42:17.168] ...future.oldEnvVars <- base::Sys.getenv() [18:42:17.168] } [18:42:17.168] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:17.168] future.globals.maxSize = NULL, future.globals.method = NULL, [18:42:17.168] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:17.168] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:17.168] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:17.168] future.stdout.windows.reencode = NULL, width = 80L) [18:42:17.168] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:17.168] base::names(...future.oldOptions)) [18:42:17.168] } [18:42:17.168] if (FALSE) { [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] if (TRUE) { [18:42:17.168] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:17.168] open = "w") [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:17.168] windows = "NUL", "/dev/null"), open = "w") [18:42:17.168] } [18:42:17.168] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:17.168] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:17.168] base::sink(type = "output", split = FALSE) [18:42:17.168] base::close(...future.stdout) [18:42:17.168] }, add = TRUE) [18:42:17.168] } [18:42:17.168] ...future.frame <- base::sys.nframe() [18:42:17.168] ...future.conditions <- base::list() [18:42:17.168] ...future.rng <- base::globalenv()$.Random.seed [18:42:17.168] if (FALSE) { [18:42:17.168] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:17.168] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:17.168] } [18:42:17.168] ...future.result <- base::tryCatch({ [18:42:17.168] base::withCallingHandlers({ [18:42:17.168] ...future.value <- base::withVisible(base::local({ [18:42:17.168] ...future.makeSendCondition <- base::local({ [18:42:17.168] sendCondition <- NULL [18:42:17.168] function(frame = 1L) { [18:42:17.168] if (is.function(sendCondition)) [18:42:17.168] return(sendCondition) [18:42:17.168] ns <- getNamespace("parallel") [18:42:17.168] if (exists("sendData", mode = "function", [18:42:17.168] envir = ns)) { [18:42:17.168] parallel_sendData <- get("sendData", mode = "function", [18:42:17.168] envir = ns) [18:42:17.168] envir <- sys.frame(frame) [18:42:17.168] master <- NULL [18:42:17.168] while (!identical(envir, .GlobalEnv) && [18:42:17.168] !identical(envir, emptyenv())) { [18:42:17.168] if (exists("master", mode = "list", envir = envir, [18:42:17.168] inherits = FALSE)) { [18:42:17.168] master <- get("master", mode = "list", [18:42:17.168] envir = envir, inherits = FALSE) [18:42:17.168] if (inherits(master, c("SOCKnode", [18:42:17.168] "SOCK0node"))) { [18:42:17.168] sendCondition <<- function(cond) { [18:42:17.168] data <- list(type = "VALUE", value = cond, [18:42:17.168] success = TRUE) [18:42:17.168] parallel_sendData(master, data) [18:42:17.168] } [18:42:17.168] return(sendCondition) [18:42:17.168] } [18:42:17.168] } [18:42:17.168] frame <- frame + 1L [18:42:17.168] envir <- sys.frame(frame) [18:42:17.168] } [18:42:17.168] } [18:42:17.168] sendCondition <<- function(cond) NULL [18:42:17.168] } [18:42:17.168] }) [18:42:17.168] withCallingHandlers({ [18:42:17.168] NA [18:42:17.168] }, immediateCondition = function(cond) { [18:42:17.168] sendCondition <- ...future.makeSendCondition() [18:42:17.168] sendCondition(cond) [18:42:17.168] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.168] { [18:42:17.168] inherits <- base::inherits [18:42:17.168] invokeRestart <- base::invokeRestart [18:42:17.168] is.null <- base::is.null [18:42:17.168] muffled <- FALSE [18:42:17.168] if (inherits(cond, "message")) { [18:42:17.168] muffled <- grepl(pattern, "muffleMessage") [18:42:17.168] if (muffled) [18:42:17.168] invokeRestart("muffleMessage") [18:42:17.168] } [18:42:17.168] else if (inherits(cond, "warning")) { [18:42:17.168] muffled <- grepl(pattern, "muffleWarning") [18:42:17.168] if (muffled) [18:42:17.168] invokeRestart("muffleWarning") [18:42:17.168] } [18:42:17.168] else if (inherits(cond, "condition")) { [18:42:17.168] if (!is.null(pattern)) { [18:42:17.168] computeRestarts <- base::computeRestarts [18:42:17.168] grepl <- base::grepl [18:42:17.168] restarts <- computeRestarts(cond) [18:42:17.168] for (restart in restarts) { [18:42:17.168] name <- restart$name [18:42:17.168] if (is.null(name)) [18:42:17.168] next [18:42:17.168] if (!grepl(pattern, name)) [18:42:17.168] next [18:42:17.168] invokeRestart(restart) [18:42:17.168] muffled <- TRUE [18:42:17.168] break [18:42:17.168] } [18:42:17.168] } [18:42:17.168] } [18:42:17.168] invisible(muffled) [18:42:17.168] } [18:42:17.168] muffleCondition(cond) [18:42:17.168] }) [18:42:17.168] })) [18:42:17.168] future::FutureResult(value = ...future.value$value, [18:42:17.168] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:17.168] ...future.rng), globalenv = if (FALSE) [18:42:17.168] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:17.168] ...future.globalenv.names)) [18:42:17.168] else NULL, started = ...future.startTime, version = "1.8") [18:42:17.168] }, condition = base::local({ [18:42:17.168] c <- base::c [18:42:17.168] inherits <- base::inherits [18:42:17.168] invokeRestart <- base::invokeRestart [18:42:17.168] length <- base::length [18:42:17.168] list <- base::list [18:42:17.168] seq.int <- base::seq.int [18:42:17.168] signalCondition <- base::signalCondition [18:42:17.168] sys.calls <- base::sys.calls [18:42:17.168] `[[` <- base::`[[` [18:42:17.168] `+` <- base::`+` [18:42:17.168] `<<-` <- base::`<<-` [18:42:17.168] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:17.168] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:17.168] 3L)] [18:42:17.168] } [18:42:17.168] function(cond) { [18:42:17.168] is_error <- inherits(cond, "error") [18:42:17.168] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:17.168] NULL) [18:42:17.168] if (is_error) { [18:42:17.168] sessionInformation <- function() { [18:42:17.168] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:17.168] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:17.168] search = base::search(), system = base::Sys.info()) [18:42:17.168] } [18:42:17.168] ...future.conditions[[length(...future.conditions) + [18:42:17.168] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:17.168] cond$call), session = sessionInformation(), [18:42:17.168] timestamp = base::Sys.time(), signaled = 0L) [18:42:17.168] signalCondition(cond) [18:42:17.168] } [18:42:17.168] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:17.168] "immediateCondition"))) { [18:42:17.168] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:17.168] ...future.conditions[[length(...future.conditions) + [18:42:17.168] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:17.168] if (TRUE && !signal) { [18:42:17.168] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.168] { [18:42:17.168] inherits <- base::inherits [18:42:17.168] invokeRestart <- base::invokeRestart [18:42:17.168] is.null <- base::is.null [18:42:17.168] muffled <- FALSE [18:42:17.168] if (inherits(cond, "message")) { [18:42:17.168] muffled <- grepl(pattern, "muffleMessage") [18:42:17.168] if (muffled) [18:42:17.168] invokeRestart("muffleMessage") [18:42:17.168] } [18:42:17.168] else if (inherits(cond, "warning")) { [18:42:17.168] muffled <- grepl(pattern, "muffleWarning") [18:42:17.168] if (muffled) [18:42:17.168] invokeRestart("muffleWarning") [18:42:17.168] } [18:42:17.168] else if (inherits(cond, "condition")) { [18:42:17.168] if (!is.null(pattern)) { [18:42:17.168] computeRestarts <- base::computeRestarts [18:42:17.168] grepl <- base::grepl [18:42:17.168] restarts <- computeRestarts(cond) [18:42:17.168] for (restart in restarts) { [18:42:17.168] name <- restart$name [18:42:17.168] if (is.null(name)) [18:42:17.168] next [18:42:17.168] if (!grepl(pattern, name)) [18:42:17.168] next [18:42:17.168] invokeRestart(restart) [18:42:17.168] muffled <- TRUE [18:42:17.168] break [18:42:17.168] } [18:42:17.168] } [18:42:17.168] } [18:42:17.168] invisible(muffled) [18:42:17.168] } [18:42:17.168] muffleCondition(cond, pattern = "^muffle") [18:42:17.168] } [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] if (TRUE) { [18:42:17.168] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.168] { [18:42:17.168] inherits <- base::inherits [18:42:17.168] invokeRestart <- base::invokeRestart [18:42:17.168] is.null <- base::is.null [18:42:17.168] muffled <- FALSE [18:42:17.168] if (inherits(cond, "message")) { [18:42:17.168] muffled <- grepl(pattern, "muffleMessage") [18:42:17.168] if (muffled) [18:42:17.168] invokeRestart("muffleMessage") [18:42:17.168] } [18:42:17.168] else if (inherits(cond, "warning")) { [18:42:17.168] muffled <- grepl(pattern, "muffleWarning") [18:42:17.168] if (muffled) [18:42:17.168] invokeRestart("muffleWarning") [18:42:17.168] } [18:42:17.168] else if (inherits(cond, "condition")) { [18:42:17.168] if (!is.null(pattern)) { [18:42:17.168] computeRestarts <- base::computeRestarts [18:42:17.168] grepl <- base::grepl [18:42:17.168] restarts <- computeRestarts(cond) [18:42:17.168] for (restart in restarts) { [18:42:17.168] name <- restart$name [18:42:17.168] if (is.null(name)) [18:42:17.168] next [18:42:17.168] if (!grepl(pattern, name)) [18:42:17.168] next [18:42:17.168] invokeRestart(restart) [18:42:17.168] muffled <- TRUE [18:42:17.168] break [18:42:17.168] } [18:42:17.168] } [18:42:17.168] } [18:42:17.168] invisible(muffled) [18:42:17.168] } [18:42:17.168] muffleCondition(cond, pattern = "^muffle") [18:42:17.168] } [18:42:17.168] } [18:42:17.168] } [18:42:17.168] })) [18:42:17.168] }, error = function(ex) { [18:42:17.168] base::structure(base::list(value = NULL, visible = NULL, [18:42:17.168] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:17.168] ...future.rng), started = ...future.startTime, [18:42:17.168] finished = Sys.time(), session_uuid = NA_character_, [18:42:17.168] version = "1.8"), class = "FutureResult") [18:42:17.168] }, finally = { [18:42:17.168] if (!identical(...future.workdir, getwd())) [18:42:17.168] setwd(...future.workdir) [18:42:17.168] { [18:42:17.168] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:17.168] ...future.oldOptions$nwarnings <- NULL [18:42:17.168] } [18:42:17.168] base::options(...future.oldOptions) [18:42:17.168] if (.Platform$OS.type == "windows") { [18:42:17.168] old_names <- names(...future.oldEnvVars) [18:42:17.168] envs <- base::Sys.getenv() [18:42:17.168] names <- names(envs) [18:42:17.168] common <- intersect(names, old_names) [18:42:17.168] added <- setdiff(names, old_names) [18:42:17.168] removed <- setdiff(old_names, names) [18:42:17.168] changed <- common[...future.oldEnvVars[common] != [18:42:17.168] envs[common]] [18:42:17.168] NAMES <- toupper(changed) [18:42:17.168] args <- list() [18:42:17.168] for (kk in seq_along(NAMES)) { [18:42:17.168] name <- changed[[kk]] [18:42:17.168] NAME <- NAMES[[kk]] [18:42:17.168] if (name != NAME && is.element(NAME, old_names)) [18:42:17.168] next [18:42:17.168] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:17.168] } [18:42:17.168] NAMES <- toupper(added) [18:42:17.168] for (kk in seq_along(NAMES)) { [18:42:17.168] name <- added[[kk]] [18:42:17.168] NAME <- NAMES[[kk]] [18:42:17.168] if (name != NAME && is.element(NAME, old_names)) [18:42:17.168] next [18:42:17.168] args[[name]] <- "" [18:42:17.168] } [18:42:17.168] NAMES <- toupper(removed) [18:42:17.168] for (kk in seq_along(NAMES)) { [18:42:17.168] name <- removed[[kk]] [18:42:17.168] NAME <- NAMES[[kk]] [18:42:17.168] if (name != NAME && is.element(NAME, old_names)) [18:42:17.168] next [18:42:17.168] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:17.168] } [18:42:17.168] if (length(args) > 0) [18:42:17.168] base::do.call(base::Sys.setenv, args = args) [18:42:17.168] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:17.168] } [18:42:17.168] { [18:42:17.168] if (base::length(...future.futureOptionsAdded) > [18:42:17.168] 0L) { [18:42:17.168] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:17.168] base::names(opts) <- ...future.futureOptionsAdded [18:42:17.168] base::options(opts) [18:42:17.168] } [18:42:17.168] { [18:42:17.168] { [18:42:17.168] base::options(mc.cores = ...future.mc.cores.old) [18:42:17.168] NULL [18:42:17.168] } [18:42:17.168] options(future.plan = NULL) [18:42:17.168] if (is.na(NA_character_)) [18:42:17.168] Sys.unsetenv("R_FUTURE_PLAN") [18:42:17.168] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:17.168] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:17.168] .init = FALSE) [18:42:17.168] } [18:42:17.168] } [18:42:17.168] } [18:42:17.168] }) [18:42:17.168] if (TRUE) { [18:42:17.168] base::sink(type = "output", split = FALSE) [18:42:17.168] if (TRUE) { [18:42:17.168] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:17.168] } [18:42:17.168] else { [18:42:17.168] ...future.result["stdout"] <- base::list(NULL) [18:42:17.168] } [18:42:17.168] base::close(...future.stdout) [18:42:17.168] ...future.stdout <- NULL [18:42:17.168] } [18:42:17.168] ...future.result$conditions <- ...future.conditions [18:42:17.168] ...future.result$finished <- base::Sys.time() [18:42:17.168] ...future.result [18:42:17.168] } [18:42:17.259] MultisessionFuture started [18:42:17.260] result() for ClusterFuture ... [18:42:17.261] receiveMessageFromWorker() for ClusterFuture ... [18:42:17.261] - Validating connection of MultisessionFuture [18:42:17.314] - received message: FutureResult [18:42:17.314] - Received FutureResult [18:42:17.318] - Erased future from FutureRegistry [18:42:17.318] result() for ClusterFuture ... [18:42:17.318] - result already collected: FutureResult [18:42:17.318] result() for ClusterFuture ... done [18:42:17.318] receiveMessageFromWorker() for ClusterFuture ... done [18:42:17.319] result() for ClusterFuture ... done [18:42:17.319] result() for ClusterFuture ... [18:42:17.319] - result already collected: FutureResult [18:42:17.319] result() for ClusterFuture ... done [18:42:17.319] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:42:17.322] plan(): nbrOfWorkers() = 2 * future_lapply(x, ..., future.stdout = FALSE) ... [18:42:17.323] future_lapply() ... [18:42:17.328] Number of chunks: 2 [18:42:17.328] getGlobalsAndPackagesXApply() ... [18:42:17.328] - future.globals: TRUE [18:42:17.329] getGlobalsAndPackages() ... [18:42:17.329] Searching for globals... [18:42:17.331] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:17.331] Searching for globals ... DONE [18:42:17.331] Resolving globals: FALSE [18:42:17.332] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:17.333] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:17.333] - globals: [1] 'FUN' [18:42:17.333] [18:42:17.333] getGlobalsAndPackages() ... DONE [18:42:17.333] - globals found/used: [n=1] 'FUN' [18:42:17.334] - needed namespaces: [n=0] [18:42:17.334] Finding globals ... DONE [18:42:17.334] - use_args: TRUE [18:42:17.334] - Getting '...' globals ... [18:42:17.335] resolve() on list ... [18:42:17.335] recursive: 0 [18:42:17.335] length: 1 [18:42:17.335] elements: '...' [18:42:17.336] length: 0 (resolved future 1) [18:42:17.336] resolve() on list ... DONE [18:42:17.336] - '...' content: [n=0] [18:42:17.336] List of 1 [18:42:17.336] $ ...: list() [18:42:17.336] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:17.336] - attr(*, "where")=List of 1 [18:42:17.336] ..$ ...: [18:42:17.336] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:17.336] - attr(*, "resolved")= logi TRUE [18:42:17.336] - attr(*, "total_size")= num NA [18:42:17.340] - Getting '...' globals ... DONE [18:42:17.340] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:17.340] List of 2 [18:42:17.340] $ ...future.FUN:function (x) [18:42:17.340] $ ... : list() [18:42:17.340] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:17.340] - attr(*, "where")=List of 2 [18:42:17.340] ..$ ...future.FUN: [18:42:17.340] ..$ ... : [18:42:17.340] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:17.340] - attr(*, "resolved")= logi FALSE [18:42:17.340] - attr(*, "total_size")= int 5632 [18:42:17.344] Packages to be attached in all futures: [n=0] [18:42:17.345] getGlobalsAndPackagesXApply() ... DONE [18:42:17.345] Number of futures (= number of chunks): 2 [18:42:17.345] Launching 2 futures (chunks) ... [18:42:17.345] Chunk #1 of 2 ... [18:42:17.346] - Finding globals in 'X' for chunk #1 ... [18:42:17.346] getGlobalsAndPackages() ... [18:42:17.346] Searching for globals... [18:42:17.346] [18:42:17.347] Searching for globals ... DONE [18:42:17.347] - globals: [0] [18:42:17.347] getGlobalsAndPackages() ... DONE [18:42:17.347] + additional globals found: [n=0] [18:42:17.347] + additional namespaces needed: [n=0] [18:42:17.347] - Finding globals in 'X' for chunk #1 ... DONE [18:42:17.348] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:17.348] - seeds: [18:42:17.348] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.348] getGlobalsAndPackages() ... [18:42:17.348] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.349] Resolving globals: FALSE [18:42:17.349] Tweak future expression to call with '...' arguments ... [18:42:17.349] { [18:42:17.349] do.call(function(...) { [18:42:17.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.349] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:17.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.349] on.exit(options(oopts), add = TRUE) [18:42:17.349] } [18:42:17.349] { [18:42:17.349] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:17.349] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.349] ...future.FUN(...future.X_jj, ...) [18:42:17.349] }) [18:42:17.349] } [18:42:17.349] }, args = future.call.arguments) [18:42:17.349] } [18:42:17.349] Tweak future expression to call with '...' arguments ... DONE [18:42:17.350] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.350] [18:42:17.351] getGlobalsAndPackages() ... DONE [18:42:17.351] run() for 'Future' ... [18:42:17.351] - state: 'created' [18:42:17.352] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:17.368] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:17.368] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:17.368] - Field: 'node' [18:42:17.369] - Field: 'label' [18:42:17.369] - Field: 'local' [18:42:17.369] - Field: 'owner' [18:42:17.369] - Field: 'envir' [18:42:17.369] - Field: 'workers' [18:42:17.370] - Field: 'packages' [18:42:17.370] - Field: 'gc' [18:42:17.370] - Field: 'conditions' [18:42:17.370] - Field: 'persistent' [18:42:17.370] - Field: 'expr' [18:42:17.371] - Field: 'uuid' [18:42:17.371] - Field: 'seed' [18:42:17.371] - Field: 'version' [18:42:17.371] - Field: 'result' [18:42:17.371] - Field: 'asynchronous' [18:42:17.372] - Field: 'calls' [18:42:17.372] - Field: 'globals' [18:42:17.372] - Field: 'stdout' [18:42:17.372] - Field: 'earlySignal' [18:42:17.372] - Field: 'lazy' [18:42:17.373] - Field: 'state' [18:42:17.373] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:17.373] - Launch lazy future ... [18:42:17.373] Packages needed by the future expression (n = 0): [18:42:17.374] Packages needed by future strategies (n = 0): [18:42:17.374] { [18:42:17.374] { [18:42:17.374] { [18:42:17.374] ...future.startTime <- base::Sys.time() [18:42:17.374] { [18:42:17.374] { [18:42:17.374] { [18:42:17.374] { [18:42:17.374] base::local({ [18:42:17.374] has_future <- base::requireNamespace("future", [18:42:17.374] quietly = TRUE) [18:42:17.374] if (has_future) { [18:42:17.374] ns <- base::getNamespace("future") [18:42:17.374] version <- ns[[".package"]][["version"]] [18:42:17.374] if (is.null(version)) [18:42:17.374] version <- utils::packageVersion("future") [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] version <- NULL [18:42:17.374] } [18:42:17.374] if (!has_future || version < "1.8.0") { [18:42:17.374] info <- base::c(r_version = base::gsub("R version ", [18:42:17.374] "", base::R.version$version.string), [18:42:17.374] platform = base::sprintf("%s (%s-bit)", [18:42:17.374] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:17.374] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:17.374] "release", "version")], collapse = " "), [18:42:17.374] hostname = base::Sys.info()[["nodename"]]) [18:42:17.374] info <- base::sprintf("%s: %s", base::names(info), [18:42:17.374] info) [18:42:17.374] info <- base::paste(info, collapse = "; ") [18:42:17.374] if (!has_future) { [18:42:17.374] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:17.374] info) [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:17.374] info, version) [18:42:17.374] } [18:42:17.374] base::stop(msg) [18:42:17.374] } [18:42:17.374] }) [18:42:17.374] } [18:42:17.374] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:17.374] base::options(mc.cores = 1L) [18:42:17.374] } [18:42:17.374] ...future.strategy.old <- future::plan("list") [18:42:17.374] options(future.plan = NULL) [18:42:17.374] Sys.unsetenv("R_FUTURE_PLAN") [18:42:17.374] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:17.374] } [18:42:17.374] ...future.workdir <- getwd() [18:42:17.374] } [18:42:17.374] ...future.oldOptions <- base::as.list(base::.Options) [18:42:17.374] ...future.oldEnvVars <- base::Sys.getenv() [18:42:17.374] } [18:42:17.374] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:17.374] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:17.374] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:17.374] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:17.374] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:17.374] future.stdout.windows.reencode = NULL, width = 80L) [18:42:17.374] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:17.374] base::names(...future.oldOptions)) [18:42:17.374] } [18:42:17.374] if (FALSE) { [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] if (FALSE) { [18:42:17.374] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:17.374] open = "w") [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:17.374] windows = "NUL", "/dev/null"), open = "w") [18:42:17.374] } [18:42:17.374] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:17.374] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:17.374] base::sink(type = "output", split = FALSE) [18:42:17.374] base::close(...future.stdout) [18:42:17.374] }, add = TRUE) [18:42:17.374] } [18:42:17.374] ...future.frame <- base::sys.nframe() [18:42:17.374] ...future.conditions <- base::list() [18:42:17.374] ...future.rng <- base::globalenv()$.Random.seed [18:42:17.374] if (FALSE) { [18:42:17.374] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:17.374] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:17.374] } [18:42:17.374] ...future.result <- base::tryCatch({ [18:42:17.374] base::withCallingHandlers({ [18:42:17.374] ...future.value <- base::withVisible(base::local({ [18:42:17.374] ...future.makeSendCondition <- base::local({ [18:42:17.374] sendCondition <- NULL [18:42:17.374] function(frame = 1L) { [18:42:17.374] if (is.function(sendCondition)) [18:42:17.374] return(sendCondition) [18:42:17.374] ns <- getNamespace("parallel") [18:42:17.374] if (exists("sendData", mode = "function", [18:42:17.374] envir = ns)) { [18:42:17.374] parallel_sendData <- get("sendData", mode = "function", [18:42:17.374] envir = ns) [18:42:17.374] envir <- sys.frame(frame) [18:42:17.374] master <- NULL [18:42:17.374] while (!identical(envir, .GlobalEnv) && [18:42:17.374] !identical(envir, emptyenv())) { [18:42:17.374] if (exists("master", mode = "list", envir = envir, [18:42:17.374] inherits = FALSE)) { [18:42:17.374] master <- get("master", mode = "list", [18:42:17.374] envir = envir, inherits = FALSE) [18:42:17.374] if (inherits(master, c("SOCKnode", [18:42:17.374] "SOCK0node"))) { [18:42:17.374] sendCondition <<- function(cond) { [18:42:17.374] data <- list(type = "VALUE", value = cond, [18:42:17.374] success = TRUE) [18:42:17.374] parallel_sendData(master, data) [18:42:17.374] } [18:42:17.374] return(sendCondition) [18:42:17.374] } [18:42:17.374] } [18:42:17.374] frame <- frame + 1L [18:42:17.374] envir <- sys.frame(frame) [18:42:17.374] } [18:42:17.374] } [18:42:17.374] sendCondition <<- function(cond) NULL [18:42:17.374] } [18:42:17.374] }) [18:42:17.374] withCallingHandlers({ [18:42:17.374] { [18:42:17.374] do.call(function(...) { [18:42:17.374] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.374] if (!identical(...future.globals.maxSize.org, [18:42:17.374] ...future.globals.maxSize)) { [18:42:17.374] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.374] on.exit(options(oopts), add = TRUE) [18:42:17.374] } [18:42:17.374] { [18:42:17.374] lapply(seq_along(...future.elements_ii), [18:42:17.374] FUN = function(jj) { [18:42:17.374] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.374] ...future.FUN(...future.X_jj, ...) [18:42:17.374] }) [18:42:17.374] } [18:42:17.374] }, args = future.call.arguments) [18:42:17.374] } [18:42:17.374] }, immediateCondition = function(cond) { [18:42:17.374] sendCondition <- ...future.makeSendCondition() [18:42:17.374] sendCondition(cond) [18:42:17.374] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.374] { [18:42:17.374] inherits <- base::inherits [18:42:17.374] invokeRestart <- base::invokeRestart [18:42:17.374] is.null <- base::is.null [18:42:17.374] muffled <- FALSE [18:42:17.374] if (inherits(cond, "message")) { [18:42:17.374] muffled <- grepl(pattern, "muffleMessage") [18:42:17.374] if (muffled) [18:42:17.374] invokeRestart("muffleMessage") [18:42:17.374] } [18:42:17.374] else if (inherits(cond, "warning")) { [18:42:17.374] muffled <- grepl(pattern, "muffleWarning") [18:42:17.374] if (muffled) [18:42:17.374] invokeRestart("muffleWarning") [18:42:17.374] } [18:42:17.374] else if (inherits(cond, "condition")) { [18:42:17.374] if (!is.null(pattern)) { [18:42:17.374] computeRestarts <- base::computeRestarts [18:42:17.374] grepl <- base::grepl [18:42:17.374] restarts <- computeRestarts(cond) [18:42:17.374] for (restart in restarts) { [18:42:17.374] name <- restart$name [18:42:17.374] if (is.null(name)) [18:42:17.374] next [18:42:17.374] if (!grepl(pattern, name)) [18:42:17.374] next [18:42:17.374] invokeRestart(restart) [18:42:17.374] muffled <- TRUE [18:42:17.374] break [18:42:17.374] } [18:42:17.374] } [18:42:17.374] } [18:42:17.374] invisible(muffled) [18:42:17.374] } [18:42:17.374] muffleCondition(cond) [18:42:17.374] }) [18:42:17.374] })) [18:42:17.374] future::FutureResult(value = ...future.value$value, [18:42:17.374] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:17.374] ...future.rng), globalenv = if (FALSE) [18:42:17.374] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:17.374] ...future.globalenv.names)) [18:42:17.374] else NULL, started = ...future.startTime, version = "1.8") [18:42:17.374] }, condition = base::local({ [18:42:17.374] c <- base::c [18:42:17.374] inherits <- base::inherits [18:42:17.374] invokeRestart <- base::invokeRestart [18:42:17.374] length <- base::length [18:42:17.374] list <- base::list [18:42:17.374] seq.int <- base::seq.int [18:42:17.374] signalCondition <- base::signalCondition [18:42:17.374] sys.calls <- base::sys.calls [18:42:17.374] `[[` <- base::`[[` [18:42:17.374] `+` <- base::`+` [18:42:17.374] `<<-` <- base::`<<-` [18:42:17.374] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:17.374] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:17.374] 3L)] [18:42:17.374] } [18:42:17.374] function(cond) { [18:42:17.374] is_error <- inherits(cond, "error") [18:42:17.374] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:17.374] NULL) [18:42:17.374] if (is_error) { [18:42:17.374] sessionInformation <- function() { [18:42:17.374] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:17.374] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:17.374] search = base::search(), system = base::Sys.info()) [18:42:17.374] } [18:42:17.374] ...future.conditions[[length(...future.conditions) + [18:42:17.374] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:17.374] cond$call), session = sessionInformation(), [18:42:17.374] timestamp = base::Sys.time(), signaled = 0L) [18:42:17.374] signalCondition(cond) [18:42:17.374] } [18:42:17.374] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:17.374] "immediateCondition"))) { [18:42:17.374] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:17.374] ...future.conditions[[length(...future.conditions) + [18:42:17.374] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:17.374] if (TRUE && !signal) { [18:42:17.374] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.374] { [18:42:17.374] inherits <- base::inherits [18:42:17.374] invokeRestart <- base::invokeRestart [18:42:17.374] is.null <- base::is.null [18:42:17.374] muffled <- FALSE [18:42:17.374] if (inherits(cond, "message")) { [18:42:17.374] muffled <- grepl(pattern, "muffleMessage") [18:42:17.374] if (muffled) [18:42:17.374] invokeRestart("muffleMessage") [18:42:17.374] } [18:42:17.374] else if (inherits(cond, "warning")) { [18:42:17.374] muffled <- grepl(pattern, "muffleWarning") [18:42:17.374] if (muffled) [18:42:17.374] invokeRestart("muffleWarning") [18:42:17.374] } [18:42:17.374] else if (inherits(cond, "condition")) { [18:42:17.374] if (!is.null(pattern)) { [18:42:17.374] computeRestarts <- base::computeRestarts [18:42:17.374] grepl <- base::grepl [18:42:17.374] restarts <- computeRestarts(cond) [18:42:17.374] for (restart in restarts) { [18:42:17.374] name <- restart$name [18:42:17.374] if (is.null(name)) [18:42:17.374] next [18:42:17.374] if (!grepl(pattern, name)) [18:42:17.374] next [18:42:17.374] invokeRestart(restart) [18:42:17.374] muffled <- TRUE [18:42:17.374] break [18:42:17.374] } [18:42:17.374] } [18:42:17.374] } [18:42:17.374] invisible(muffled) [18:42:17.374] } [18:42:17.374] muffleCondition(cond, pattern = "^muffle") [18:42:17.374] } [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] if (TRUE) { [18:42:17.374] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.374] { [18:42:17.374] inherits <- base::inherits [18:42:17.374] invokeRestart <- base::invokeRestart [18:42:17.374] is.null <- base::is.null [18:42:17.374] muffled <- FALSE [18:42:17.374] if (inherits(cond, "message")) { [18:42:17.374] muffled <- grepl(pattern, "muffleMessage") [18:42:17.374] if (muffled) [18:42:17.374] invokeRestart("muffleMessage") [18:42:17.374] } [18:42:17.374] else if (inherits(cond, "warning")) { [18:42:17.374] muffled <- grepl(pattern, "muffleWarning") [18:42:17.374] if (muffled) [18:42:17.374] invokeRestart("muffleWarning") [18:42:17.374] } [18:42:17.374] else if (inherits(cond, "condition")) { [18:42:17.374] if (!is.null(pattern)) { [18:42:17.374] computeRestarts <- base::computeRestarts [18:42:17.374] grepl <- base::grepl [18:42:17.374] restarts <- computeRestarts(cond) [18:42:17.374] for (restart in restarts) { [18:42:17.374] name <- restart$name [18:42:17.374] if (is.null(name)) [18:42:17.374] next [18:42:17.374] if (!grepl(pattern, name)) [18:42:17.374] next [18:42:17.374] invokeRestart(restart) [18:42:17.374] muffled <- TRUE [18:42:17.374] break [18:42:17.374] } [18:42:17.374] } [18:42:17.374] } [18:42:17.374] invisible(muffled) [18:42:17.374] } [18:42:17.374] muffleCondition(cond, pattern = "^muffle") [18:42:17.374] } [18:42:17.374] } [18:42:17.374] } [18:42:17.374] })) [18:42:17.374] }, error = function(ex) { [18:42:17.374] base::structure(base::list(value = NULL, visible = NULL, [18:42:17.374] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:17.374] ...future.rng), started = ...future.startTime, [18:42:17.374] finished = Sys.time(), session_uuid = NA_character_, [18:42:17.374] version = "1.8"), class = "FutureResult") [18:42:17.374] }, finally = { [18:42:17.374] if (!identical(...future.workdir, getwd())) [18:42:17.374] setwd(...future.workdir) [18:42:17.374] { [18:42:17.374] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:17.374] ...future.oldOptions$nwarnings <- NULL [18:42:17.374] } [18:42:17.374] base::options(...future.oldOptions) [18:42:17.374] if (.Platform$OS.type == "windows") { [18:42:17.374] old_names <- names(...future.oldEnvVars) [18:42:17.374] envs <- base::Sys.getenv() [18:42:17.374] names <- names(envs) [18:42:17.374] common <- intersect(names, old_names) [18:42:17.374] added <- setdiff(names, old_names) [18:42:17.374] removed <- setdiff(old_names, names) [18:42:17.374] changed <- common[...future.oldEnvVars[common] != [18:42:17.374] envs[common]] [18:42:17.374] NAMES <- toupper(changed) [18:42:17.374] args <- list() [18:42:17.374] for (kk in seq_along(NAMES)) { [18:42:17.374] name <- changed[[kk]] [18:42:17.374] NAME <- NAMES[[kk]] [18:42:17.374] if (name != NAME && is.element(NAME, old_names)) [18:42:17.374] next [18:42:17.374] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:17.374] } [18:42:17.374] NAMES <- toupper(added) [18:42:17.374] for (kk in seq_along(NAMES)) { [18:42:17.374] name <- added[[kk]] [18:42:17.374] NAME <- NAMES[[kk]] [18:42:17.374] if (name != NAME && is.element(NAME, old_names)) [18:42:17.374] next [18:42:17.374] args[[name]] <- "" [18:42:17.374] } [18:42:17.374] NAMES <- toupper(removed) [18:42:17.374] for (kk in seq_along(NAMES)) { [18:42:17.374] name <- removed[[kk]] [18:42:17.374] NAME <- NAMES[[kk]] [18:42:17.374] if (name != NAME && is.element(NAME, old_names)) [18:42:17.374] next [18:42:17.374] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:17.374] } [18:42:17.374] if (length(args) > 0) [18:42:17.374] base::do.call(base::Sys.setenv, args = args) [18:42:17.374] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:17.374] } [18:42:17.374] { [18:42:17.374] if (base::length(...future.futureOptionsAdded) > [18:42:17.374] 0L) { [18:42:17.374] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:17.374] base::names(opts) <- ...future.futureOptionsAdded [18:42:17.374] base::options(opts) [18:42:17.374] } [18:42:17.374] { [18:42:17.374] { [18:42:17.374] base::options(mc.cores = ...future.mc.cores.old) [18:42:17.374] NULL [18:42:17.374] } [18:42:17.374] options(future.plan = NULL) [18:42:17.374] if (is.na(NA_character_)) [18:42:17.374] Sys.unsetenv("R_FUTURE_PLAN") [18:42:17.374] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:17.374] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:17.374] .init = FALSE) [18:42:17.374] } [18:42:17.374] } [18:42:17.374] } [18:42:17.374] }) [18:42:17.374] if (TRUE) { [18:42:17.374] base::sink(type = "output", split = FALSE) [18:42:17.374] if (FALSE) { [18:42:17.374] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:17.374] } [18:42:17.374] else { [18:42:17.374] ...future.result["stdout"] <- base::list(NULL) [18:42:17.374] } [18:42:17.374] base::close(...future.stdout) [18:42:17.374] ...future.stdout <- NULL [18:42:17.374] } [18:42:17.374] ...future.result$conditions <- ...future.conditions [18:42:17.374] ...future.result$finished <- base::Sys.time() [18:42:17.374] ...future.result [18:42:17.374] } [18:42:17.380] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:42:17.380] Exporting '...future.FUN' (841 bytes) to cluster node #1 ... [18:42:17.381] Exporting '...future.FUN' (841 bytes) to cluster node #1 ... DONE [18:42:17.381] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:42:17.382] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:42:17.382] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:42:17.382] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:42:17.383] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:42:17.383] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:42:17.383] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:42:17.384] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:42:17.384] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:42:17.385] MultisessionFuture started [18:42:17.385] - Launch lazy future ... done [18:42:17.386] run() for 'MultisessionFuture' ... done [18:42:17.386] Created future: [18:42:17.386] MultisessionFuture: [18:42:17.386] Label: 'future_lapply-1' [18:42:17.386] Expression: [18:42:17.386] { [18:42:17.386] do.call(function(...) { [18:42:17.386] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.386] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:17.386] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.386] on.exit(options(oopts), add = TRUE) [18:42:17.386] } [18:42:17.386] { [18:42:17.386] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:17.386] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.386] ...future.FUN(...future.X_jj, ...) [18:42:17.386] }) [18:42:17.386] } [18:42:17.386] }, args = future.call.arguments) [18:42:17.386] } [18:42:17.386] Lazy evaluation: FALSE [18:42:17.386] Asynchronous evaluation: TRUE [18:42:17.386] Local evaluation: TRUE [18:42:17.386] Environment: R_GlobalEnv [18:42:17.386] Capture standard output: FALSE [18:42:17.386] Capture condition classes: 'condition' (excluding 'nothing') [18:42:17.386] Globals: 5 objects totaling 1.01 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:17.386] Packages: [18:42:17.386] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:17.386] Resolved: FALSE [18:42:17.386] Value: [18:42:17.386] Conditions captured: [18:42:17.386] Early signaling: FALSE [18:42:17.386] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:17.386] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:17.585] Chunk #1 of 2 ... DONE [18:42:17.585] Chunk #2 of 2 ... [18:42:17.586] - Finding globals in 'X' for chunk #2 ... [18:42:17.586] getGlobalsAndPackages() ... [18:42:17.586] Searching for globals... [18:42:17.586] [18:42:17.587] Searching for globals ... DONE [18:42:17.587] - globals: [0] [18:42:17.587] getGlobalsAndPackages() ... DONE [18:42:17.587] + additional globals found: [n=0] [18:42:17.588] + additional namespaces needed: [n=0] [18:42:17.588] - Finding globals in 'X' for chunk #2 ... DONE [18:42:17.588] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:17.588] - seeds: [18:42:17.588] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.589] getGlobalsAndPackages() ... [18:42:17.589] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.589] Resolving globals: FALSE [18:42:17.589] Tweak future expression to call with '...' arguments ... [18:42:17.590] { [18:42:17.590] do.call(function(...) { [18:42:17.590] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.590] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:17.590] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.590] on.exit(options(oopts), add = TRUE) [18:42:17.590] } [18:42:17.590] { [18:42:17.590] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:17.590] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.590] ...future.FUN(...future.X_jj, ...) [18:42:17.590] }) [18:42:17.590] } [18:42:17.590] }, args = future.call.arguments) [18:42:17.590] } [18:42:17.590] Tweak future expression to call with '...' arguments ... DONE [18:42:17.591] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.591] [18:42:17.591] getGlobalsAndPackages() ... DONE [18:42:17.592] run() for 'Future' ... [18:42:17.592] - state: 'created' [18:42:17.592] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:17.611] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:17.611] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:17.612] - Field: 'node' [18:42:17.612] - Field: 'label' [18:42:17.612] - Field: 'local' [18:42:17.612] - Field: 'owner' [18:42:17.612] - Field: 'envir' [18:42:17.613] - Field: 'workers' [18:42:17.613] - Field: 'packages' [18:42:17.613] - Field: 'gc' [18:42:17.613] - Field: 'conditions' [18:42:17.613] - Field: 'persistent' [18:42:17.614] - Field: 'expr' [18:42:17.614] - Field: 'uuid' [18:42:17.614] - Field: 'seed' [18:42:17.614] - Field: 'version' [18:42:17.614] - Field: 'result' [18:42:17.615] - Field: 'asynchronous' [18:42:17.615] - Field: 'calls' [18:42:17.615] - Field: 'globals' [18:42:17.615] - Field: 'stdout' [18:42:17.615] - Field: 'earlySignal' [18:42:17.616] - Field: 'lazy' [18:42:17.616] - Field: 'state' [18:42:17.616] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:17.616] - Launch lazy future ... [18:42:17.617] Packages needed by the future expression (n = 0): [18:42:17.617] Packages needed by future strategies (n = 0): [18:42:17.618] { [18:42:17.618] { [18:42:17.618] { [18:42:17.618] ...future.startTime <- base::Sys.time() [18:42:17.618] { [18:42:17.618] { [18:42:17.618] { [18:42:17.618] { [18:42:17.618] base::local({ [18:42:17.618] has_future <- base::requireNamespace("future", [18:42:17.618] quietly = TRUE) [18:42:17.618] if (has_future) { [18:42:17.618] ns <- base::getNamespace("future") [18:42:17.618] version <- ns[[".package"]][["version"]] [18:42:17.618] if (is.null(version)) [18:42:17.618] version <- utils::packageVersion("future") [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] version <- NULL [18:42:17.618] } [18:42:17.618] if (!has_future || version < "1.8.0") { [18:42:17.618] info <- base::c(r_version = base::gsub("R version ", [18:42:17.618] "", base::R.version$version.string), [18:42:17.618] platform = base::sprintf("%s (%s-bit)", [18:42:17.618] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:17.618] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:17.618] "release", "version")], collapse = " "), [18:42:17.618] hostname = base::Sys.info()[["nodename"]]) [18:42:17.618] info <- base::sprintf("%s: %s", base::names(info), [18:42:17.618] info) [18:42:17.618] info <- base::paste(info, collapse = "; ") [18:42:17.618] if (!has_future) { [18:42:17.618] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:17.618] info) [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:17.618] info, version) [18:42:17.618] } [18:42:17.618] base::stop(msg) [18:42:17.618] } [18:42:17.618] }) [18:42:17.618] } [18:42:17.618] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:17.618] base::options(mc.cores = 1L) [18:42:17.618] } [18:42:17.618] ...future.strategy.old <- future::plan("list") [18:42:17.618] options(future.plan = NULL) [18:42:17.618] Sys.unsetenv("R_FUTURE_PLAN") [18:42:17.618] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:17.618] } [18:42:17.618] ...future.workdir <- getwd() [18:42:17.618] } [18:42:17.618] ...future.oldOptions <- base::as.list(base::.Options) [18:42:17.618] ...future.oldEnvVars <- base::Sys.getenv() [18:42:17.618] } [18:42:17.618] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:17.618] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:17.618] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:17.618] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:17.618] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:17.618] future.stdout.windows.reencode = NULL, width = 80L) [18:42:17.618] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:17.618] base::names(...future.oldOptions)) [18:42:17.618] } [18:42:17.618] if (FALSE) { [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] if (FALSE) { [18:42:17.618] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:17.618] open = "w") [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:17.618] windows = "NUL", "/dev/null"), open = "w") [18:42:17.618] } [18:42:17.618] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:17.618] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:17.618] base::sink(type = "output", split = FALSE) [18:42:17.618] base::close(...future.stdout) [18:42:17.618] }, add = TRUE) [18:42:17.618] } [18:42:17.618] ...future.frame <- base::sys.nframe() [18:42:17.618] ...future.conditions <- base::list() [18:42:17.618] ...future.rng <- base::globalenv()$.Random.seed [18:42:17.618] if (FALSE) { [18:42:17.618] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:17.618] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:17.618] } [18:42:17.618] ...future.result <- base::tryCatch({ [18:42:17.618] base::withCallingHandlers({ [18:42:17.618] ...future.value <- base::withVisible(base::local({ [18:42:17.618] ...future.makeSendCondition <- base::local({ [18:42:17.618] sendCondition <- NULL [18:42:17.618] function(frame = 1L) { [18:42:17.618] if (is.function(sendCondition)) [18:42:17.618] return(sendCondition) [18:42:17.618] ns <- getNamespace("parallel") [18:42:17.618] if (exists("sendData", mode = "function", [18:42:17.618] envir = ns)) { [18:42:17.618] parallel_sendData <- get("sendData", mode = "function", [18:42:17.618] envir = ns) [18:42:17.618] envir <- sys.frame(frame) [18:42:17.618] master <- NULL [18:42:17.618] while (!identical(envir, .GlobalEnv) && [18:42:17.618] !identical(envir, emptyenv())) { [18:42:17.618] if (exists("master", mode = "list", envir = envir, [18:42:17.618] inherits = FALSE)) { [18:42:17.618] master <- get("master", mode = "list", [18:42:17.618] envir = envir, inherits = FALSE) [18:42:17.618] if (inherits(master, c("SOCKnode", [18:42:17.618] "SOCK0node"))) { [18:42:17.618] sendCondition <<- function(cond) { [18:42:17.618] data <- list(type = "VALUE", value = cond, [18:42:17.618] success = TRUE) [18:42:17.618] parallel_sendData(master, data) [18:42:17.618] } [18:42:17.618] return(sendCondition) [18:42:17.618] } [18:42:17.618] } [18:42:17.618] frame <- frame + 1L [18:42:17.618] envir <- sys.frame(frame) [18:42:17.618] } [18:42:17.618] } [18:42:17.618] sendCondition <<- function(cond) NULL [18:42:17.618] } [18:42:17.618] }) [18:42:17.618] withCallingHandlers({ [18:42:17.618] { [18:42:17.618] do.call(function(...) { [18:42:17.618] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.618] if (!identical(...future.globals.maxSize.org, [18:42:17.618] ...future.globals.maxSize)) { [18:42:17.618] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.618] on.exit(options(oopts), add = TRUE) [18:42:17.618] } [18:42:17.618] { [18:42:17.618] lapply(seq_along(...future.elements_ii), [18:42:17.618] FUN = function(jj) { [18:42:17.618] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.618] ...future.FUN(...future.X_jj, ...) [18:42:17.618] }) [18:42:17.618] } [18:42:17.618] }, args = future.call.arguments) [18:42:17.618] } [18:42:17.618] }, immediateCondition = function(cond) { [18:42:17.618] sendCondition <- ...future.makeSendCondition() [18:42:17.618] sendCondition(cond) [18:42:17.618] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.618] { [18:42:17.618] inherits <- base::inherits [18:42:17.618] invokeRestart <- base::invokeRestart [18:42:17.618] is.null <- base::is.null [18:42:17.618] muffled <- FALSE [18:42:17.618] if (inherits(cond, "message")) { [18:42:17.618] muffled <- grepl(pattern, "muffleMessage") [18:42:17.618] if (muffled) [18:42:17.618] invokeRestart("muffleMessage") [18:42:17.618] } [18:42:17.618] else if (inherits(cond, "warning")) { [18:42:17.618] muffled <- grepl(pattern, "muffleWarning") [18:42:17.618] if (muffled) [18:42:17.618] invokeRestart("muffleWarning") [18:42:17.618] } [18:42:17.618] else if (inherits(cond, "condition")) { [18:42:17.618] if (!is.null(pattern)) { [18:42:17.618] computeRestarts <- base::computeRestarts [18:42:17.618] grepl <- base::grepl [18:42:17.618] restarts <- computeRestarts(cond) [18:42:17.618] for (restart in restarts) { [18:42:17.618] name <- restart$name [18:42:17.618] if (is.null(name)) [18:42:17.618] next [18:42:17.618] if (!grepl(pattern, name)) [18:42:17.618] next [18:42:17.618] invokeRestart(restart) [18:42:17.618] muffled <- TRUE [18:42:17.618] break [18:42:17.618] } [18:42:17.618] } [18:42:17.618] } [18:42:17.618] invisible(muffled) [18:42:17.618] } [18:42:17.618] muffleCondition(cond) [18:42:17.618] }) [18:42:17.618] })) [18:42:17.618] future::FutureResult(value = ...future.value$value, [18:42:17.618] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:17.618] ...future.rng), globalenv = if (FALSE) [18:42:17.618] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:17.618] ...future.globalenv.names)) [18:42:17.618] else NULL, started = ...future.startTime, version = "1.8") [18:42:17.618] }, condition = base::local({ [18:42:17.618] c <- base::c [18:42:17.618] inherits <- base::inherits [18:42:17.618] invokeRestart <- base::invokeRestart [18:42:17.618] length <- base::length [18:42:17.618] list <- base::list [18:42:17.618] seq.int <- base::seq.int [18:42:17.618] signalCondition <- base::signalCondition [18:42:17.618] sys.calls <- base::sys.calls [18:42:17.618] `[[` <- base::`[[` [18:42:17.618] `+` <- base::`+` [18:42:17.618] `<<-` <- base::`<<-` [18:42:17.618] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:17.618] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:17.618] 3L)] [18:42:17.618] } [18:42:17.618] function(cond) { [18:42:17.618] is_error <- inherits(cond, "error") [18:42:17.618] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:17.618] NULL) [18:42:17.618] if (is_error) { [18:42:17.618] sessionInformation <- function() { [18:42:17.618] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:17.618] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:17.618] search = base::search(), system = base::Sys.info()) [18:42:17.618] } [18:42:17.618] ...future.conditions[[length(...future.conditions) + [18:42:17.618] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:17.618] cond$call), session = sessionInformation(), [18:42:17.618] timestamp = base::Sys.time(), signaled = 0L) [18:42:17.618] signalCondition(cond) [18:42:17.618] } [18:42:17.618] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:17.618] "immediateCondition"))) { [18:42:17.618] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:17.618] ...future.conditions[[length(...future.conditions) + [18:42:17.618] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:17.618] if (TRUE && !signal) { [18:42:17.618] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.618] { [18:42:17.618] inherits <- base::inherits [18:42:17.618] invokeRestart <- base::invokeRestart [18:42:17.618] is.null <- base::is.null [18:42:17.618] muffled <- FALSE [18:42:17.618] if (inherits(cond, "message")) { [18:42:17.618] muffled <- grepl(pattern, "muffleMessage") [18:42:17.618] if (muffled) [18:42:17.618] invokeRestart("muffleMessage") [18:42:17.618] } [18:42:17.618] else if (inherits(cond, "warning")) { [18:42:17.618] muffled <- grepl(pattern, "muffleWarning") [18:42:17.618] if (muffled) [18:42:17.618] invokeRestart("muffleWarning") [18:42:17.618] } [18:42:17.618] else if (inherits(cond, "condition")) { [18:42:17.618] if (!is.null(pattern)) { [18:42:17.618] computeRestarts <- base::computeRestarts [18:42:17.618] grepl <- base::grepl [18:42:17.618] restarts <- computeRestarts(cond) [18:42:17.618] for (restart in restarts) { [18:42:17.618] name <- restart$name [18:42:17.618] if (is.null(name)) [18:42:17.618] next [18:42:17.618] if (!grepl(pattern, name)) [18:42:17.618] next [18:42:17.618] invokeRestart(restart) [18:42:17.618] muffled <- TRUE [18:42:17.618] break [18:42:17.618] } [18:42:17.618] } [18:42:17.618] } [18:42:17.618] invisible(muffled) [18:42:17.618] } [18:42:17.618] muffleCondition(cond, pattern = "^muffle") [18:42:17.618] } [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] if (TRUE) { [18:42:17.618] muffleCondition <- function (cond, pattern = "^muffle") [18:42:17.618] { [18:42:17.618] inherits <- base::inherits [18:42:17.618] invokeRestart <- base::invokeRestart [18:42:17.618] is.null <- base::is.null [18:42:17.618] muffled <- FALSE [18:42:17.618] if (inherits(cond, "message")) { [18:42:17.618] muffled <- grepl(pattern, "muffleMessage") [18:42:17.618] if (muffled) [18:42:17.618] invokeRestart("muffleMessage") [18:42:17.618] } [18:42:17.618] else if (inherits(cond, "warning")) { [18:42:17.618] muffled <- grepl(pattern, "muffleWarning") [18:42:17.618] if (muffled) [18:42:17.618] invokeRestart("muffleWarning") [18:42:17.618] } [18:42:17.618] else if (inherits(cond, "condition")) { [18:42:17.618] if (!is.null(pattern)) { [18:42:17.618] computeRestarts <- base::computeRestarts [18:42:17.618] grepl <- base::grepl [18:42:17.618] restarts <- computeRestarts(cond) [18:42:17.618] for (restart in restarts) { [18:42:17.618] name <- restart$name [18:42:17.618] if (is.null(name)) [18:42:17.618] next [18:42:17.618] if (!grepl(pattern, name)) [18:42:17.618] next [18:42:17.618] invokeRestart(restart) [18:42:17.618] muffled <- TRUE [18:42:17.618] break [18:42:17.618] } [18:42:17.618] } [18:42:17.618] } [18:42:17.618] invisible(muffled) [18:42:17.618] } [18:42:17.618] muffleCondition(cond, pattern = "^muffle") [18:42:17.618] } [18:42:17.618] } [18:42:17.618] } [18:42:17.618] })) [18:42:17.618] }, error = function(ex) { [18:42:17.618] base::structure(base::list(value = NULL, visible = NULL, [18:42:17.618] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:17.618] ...future.rng), started = ...future.startTime, [18:42:17.618] finished = Sys.time(), session_uuid = NA_character_, [18:42:17.618] version = "1.8"), class = "FutureResult") [18:42:17.618] }, finally = { [18:42:17.618] if (!identical(...future.workdir, getwd())) [18:42:17.618] setwd(...future.workdir) [18:42:17.618] { [18:42:17.618] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:17.618] ...future.oldOptions$nwarnings <- NULL [18:42:17.618] } [18:42:17.618] base::options(...future.oldOptions) [18:42:17.618] if (.Platform$OS.type == "windows") { [18:42:17.618] old_names <- names(...future.oldEnvVars) [18:42:17.618] envs <- base::Sys.getenv() [18:42:17.618] names <- names(envs) [18:42:17.618] common <- intersect(names, old_names) [18:42:17.618] added <- setdiff(names, old_names) [18:42:17.618] removed <- setdiff(old_names, names) [18:42:17.618] changed <- common[...future.oldEnvVars[common] != [18:42:17.618] envs[common]] [18:42:17.618] NAMES <- toupper(changed) [18:42:17.618] args <- list() [18:42:17.618] for (kk in seq_along(NAMES)) { [18:42:17.618] name <- changed[[kk]] [18:42:17.618] NAME <- NAMES[[kk]] [18:42:17.618] if (name != NAME && is.element(NAME, old_names)) [18:42:17.618] next [18:42:17.618] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:17.618] } [18:42:17.618] NAMES <- toupper(added) [18:42:17.618] for (kk in seq_along(NAMES)) { [18:42:17.618] name <- added[[kk]] [18:42:17.618] NAME <- NAMES[[kk]] [18:42:17.618] if (name != NAME && is.element(NAME, old_names)) [18:42:17.618] next [18:42:17.618] args[[name]] <- "" [18:42:17.618] } [18:42:17.618] NAMES <- toupper(removed) [18:42:17.618] for (kk in seq_along(NAMES)) { [18:42:17.618] name <- removed[[kk]] [18:42:17.618] NAME <- NAMES[[kk]] [18:42:17.618] if (name != NAME && is.element(NAME, old_names)) [18:42:17.618] next [18:42:17.618] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:17.618] } [18:42:17.618] if (length(args) > 0) [18:42:17.618] base::do.call(base::Sys.setenv, args = args) [18:42:17.618] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:17.618] } [18:42:17.618] { [18:42:17.618] if (base::length(...future.futureOptionsAdded) > [18:42:17.618] 0L) { [18:42:17.618] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:17.618] base::names(opts) <- ...future.futureOptionsAdded [18:42:17.618] base::options(opts) [18:42:17.618] } [18:42:17.618] { [18:42:17.618] { [18:42:17.618] base::options(mc.cores = ...future.mc.cores.old) [18:42:17.618] NULL [18:42:17.618] } [18:42:17.618] options(future.plan = NULL) [18:42:17.618] if (is.na(NA_character_)) [18:42:17.618] Sys.unsetenv("R_FUTURE_PLAN") [18:42:17.618] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:17.618] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:17.618] .init = FALSE) [18:42:17.618] } [18:42:17.618] } [18:42:17.618] } [18:42:17.618] }) [18:42:17.618] if (TRUE) { [18:42:17.618] base::sink(type = "output", split = FALSE) [18:42:17.618] if (FALSE) { [18:42:17.618] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:17.618] } [18:42:17.618] else { [18:42:17.618] ...future.result["stdout"] <- base::list(NULL) [18:42:17.618] } [18:42:17.618] base::close(...future.stdout) [18:42:17.618] ...future.stdout <- NULL [18:42:17.618] } [18:42:17.618] ...future.result$conditions <- ...future.conditions [18:42:17.618] ...future.result$finished <- base::Sys.time() [18:42:17.618] ...future.result [18:42:17.618] } [18:42:17.729] Exporting 5 global objects (1.46 KiB) to cluster node #2 ... [18:42:17.729] Exporting '...future.FUN' (841 bytes) to cluster node #2 ... [18:42:17.730] Exporting '...future.FUN' (841 bytes) to cluster node #2 ... DONE [18:42:17.730] Exporting 'future.call.arguments' (97 bytes) to cluster node #2 ... [18:42:17.730] Exporting 'future.call.arguments' (97 bytes) to cluster node #2 ... DONE [18:42:17.731] Exporting '...future.elements_ii' (43 bytes) to cluster node #2 ... [18:42:17.731] Exporting '...future.elements_ii' (43 bytes) to cluster node #2 ... DONE [18:42:17.731] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... [18:42:17.732] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... DONE [18:42:17.732] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... [18:42:17.735] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... DONE [18:42:17.735] Exporting 5 global objects (1.46 KiB) to cluster node #2 ... DONE [18:42:17.735] MultisessionFuture started [18:42:17.736] - Launch lazy future ... done [18:42:17.736] run() for 'MultisessionFuture' ... done [18:42:17.736] Created future: [18:42:17.818] receiveMessageFromWorker() for ClusterFuture ... [18:42:17.818] - Validating connection of MultisessionFuture [18:42:17.819] - received message: FutureResult [18:42:17.819] - Received FutureResult [18:42:17.819] - Erased future from FutureRegistry [18:42:17.820] result() for ClusterFuture ... [18:42:17.820] - result already collected: FutureResult [18:42:17.820] result() for ClusterFuture ... done [18:42:17.820] receiveMessageFromWorker() for ClusterFuture ... done [18:42:17.736] MultisessionFuture: [18:42:17.736] Label: 'future_lapply-2' [18:42:17.736] Expression: [18:42:17.736] { [18:42:17.736] do.call(function(...) { [18:42:17.736] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.736] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:17.736] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.736] on.exit(options(oopts), add = TRUE) [18:42:17.736] } [18:42:17.736] { [18:42:17.736] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:17.736] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.736] ...future.FUN(...future.X_jj, ...) [18:42:17.736] }) [18:42:17.736] } [18:42:17.736] }, args = future.call.arguments) [18:42:17.736] } [18:42:17.736] Lazy evaluation: FALSE [18:42:17.736] Asynchronous evaluation: TRUE [18:42:17.736] Local evaluation: TRUE [18:42:17.736] Environment: R_GlobalEnv [18:42:17.736] Capture standard output: FALSE [18:42:17.736] Capture condition classes: 'condition' (excluding 'nothing') [18:42:17.736] Globals: 5 objects totaling 1.01 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:17.736] Packages: [18:42:17.736] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:17.736] Resolved: TRUE [18:42:17.736] Value: [18:42:17.736] Conditions captured: [18:42:17.736] Early signaling: FALSE [18:42:17.736] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:17.736] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:17.821] Chunk #2 of 2 ... DONE [18:42:17.821] Launching 2 futures (chunks) ... DONE [18:42:17.822] Resolving 2 futures (chunks) ... [18:42:17.822] resolve() on list ... [18:42:17.822] recursive: 0 [18:42:17.822] length: 2 [18:42:17.823] [18:42:17.921] receiveMessageFromWorker() for ClusterFuture ... [18:42:17.921] - Validating connection of MultisessionFuture [18:42:17.922] - received message: FutureResult [18:42:17.922] - Received FutureResult [18:42:17.922] - Erased future from FutureRegistry [18:42:17.922] result() for ClusterFuture ... [18:42:17.923] - result already collected: FutureResult [18:42:17.923] result() for ClusterFuture ... done [18:42:17.923] receiveMessageFromWorker() for ClusterFuture ... done [18:42:17.923] Future #1 [18:42:17.924] result() for ClusterFuture ... [18:42:17.924] - result already collected: FutureResult [18:42:17.924] result() for ClusterFuture ... done [18:42:17.925] result() for ClusterFuture ... [18:42:17.925] - result already collected: FutureResult [18:42:17.925] result() for ClusterFuture ... done [18:42:17.925] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:42:17.926] - nx: 2 [18:42:17.926] - relay: TRUE [18:42:17.926] - stdout: TRUE [18:42:17.926] - signal: TRUE [18:42:17.927] - resignal: FALSE [18:42:17.927] - force: TRUE [18:42:17.927] - relayed: [n=2] FALSE, FALSE [18:42:17.927] - queued futures: [n=2] FALSE, FALSE [18:42:17.928] - until=1 [18:42:17.928] - relaying element #1 [18:42:17.928] result() for ClusterFuture ... [18:42:17.929] - result already collected: FutureResult [18:42:17.929] result() for ClusterFuture ... done [18:42:17.929] result() for ClusterFuture ... [18:42:17.929] - result already collected: FutureResult [18:42:17.930] result() for ClusterFuture ... done [18:42:17.930] result() for ClusterFuture ... [18:42:17.930] - result already collected: FutureResult [18:42:17.930] result() for ClusterFuture ... done [18:42:17.931] result() for ClusterFuture ... [18:42:17.931] - result already collected: FutureResult [18:42:17.931] result() for ClusterFuture ... done [18:42:17.931] - relayed: [n=2] TRUE, FALSE [18:42:17.932] - queued futures: [n=2] TRUE, FALSE [18:42:17.932] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:42:17.932] length: 1 (resolved future 1) [18:42:17.933] Future #2 [18:42:17.933] result() for ClusterFuture ... [18:42:17.933] - result already collected: FutureResult [18:42:17.933] result() for ClusterFuture ... done [18:42:17.934] result() for ClusterFuture ... [18:42:17.934] - result already collected: FutureResult [18:42:17.934] result() for ClusterFuture ... done [18:42:17.934] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:42:17.935] - nx: 2 [18:42:17.935] - relay: TRUE [18:42:17.935] - stdout: TRUE [18:42:17.935] - signal: TRUE [18:42:17.936] - resignal: FALSE [18:42:17.936] - force: TRUE [18:42:17.936] - relayed: [n=2] TRUE, FALSE [18:42:17.936] - queued futures: [n=2] TRUE, FALSE [18:42:17.937] - until=2 [18:42:17.937] - relaying element #2 [18:42:17.937] result() for ClusterFuture ... [18:42:17.937] - result already collected: FutureResult [18:42:17.938] result() for ClusterFuture ... done [18:42:17.938] result() for ClusterFuture ... [18:42:17.938] - result already collected: FutureResult [18:42:17.939] result() for ClusterFuture ... done [18:42:17.939] result() for ClusterFuture ... [18:42:17.939] - result already collected: FutureResult [18:42:17.939] result() for ClusterFuture ... done [18:42:17.940] result() for ClusterFuture ... [18:42:17.940] - result already collected: FutureResult [18:42:17.940] result() for ClusterFuture ... done [18:42:17.940] - relayed: [n=2] TRUE, TRUE [18:42:17.941] - queued futures: [n=2] TRUE, TRUE [18:42:17.941] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:42:17.941] length: 0 (resolved future 2) [18:42:17.942] Relaying remaining futures [18:42:17.942] signalConditionsASAP(NULL, pos=0) ... [18:42:17.942] - nx: 2 [18:42:17.942] - relay: TRUE [18:42:17.943] - stdout: TRUE [18:42:17.943] - signal: TRUE [18:42:17.943] - resignal: FALSE [18:42:17.943] - force: TRUE [18:42:17.944] - relayed: [n=2] TRUE, TRUE [18:42:17.944] - queued futures: [n=2] TRUE, TRUE - flush all [18:42:17.944] - relayed: [n=2] TRUE, TRUE [18:42:17.945] - queued futures: [n=2] TRUE, TRUE [18:42:17.945] signalConditionsASAP(NULL, pos=0) ... done [18:42:17.945] resolve() on list ... DONE [18:42:17.945] result() for ClusterFuture ... [18:42:17.946] - result already collected: FutureResult [18:42:17.946] result() for ClusterFuture ... done [18:42:17.946] result() for ClusterFuture ... [18:42:17.946] - result already collected: FutureResult [18:42:17.947] result() for ClusterFuture ... done [18:42:17.947] result() for ClusterFuture ... [18:42:17.947] - result already collected: FutureResult [18:42:17.947] result() for ClusterFuture ... done [18:42:17.948] result() for ClusterFuture ... [18:42:17.948] - result already collected: FutureResult [18:42:17.948] result() for ClusterFuture ... done [18:42:17.949] - Number of value chunks collected: 2 [18:42:17.949] Resolving 2 futures (chunks) ... DONE [18:42:17.949] Reducing values from 2 chunks ... [18:42:17.949] - Number of values collected after concatenation: 2 [18:42:17.950] - Number of values expected: 2 [18:42:17.950] Reducing values from 2 chunks ... DONE [18:42:17.950] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = FALSE) ... DONE * future_lapply(x, ..., future.stdout = TRUE) ... [18:42:17.951] future_lapply() ... [18:42:17.956] Number of chunks: 2 [18:42:17.957] getGlobalsAndPackagesXApply() ... [18:42:17.957] - future.globals: TRUE [18:42:17.957] getGlobalsAndPackages() ... [18:42:17.958] Searching for globals... [18:42:17.961] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:17.961] Searching for globals ... DONE [18:42:17.961] Resolving globals: FALSE [18:42:17.962] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:17.963] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:17.963] - globals: [1] 'FUN' [18:42:17.963] [18:42:17.964] getGlobalsAndPackages() ... DONE [18:42:17.964] - globals found/used: [n=1] 'FUN' [18:42:17.964] - needed namespaces: [n=0] [18:42:17.965] Finding globals ... DONE [18:42:17.965] - use_args: TRUE [18:42:17.965] - Getting '...' globals ... [18:42:17.966] resolve() on list ... [18:42:17.966] recursive: 0 [18:42:17.967] length: 1 [18:42:17.967] elements: '...' [18:42:17.967] length: 0 (resolved future 1) [18:42:17.967] resolve() on list ... DONE [18:42:17.968] - '...' content: [n=0] [18:42:17.968] List of 1 [18:42:17.968] $ ...: list() [18:42:17.968] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:17.968] - attr(*, "where")=List of 1 [18:42:17.968] ..$ ...: [18:42:17.968] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:17.968] - attr(*, "resolved")= logi TRUE [18:42:17.968] - attr(*, "total_size")= num NA [18:42:17.973] - Getting '...' globals ... DONE [18:42:17.973] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:17.974] List of 2 [18:42:17.974] $ ...future.FUN:function (x) [18:42:17.974] $ ... : list() [18:42:17.974] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:17.974] - attr(*, "where")=List of 2 [18:42:17.974] ..$ ...future.FUN: [18:42:17.974] ..$ ... : [18:42:17.974] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:17.974] - attr(*, "resolved")= logi FALSE [18:42:17.974] - attr(*, "total_size")= int 5632 [18:42:17.979] Packages to be attached in all futures: [n=0] [18:42:17.980] getGlobalsAndPackagesXApply() ... DONE [18:42:17.980] Number of futures (= number of chunks): 2 [18:42:17.981] Launching 2 futures (chunks) ... [18:42:17.981] Chunk #1 of 2 ... [18:42:17.981] - Finding globals in 'X' for chunk #1 ... [18:42:17.981] getGlobalsAndPackages() ... [18:42:17.982] Searching for globals... [18:42:17.982] [18:42:17.983] Searching for globals ... DONE [18:42:17.983] - globals: [0] [18:42:17.983] getGlobalsAndPackages() ... DONE [18:42:17.983] + additional globals found: [n=0] [18:42:17.984] + additional namespaces needed: [n=0] [18:42:17.984] - Finding globals in 'X' for chunk #1 ... DONE [18:42:17.984] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:17.984] - seeds: [18:42:17.985] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.985] getGlobalsAndPackages() ... [18:42:17.985] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.986] Resolving globals: FALSE [18:42:17.986] Tweak future expression to call with '...' arguments ... [18:42:17.986] { [18:42:17.986] do.call(function(...) { [18:42:17.986] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:17.986] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:17.986] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:17.986] on.exit(options(oopts), add = TRUE) [18:42:17.986] } [18:42:17.986] { [18:42:17.986] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:17.986] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:17.986] ...future.FUN(...future.X_jj, ...) [18:42:17.986] }) [18:42:17.986] } [18:42:17.986] }, args = future.call.arguments) [18:42:17.986] } [18:42:17.987] Tweak future expression to call with '...' arguments ... DONE [18:42:17.988] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:17.988] [18:42:17.988] getGlobalsAndPackages() ... DONE [18:42:17.989] run() for 'Future' ... [18:42:17.989] - state: 'created' [18:42:17.990] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:18.010] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.011] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:18.011] - Field: 'node' [18:42:18.011] - Field: 'label' [18:42:18.012] - Field: 'local' [18:42:18.012] - Field: 'owner' [18:42:18.012] - Field: 'envir' [18:42:18.012] - Field: 'workers' [18:42:18.013] - Field: 'packages' [18:42:18.013] - Field: 'gc' [18:42:18.013] - Field: 'conditions' [18:42:18.014] - Field: 'persistent' [18:42:18.014] - Field: 'expr' [18:42:18.014] - Field: 'uuid' [18:42:18.015] - Field: 'seed' [18:42:18.015] - Field: 'version' [18:42:18.015] - Field: 'result' [18:42:18.015] - Field: 'asynchronous' [18:42:18.016] - Field: 'calls' [18:42:18.016] - Field: 'globals' [18:42:18.016] - Field: 'stdout' [18:42:18.017] - Field: 'earlySignal' [18:42:18.017] - Field: 'lazy' [18:42:18.017] - Field: 'state' [18:42:18.017] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:18.018] - Launch lazy future ... [18:42:18.018] Packages needed by the future expression (n = 0): [18:42:18.019] Packages needed by future strategies (n = 0): [18:42:18.020] { [18:42:18.020] { [18:42:18.020] { [18:42:18.020] ...future.startTime <- base::Sys.time() [18:42:18.020] { [18:42:18.020] { [18:42:18.020] { [18:42:18.020] { [18:42:18.020] base::local({ [18:42:18.020] has_future <- base::requireNamespace("future", [18:42:18.020] quietly = TRUE) [18:42:18.020] if (has_future) { [18:42:18.020] ns <- base::getNamespace("future") [18:42:18.020] version <- ns[[".package"]][["version"]] [18:42:18.020] if (is.null(version)) [18:42:18.020] version <- utils::packageVersion("future") [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] version <- NULL [18:42:18.020] } [18:42:18.020] if (!has_future || version < "1.8.0") { [18:42:18.020] info <- base::c(r_version = base::gsub("R version ", [18:42:18.020] "", base::R.version$version.string), [18:42:18.020] platform = base::sprintf("%s (%s-bit)", [18:42:18.020] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:18.020] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:18.020] "release", "version")], collapse = " "), [18:42:18.020] hostname = base::Sys.info()[["nodename"]]) [18:42:18.020] info <- base::sprintf("%s: %s", base::names(info), [18:42:18.020] info) [18:42:18.020] info <- base::paste(info, collapse = "; ") [18:42:18.020] if (!has_future) { [18:42:18.020] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:18.020] info) [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:18.020] info, version) [18:42:18.020] } [18:42:18.020] base::stop(msg) [18:42:18.020] } [18:42:18.020] }) [18:42:18.020] } [18:42:18.020] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:18.020] base::options(mc.cores = 1L) [18:42:18.020] } [18:42:18.020] ...future.strategy.old <- future::plan("list") [18:42:18.020] options(future.plan = NULL) [18:42:18.020] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.020] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:18.020] } [18:42:18.020] ...future.workdir <- getwd() [18:42:18.020] } [18:42:18.020] ...future.oldOptions <- base::as.list(base::.Options) [18:42:18.020] ...future.oldEnvVars <- base::Sys.getenv() [18:42:18.020] } [18:42:18.020] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:18.020] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:18.020] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:18.020] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:18.020] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:18.020] future.stdout.windows.reencode = NULL, width = 80L) [18:42:18.020] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:18.020] base::names(...future.oldOptions)) [18:42:18.020] } [18:42:18.020] if (FALSE) { [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] if (TRUE) { [18:42:18.020] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:18.020] open = "w") [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:18.020] windows = "NUL", "/dev/null"), open = "w") [18:42:18.020] } [18:42:18.020] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:18.020] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:18.020] base::sink(type = "output", split = FALSE) [18:42:18.020] base::close(...future.stdout) [18:42:18.020] }, add = TRUE) [18:42:18.020] } [18:42:18.020] ...future.frame <- base::sys.nframe() [18:42:18.020] ...future.conditions <- base::list() [18:42:18.020] ...future.rng <- base::globalenv()$.Random.seed [18:42:18.020] if (FALSE) { [18:42:18.020] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:18.020] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:18.020] } [18:42:18.020] ...future.result <- base::tryCatch({ [18:42:18.020] base::withCallingHandlers({ [18:42:18.020] ...future.value <- base::withVisible(base::local({ [18:42:18.020] ...future.makeSendCondition <- base::local({ [18:42:18.020] sendCondition <- NULL [18:42:18.020] function(frame = 1L) { [18:42:18.020] if (is.function(sendCondition)) [18:42:18.020] return(sendCondition) [18:42:18.020] ns <- getNamespace("parallel") [18:42:18.020] if (exists("sendData", mode = "function", [18:42:18.020] envir = ns)) { [18:42:18.020] parallel_sendData <- get("sendData", mode = "function", [18:42:18.020] envir = ns) [18:42:18.020] envir <- sys.frame(frame) [18:42:18.020] master <- NULL [18:42:18.020] while (!identical(envir, .GlobalEnv) && [18:42:18.020] !identical(envir, emptyenv())) { [18:42:18.020] if (exists("master", mode = "list", envir = envir, [18:42:18.020] inherits = FALSE)) { [18:42:18.020] master <- get("master", mode = "list", [18:42:18.020] envir = envir, inherits = FALSE) [18:42:18.020] if (inherits(master, c("SOCKnode", [18:42:18.020] "SOCK0node"))) { [18:42:18.020] sendCondition <<- function(cond) { [18:42:18.020] data <- list(type = "VALUE", value = cond, [18:42:18.020] success = TRUE) [18:42:18.020] parallel_sendData(master, data) [18:42:18.020] } [18:42:18.020] return(sendCondition) [18:42:18.020] } [18:42:18.020] } [18:42:18.020] frame <- frame + 1L [18:42:18.020] envir <- sys.frame(frame) [18:42:18.020] } [18:42:18.020] } [18:42:18.020] sendCondition <<- function(cond) NULL [18:42:18.020] } [18:42:18.020] }) [18:42:18.020] withCallingHandlers({ [18:42:18.020] { [18:42:18.020] do.call(function(...) { [18:42:18.020] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.020] if (!identical(...future.globals.maxSize.org, [18:42:18.020] ...future.globals.maxSize)) { [18:42:18.020] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.020] on.exit(options(oopts), add = TRUE) [18:42:18.020] } [18:42:18.020] { [18:42:18.020] lapply(seq_along(...future.elements_ii), [18:42:18.020] FUN = function(jj) { [18:42:18.020] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.020] ...future.FUN(...future.X_jj, ...) [18:42:18.020] }) [18:42:18.020] } [18:42:18.020] }, args = future.call.arguments) [18:42:18.020] } [18:42:18.020] }, immediateCondition = function(cond) { [18:42:18.020] sendCondition <- ...future.makeSendCondition() [18:42:18.020] sendCondition(cond) [18:42:18.020] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.020] { [18:42:18.020] inherits <- base::inherits [18:42:18.020] invokeRestart <- base::invokeRestart [18:42:18.020] is.null <- base::is.null [18:42:18.020] muffled <- FALSE [18:42:18.020] if (inherits(cond, "message")) { [18:42:18.020] muffled <- grepl(pattern, "muffleMessage") [18:42:18.020] if (muffled) [18:42:18.020] invokeRestart("muffleMessage") [18:42:18.020] } [18:42:18.020] else if (inherits(cond, "warning")) { [18:42:18.020] muffled <- grepl(pattern, "muffleWarning") [18:42:18.020] if (muffled) [18:42:18.020] invokeRestart("muffleWarning") [18:42:18.020] } [18:42:18.020] else if (inherits(cond, "condition")) { [18:42:18.020] if (!is.null(pattern)) { [18:42:18.020] computeRestarts <- base::computeRestarts [18:42:18.020] grepl <- base::grepl [18:42:18.020] restarts <- computeRestarts(cond) [18:42:18.020] for (restart in restarts) { [18:42:18.020] name <- restart$name [18:42:18.020] if (is.null(name)) [18:42:18.020] next [18:42:18.020] if (!grepl(pattern, name)) [18:42:18.020] next [18:42:18.020] invokeRestart(restart) [18:42:18.020] muffled <- TRUE [18:42:18.020] break [18:42:18.020] } [18:42:18.020] } [18:42:18.020] } [18:42:18.020] invisible(muffled) [18:42:18.020] } [18:42:18.020] muffleCondition(cond) [18:42:18.020] }) [18:42:18.020] })) [18:42:18.020] future::FutureResult(value = ...future.value$value, [18:42:18.020] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.020] ...future.rng), globalenv = if (FALSE) [18:42:18.020] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:18.020] ...future.globalenv.names)) [18:42:18.020] else NULL, started = ...future.startTime, version = "1.8") [18:42:18.020] }, condition = base::local({ [18:42:18.020] c <- base::c [18:42:18.020] inherits <- base::inherits [18:42:18.020] invokeRestart <- base::invokeRestart [18:42:18.020] length <- base::length [18:42:18.020] list <- base::list [18:42:18.020] seq.int <- base::seq.int [18:42:18.020] signalCondition <- base::signalCondition [18:42:18.020] sys.calls <- base::sys.calls [18:42:18.020] `[[` <- base::`[[` [18:42:18.020] `+` <- base::`+` [18:42:18.020] `<<-` <- base::`<<-` [18:42:18.020] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:18.020] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:18.020] 3L)] [18:42:18.020] } [18:42:18.020] function(cond) { [18:42:18.020] is_error <- inherits(cond, "error") [18:42:18.020] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:18.020] NULL) [18:42:18.020] if (is_error) { [18:42:18.020] sessionInformation <- function() { [18:42:18.020] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:18.020] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:18.020] search = base::search(), system = base::Sys.info()) [18:42:18.020] } [18:42:18.020] ...future.conditions[[length(...future.conditions) + [18:42:18.020] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:18.020] cond$call), session = sessionInformation(), [18:42:18.020] timestamp = base::Sys.time(), signaled = 0L) [18:42:18.020] signalCondition(cond) [18:42:18.020] } [18:42:18.020] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:18.020] "immediateCondition"))) { [18:42:18.020] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:18.020] ...future.conditions[[length(...future.conditions) + [18:42:18.020] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:18.020] if (TRUE && !signal) { [18:42:18.020] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.020] { [18:42:18.020] inherits <- base::inherits [18:42:18.020] invokeRestart <- base::invokeRestart [18:42:18.020] is.null <- base::is.null [18:42:18.020] muffled <- FALSE [18:42:18.020] if (inherits(cond, "message")) { [18:42:18.020] muffled <- grepl(pattern, "muffleMessage") [18:42:18.020] if (muffled) [18:42:18.020] invokeRestart("muffleMessage") [18:42:18.020] } [18:42:18.020] else if (inherits(cond, "warning")) { [18:42:18.020] muffled <- grepl(pattern, "muffleWarning") [18:42:18.020] if (muffled) [18:42:18.020] invokeRestart("muffleWarning") [18:42:18.020] } [18:42:18.020] else if (inherits(cond, "condition")) { [18:42:18.020] if (!is.null(pattern)) { [18:42:18.020] computeRestarts <- base::computeRestarts [18:42:18.020] grepl <- base::grepl [18:42:18.020] restarts <- computeRestarts(cond) [18:42:18.020] for (restart in restarts) { [18:42:18.020] name <- restart$name [18:42:18.020] if (is.null(name)) [18:42:18.020] next [18:42:18.020] if (!grepl(pattern, name)) [18:42:18.020] next [18:42:18.020] invokeRestart(restart) [18:42:18.020] muffled <- TRUE [18:42:18.020] break [18:42:18.020] } [18:42:18.020] } [18:42:18.020] } [18:42:18.020] invisible(muffled) [18:42:18.020] } [18:42:18.020] muffleCondition(cond, pattern = "^muffle") [18:42:18.020] } [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] if (TRUE) { [18:42:18.020] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.020] { [18:42:18.020] inherits <- base::inherits [18:42:18.020] invokeRestart <- base::invokeRestart [18:42:18.020] is.null <- base::is.null [18:42:18.020] muffled <- FALSE [18:42:18.020] if (inherits(cond, "message")) { [18:42:18.020] muffled <- grepl(pattern, "muffleMessage") [18:42:18.020] if (muffled) [18:42:18.020] invokeRestart("muffleMessage") [18:42:18.020] } [18:42:18.020] else if (inherits(cond, "warning")) { [18:42:18.020] muffled <- grepl(pattern, "muffleWarning") [18:42:18.020] if (muffled) [18:42:18.020] invokeRestart("muffleWarning") [18:42:18.020] } [18:42:18.020] else if (inherits(cond, "condition")) { [18:42:18.020] if (!is.null(pattern)) { [18:42:18.020] computeRestarts <- base::computeRestarts [18:42:18.020] grepl <- base::grepl [18:42:18.020] restarts <- computeRestarts(cond) [18:42:18.020] for (restart in restarts) { [18:42:18.020] name <- restart$name [18:42:18.020] if (is.null(name)) [18:42:18.020] next [18:42:18.020] if (!grepl(pattern, name)) [18:42:18.020] next [18:42:18.020] invokeRestart(restart) [18:42:18.020] muffled <- TRUE [18:42:18.020] break [18:42:18.020] } [18:42:18.020] } [18:42:18.020] } [18:42:18.020] invisible(muffled) [18:42:18.020] } [18:42:18.020] muffleCondition(cond, pattern = "^muffle") [18:42:18.020] } [18:42:18.020] } [18:42:18.020] } [18:42:18.020] })) [18:42:18.020] }, error = function(ex) { [18:42:18.020] base::structure(base::list(value = NULL, visible = NULL, [18:42:18.020] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.020] ...future.rng), started = ...future.startTime, [18:42:18.020] finished = Sys.time(), session_uuid = NA_character_, [18:42:18.020] version = "1.8"), class = "FutureResult") [18:42:18.020] }, finally = { [18:42:18.020] if (!identical(...future.workdir, getwd())) [18:42:18.020] setwd(...future.workdir) [18:42:18.020] { [18:42:18.020] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:18.020] ...future.oldOptions$nwarnings <- NULL [18:42:18.020] } [18:42:18.020] base::options(...future.oldOptions) [18:42:18.020] if (.Platform$OS.type == "windows") { [18:42:18.020] old_names <- names(...future.oldEnvVars) [18:42:18.020] envs <- base::Sys.getenv() [18:42:18.020] names <- names(envs) [18:42:18.020] common <- intersect(names, old_names) [18:42:18.020] added <- setdiff(names, old_names) [18:42:18.020] removed <- setdiff(old_names, names) [18:42:18.020] changed <- common[...future.oldEnvVars[common] != [18:42:18.020] envs[common]] [18:42:18.020] NAMES <- toupper(changed) [18:42:18.020] args <- list() [18:42:18.020] for (kk in seq_along(NAMES)) { [18:42:18.020] name <- changed[[kk]] [18:42:18.020] NAME <- NAMES[[kk]] [18:42:18.020] if (name != NAME && is.element(NAME, old_names)) [18:42:18.020] next [18:42:18.020] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.020] } [18:42:18.020] NAMES <- toupper(added) [18:42:18.020] for (kk in seq_along(NAMES)) { [18:42:18.020] name <- added[[kk]] [18:42:18.020] NAME <- NAMES[[kk]] [18:42:18.020] if (name != NAME && is.element(NAME, old_names)) [18:42:18.020] next [18:42:18.020] args[[name]] <- "" [18:42:18.020] } [18:42:18.020] NAMES <- toupper(removed) [18:42:18.020] for (kk in seq_along(NAMES)) { [18:42:18.020] name <- removed[[kk]] [18:42:18.020] NAME <- NAMES[[kk]] [18:42:18.020] if (name != NAME && is.element(NAME, old_names)) [18:42:18.020] next [18:42:18.020] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.020] } [18:42:18.020] if (length(args) > 0) [18:42:18.020] base::do.call(base::Sys.setenv, args = args) [18:42:18.020] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:18.020] } [18:42:18.020] { [18:42:18.020] if (base::length(...future.futureOptionsAdded) > [18:42:18.020] 0L) { [18:42:18.020] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:18.020] base::names(opts) <- ...future.futureOptionsAdded [18:42:18.020] base::options(opts) [18:42:18.020] } [18:42:18.020] { [18:42:18.020] { [18:42:18.020] base::options(mc.cores = ...future.mc.cores.old) [18:42:18.020] NULL [18:42:18.020] } [18:42:18.020] options(future.plan = NULL) [18:42:18.020] if (is.na(NA_character_)) [18:42:18.020] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.020] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:18.020] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:18.020] .init = FALSE) [18:42:18.020] } [18:42:18.020] } [18:42:18.020] } [18:42:18.020] }) [18:42:18.020] if (TRUE) { [18:42:18.020] base::sink(type = "output", split = FALSE) [18:42:18.020] if (TRUE) { [18:42:18.020] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:18.020] } [18:42:18.020] else { [18:42:18.020] ...future.result["stdout"] <- base::list(NULL) [18:42:18.020] } [18:42:18.020] base::close(...future.stdout) [18:42:18.020] ...future.stdout <- NULL [18:42:18.020] } [18:42:18.020] ...future.result$conditions <- ...future.conditions [18:42:18.020] ...future.result$finished <- base::Sys.time() [18:42:18.020] ...future.result [18:42:18.020] } [18:42:18.029] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:42:18.029] Exporting '...future.FUN' (841 bytes) to cluster node #1 ... [18:42:18.030] Exporting '...future.FUN' (841 bytes) to cluster node #1 ... DONE [18:42:18.030] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:42:18.031] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:42:18.031] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:42:18.032] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:42:18.032] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:42:18.033] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:42:18.033] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:42:18.033] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:42:18.034] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:42:18.035] MultisessionFuture started [18:42:18.035] - Launch lazy future ... done [18:42:18.035] run() for 'MultisessionFuture' ... done [18:42:18.036] Created future: [18:42:18.036] MultisessionFuture: [18:42:18.036] Label: 'future_lapply-1' [18:42:18.036] Expression: [18:42:18.036] { [18:42:18.036] do.call(function(...) { [18:42:18.036] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.036] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.036] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.036] on.exit(options(oopts), add = TRUE) [18:42:18.036] } [18:42:18.036] { [18:42:18.036] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.036] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.036] ...future.FUN(...future.X_jj, ...) [18:42:18.036] }) [18:42:18.036] } [18:42:18.036] }, args = future.call.arguments) [18:42:18.036] } [18:42:18.036] Lazy evaluation: FALSE [18:42:18.036] Asynchronous evaluation: TRUE [18:42:18.036] Local evaluation: TRUE [18:42:18.036] Environment: R_GlobalEnv [18:42:18.036] Capture standard output: TRUE [18:42:18.036] Capture condition classes: 'condition' (excluding 'nothing') [18:42:18.036] Globals: 5 objects totaling 1.01 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:18.036] Packages: [18:42:18.036] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:18.036] Resolved: FALSE [18:42:18.036] Value: [18:42:18.036] Conditions captured: [18:42:18.036] Early signaling: FALSE [18:42:18.036] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:18.036] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.226] Chunk #1 of 2 ... DONE [18:42:18.226] Chunk #2 of 2 ... [18:42:18.227] - Finding globals in 'X' for chunk #2 ... [18:42:18.227] getGlobalsAndPackages() ... [18:42:18.227] Searching for globals... [18:42:18.228] [18:42:18.228] Searching for globals ... DONE [18:42:18.229] - globals: [0] [18:42:18.229] getGlobalsAndPackages() ... DONE [18:42:18.229] + additional globals found: [n=0] [18:42:18.229] + additional namespaces needed: [n=0] [18:42:18.230] - Finding globals in 'X' for chunk #2 ... DONE [18:42:18.230] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:18.230] - seeds: [18:42:18.230] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.231] getGlobalsAndPackages() ... [18:42:18.231] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.231] Resolving globals: FALSE [18:42:18.232] Tweak future expression to call with '...' arguments ... [18:42:18.232] { [18:42:18.232] do.call(function(...) { [18:42:18.232] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.232] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.232] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.232] on.exit(options(oopts), add = TRUE) [18:42:18.232] } [18:42:18.232] { [18:42:18.232] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.232] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.232] ...future.FUN(...future.X_jj, ...) [18:42:18.232] }) [18:42:18.232] } [18:42:18.232] }, args = future.call.arguments) [18:42:18.232] } [18:42:18.233] Tweak future expression to call with '...' arguments ... DONE [18:42:18.234] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.234] [18:42:18.234] getGlobalsAndPackages() ... DONE [18:42:18.235] run() for 'Future' ... [18:42:18.235] - state: 'created' [18:42:18.235] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:18.257] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.257] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:18.257] - Field: 'node' [18:42:18.258] - Field: 'label' [18:42:18.258] - Field: 'local' [18:42:18.258] - Field: 'owner' [18:42:18.259] - Field: 'envir' [18:42:18.259] - Field: 'workers' [18:42:18.259] - Field: 'packages' [18:42:18.259] - Field: 'gc' [18:42:18.260] - Field: 'conditions' [18:42:18.260] - Field: 'persistent' [18:42:18.260] - Field: 'expr' [18:42:18.261] - Field: 'uuid' [18:42:18.261] - Field: 'seed' [18:42:18.261] - Field: 'version' [18:42:18.261] - Field: 'result' [18:42:18.262] - Field: 'asynchronous' [18:42:18.262] - Field: 'calls' [18:42:18.262] - Field: 'globals' [18:42:18.263] - Field: 'stdout' [18:42:18.263] - Field: 'earlySignal' [18:42:18.263] - Field: 'lazy' [18:42:18.263] - Field: 'state' [18:42:18.264] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:18.264] - Launch lazy future ... [18:42:18.265] Packages needed by the future expression (n = 0): [18:42:18.265] Packages needed by future strategies (n = 0): [18:42:18.266] { [18:42:18.266] { [18:42:18.266] { [18:42:18.266] ...future.startTime <- base::Sys.time() [18:42:18.266] { [18:42:18.266] { [18:42:18.266] { [18:42:18.266] { [18:42:18.266] base::local({ [18:42:18.266] has_future <- base::requireNamespace("future", [18:42:18.266] quietly = TRUE) [18:42:18.266] if (has_future) { [18:42:18.266] ns <- base::getNamespace("future") [18:42:18.266] version <- ns[[".package"]][["version"]] [18:42:18.266] if (is.null(version)) [18:42:18.266] version <- utils::packageVersion("future") [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] version <- NULL [18:42:18.266] } [18:42:18.266] if (!has_future || version < "1.8.0") { [18:42:18.266] info <- base::c(r_version = base::gsub("R version ", [18:42:18.266] "", base::R.version$version.string), [18:42:18.266] platform = base::sprintf("%s (%s-bit)", [18:42:18.266] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:18.266] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:18.266] "release", "version")], collapse = " "), [18:42:18.266] hostname = base::Sys.info()[["nodename"]]) [18:42:18.266] info <- base::sprintf("%s: %s", base::names(info), [18:42:18.266] info) [18:42:18.266] info <- base::paste(info, collapse = "; ") [18:42:18.266] if (!has_future) { [18:42:18.266] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:18.266] info) [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:18.266] info, version) [18:42:18.266] } [18:42:18.266] base::stop(msg) [18:42:18.266] } [18:42:18.266] }) [18:42:18.266] } [18:42:18.266] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:18.266] base::options(mc.cores = 1L) [18:42:18.266] } [18:42:18.266] ...future.strategy.old <- future::plan("list") [18:42:18.266] options(future.plan = NULL) [18:42:18.266] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.266] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:18.266] } [18:42:18.266] ...future.workdir <- getwd() [18:42:18.266] } [18:42:18.266] ...future.oldOptions <- base::as.list(base::.Options) [18:42:18.266] ...future.oldEnvVars <- base::Sys.getenv() [18:42:18.266] } [18:42:18.266] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:18.266] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:18.266] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:18.266] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:18.266] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:18.266] future.stdout.windows.reencode = NULL, width = 80L) [18:42:18.266] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:18.266] base::names(...future.oldOptions)) [18:42:18.266] } [18:42:18.266] if (FALSE) { [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] if (TRUE) { [18:42:18.266] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:18.266] open = "w") [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:18.266] windows = "NUL", "/dev/null"), open = "w") [18:42:18.266] } [18:42:18.266] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:18.266] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:18.266] base::sink(type = "output", split = FALSE) [18:42:18.266] base::close(...future.stdout) [18:42:18.266] }, add = TRUE) [18:42:18.266] } [18:42:18.266] ...future.frame <- base::sys.nframe() [18:42:18.266] ...future.conditions <- base::list() [18:42:18.266] ...future.rng <- base::globalenv()$.Random.seed [18:42:18.266] if (FALSE) { [18:42:18.266] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:18.266] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:18.266] } [18:42:18.266] ...future.result <- base::tryCatch({ [18:42:18.266] base::withCallingHandlers({ [18:42:18.266] ...future.value <- base::withVisible(base::local({ [18:42:18.266] ...future.makeSendCondition <- base::local({ [18:42:18.266] sendCondition <- NULL [18:42:18.266] function(frame = 1L) { [18:42:18.266] if (is.function(sendCondition)) [18:42:18.266] return(sendCondition) [18:42:18.266] ns <- getNamespace("parallel") [18:42:18.266] if (exists("sendData", mode = "function", [18:42:18.266] envir = ns)) { [18:42:18.266] parallel_sendData <- get("sendData", mode = "function", [18:42:18.266] envir = ns) [18:42:18.266] envir <- sys.frame(frame) [18:42:18.266] master <- NULL [18:42:18.266] while (!identical(envir, .GlobalEnv) && [18:42:18.266] !identical(envir, emptyenv())) { [18:42:18.266] if (exists("master", mode = "list", envir = envir, [18:42:18.266] inherits = FALSE)) { [18:42:18.266] master <- get("master", mode = "list", [18:42:18.266] envir = envir, inherits = FALSE) [18:42:18.266] if (inherits(master, c("SOCKnode", [18:42:18.266] "SOCK0node"))) { [18:42:18.266] sendCondition <<- function(cond) { [18:42:18.266] data <- list(type = "VALUE", value = cond, [18:42:18.266] success = TRUE) [18:42:18.266] parallel_sendData(master, data) [18:42:18.266] } [18:42:18.266] return(sendCondition) [18:42:18.266] } [18:42:18.266] } [18:42:18.266] frame <- frame + 1L [18:42:18.266] envir <- sys.frame(frame) [18:42:18.266] } [18:42:18.266] } [18:42:18.266] sendCondition <<- function(cond) NULL [18:42:18.266] } [18:42:18.266] }) [18:42:18.266] withCallingHandlers({ [18:42:18.266] { [18:42:18.266] do.call(function(...) { [18:42:18.266] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.266] if (!identical(...future.globals.maxSize.org, [18:42:18.266] ...future.globals.maxSize)) { [18:42:18.266] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.266] on.exit(options(oopts), add = TRUE) [18:42:18.266] } [18:42:18.266] { [18:42:18.266] lapply(seq_along(...future.elements_ii), [18:42:18.266] FUN = function(jj) { [18:42:18.266] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.266] ...future.FUN(...future.X_jj, ...) [18:42:18.266] }) [18:42:18.266] } [18:42:18.266] }, args = future.call.arguments) [18:42:18.266] } [18:42:18.266] }, immediateCondition = function(cond) { [18:42:18.266] sendCondition <- ...future.makeSendCondition() [18:42:18.266] sendCondition(cond) [18:42:18.266] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.266] { [18:42:18.266] inherits <- base::inherits [18:42:18.266] invokeRestart <- base::invokeRestart [18:42:18.266] is.null <- base::is.null [18:42:18.266] muffled <- FALSE [18:42:18.266] if (inherits(cond, "message")) { [18:42:18.266] muffled <- grepl(pattern, "muffleMessage") [18:42:18.266] if (muffled) [18:42:18.266] invokeRestart("muffleMessage") [18:42:18.266] } [18:42:18.266] else if (inherits(cond, "warning")) { [18:42:18.266] muffled <- grepl(pattern, "muffleWarning") [18:42:18.266] if (muffled) [18:42:18.266] invokeRestart("muffleWarning") [18:42:18.266] } [18:42:18.266] else if (inherits(cond, "condition")) { [18:42:18.266] if (!is.null(pattern)) { [18:42:18.266] computeRestarts <- base::computeRestarts [18:42:18.266] grepl <- base::grepl [18:42:18.266] restarts <- computeRestarts(cond) [18:42:18.266] for (restart in restarts) { [18:42:18.266] name <- restart$name [18:42:18.266] if (is.null(name)) [18:42:18.266] next [18:42:18.266] if (!grepl(pattern, name)) [18:42:18.266] next [18:42:18.266] invokeRestart(restart) [18:42:18.266] muffled <- TRUE [18:42:18.266] break [18:42:18.266] } [18:42:18.266] } [18:42:18.266] } [18:42:18.266] invisible(muffled) [18:42:18.266] } [18:42:18.266] muffleCondition(cond) [18:42:18.266] }) [18:42:18.266] })) [18:42:18.266] future::FutureResult(value = ...future.value$value, [18:42:18.266] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.266] ...future.rng), globalenv = if (FALSE) [18:42:18.266] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:18.266] ...future.globalenv.names)) [18:42:18.266] else NULL, started = ...future.startTime, version = "1.8") [18:42:18.266] }, condition = base::local({ [18:42:18.266] c <- base::c [18:42:18.266] inherits <- base::inherits [18:42:18.266] invokeRestart <- base::invokeRestart [18:42:18.266] length <- base::length [18:42:18.266] list <- base::list [18:42:18.266] seq.int <- base::seq.int [18:42:18.266] signalCondition <- base::signalCondition [18:42:18.266] sys.calls <- base::sys.calls [18:42:18.266] `[[` <- base::`[[` [18:42:18.266] `+` <- base::`+` [18:42:18.266] `<<-` <- base::`<<-` [18:42:18.266] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:18.266] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:18.266] 3L)] [18:42:18.266] } [18:42:18.266] function(cond) { [18:42:18.266] is_error <- inherits(cond, "error") [18:42:18.266] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:18.266] NULL) [18:42:18.266] if (is_error) { [18:42:18.266] sessionInformation <- function() { [18:42:18.266] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:18.266] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:18.266] search = base::search(), system = base::Sys.info()) [18:42:18.266] } [18:42:18.266] ...future.conditions[[length(...future.conditions) + [18:42:18.266] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:18.266] cond$call), session = sessionInformation(), [18:42:18.266] timestamp = base::Sys.time(), signaled = 0L) [18:42:18.266] signalCondition(cond) [18:42:18.266] } [18:42:18.266] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:18.266] "immediateCondition"))) { [18:42:18.266] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:18.266] ...future.conditions[[length(...future.conditions) + [18:42:18.266] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:18.266] if (TRUE && !signal) { [18:42:18.266] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.266] { [18:42:18.266] inherits <- base::inherits [18:42:18.266] invokeRestart <- base::invokeRestart [18:42:18.266] is.null <- base::is.null [18:42:18.266] muffled <- FALSE [18:42:18.266] if (inherits(cond, "message")) { [18:42:18.266] muffled <- grepl(pattern, "muffleMessage") [18:42:18.266] if (muffled) [18:42:18.266] invokeRestart("muffleMessage") [18:42:18.266] } [18:42:18.266] else if (inherits(cond, "warning")) { [18:42:18.266] muffled <- grepl(pattern, "muffleWarning") [18:42:18.266] if (muffled) [18:42:18.266] invokeRestart("muffleWarning") [18:42:18.266] } [18:42:18.266] else if (inherits(cond, "condition")) { [18:42:18.266] if (!is.null(pattern)) { [18:42:18.266] computeRestarts <- base::computeRestarts [18:42:18.266] grepl <- base::grepl [18:42:18.266] restarts <- computeRestarts(cond) [18:42:18.266] for (restart in restarts) { [18:42:18.266] name <- restart$name [18:42:18.266] if (is.null(name)) [18:42:18.266] next [18:42:18.266] if (!grepl(pattern, name)) [18:42:18.266] next [18:42:18.266] invokeRestart(restart) [18:42:18.266] muffled <- TRUE [18:42:18.266] break [18:42:18.266] } [18:42:18.266] } [18:42:18.266] } [18:42:18.266] invisible(muffled) [18:42:18.266] } [18:42:18.266] muffleCondition(cond, pattern = "^muffle") [18:42:18.266] } [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] if (TRUE) { [18:42:18.266] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.266] { [18:42:18.266] inherits <- base::inherits [18:42:18.266] invokeRestart <- base::invokeRestart [18:42:18.266] is.null <- base::is.null [18:42:18.266] muffled <- FALSE [18:42:18.266] if (inherits(cond, "message")) { [18:42:18.266] muffled <- grepl(pattern, "muffleMessage") [18:42:18.266] if (muffled) [18:42:18.266] invokeRestart("muffleMessage") [18:42:18.266] } [18:42:18.266] else if (inherits(cond, "warning")) { [18:42:18.266] muffled <- grepl(pattern, "muffleWarning") [18:42:18.266] if (muffled) [18:42:18.266] invokeRestart("muffleWarning") [18:42:18.266] } [18:42:18.266] else if (inherits(cond, "condition")) { [18:42:18.266] if (!is.null(pattern)) { [18:42:18.266] computeRestarts <- base::computeRestarts [18:42:18.266] grepl <- base::grepl [18:42:18.266] restarts <- computeRestarts(cond) [18:42:18.266] for (restart in restarts) { [18:42:18.266] name <- restart$name [18:42:18.266] if (is.null(name)) [18:42:18.266] next [18:42:18.266] if (!grepl(pattern, name)) [18:42:18.266] next [18:42:18.266] invokeRestart(restart) [18:42:18.266] muffled <- TRUE [18:42:18.266] break [18:42:18.266] } [18:42:18.266] } [18:42:18.266] } [18:42:18.266] invisible(muffled) [18:42:18.266] } [18:42:18.266] muffleCondition(cond, pattern = "^muffle") [18:42:18.266] } [18:42:18.266] } [18:42:18.266] } [18:42:18.266] })) [18:42:18.266] }, error = function(ex) { [18:42:18.266] base::structure(base::list(value = NULL, visible = NULL, [18:42:18.266] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.266] ...future.rng), started = ...future.startTime, [18:42:18.266] finished = Sys.time(), session_uuid = NA_character_, [18:42:18.266] version = "1.8"), class = "FutureResult") [18:42:18.266] }, finally = { [18:42:18.266] if (!identical(...future.workdir, getwd())) [18:42:18.266] setwd(...future.workdir) [18:42:18.266] { [18:42:18.266] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:18.266] ...future.oldOptions$nwarnings <- NULL [18:42:18.266] } [18:42:18.266] base::options(...future.oldOptions) [18:42:18.266] if (.Platform$OS.type == "windows") { [18:42:18.266] old_names <- names(...future.oldEnvVars) [18:42:18.266] envs <- base::Sys.getenv() [18:42:18.266] names <- names(envs) [18:42:18.266] common <- intersect(names, old_names) [18:42:18.266] added <- setdiff(names, old_names) [18:42:18.266] removed <- setdiff(old_names, names) [18:42:18.266] changed <- common[...future.oldEnvVars[common] != [18:42:18.266] envs[common]] [18:42:18.266] NAMES <- toupper(changed) [18:42:18.266] args <- list() [18:42:18.266] for (kk in seq_along(NAMES)) { [18:42:18.266] name <- changed[[kk]] [18:42:18.266] NAME <- NAMES[[kk]] [18:42:18.266] if (name != NAME && is.element(NAME, old_names)) [18:42:18.266] next [18:42:18.266] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.266] } [18:42:18.266] NAMES <- toupper(added) [18:42:18.266] for (kk in seq_along(NAMES)) { [18:42:18.266] name <- added[[kk]] [18:42:18.266] NAME <- NAMES[[kk]] [18:42:18.266] if (name != NAME && is.element(NAME, old_names)) [18:42:18.266] next [18:42:18.266] args[[name]] <- "" [18:42:18.266] } [18:42:18.266] NAMES <- toupper(removed) [18:42:18.266] for (kk in seq_along(NAMES)) { [18:42:18.266] name <- removed[[kk]] [18:42:18.266] NAME <- NAMES[[kk]] [18:42:18.266] if (name != NAME && is.element(NAME, old_names)) [18:42:18.266] next [18:42:18.266] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.266] } [18:42:18.266] if (length(args) > 0) [18:42:18.266] base::do.call(base::Sys.setenv, args = args) [18:42:18.266] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:18.266] } [18:42:18.266] { [18:42:18.266] if (base::length(...future.futureOptionsAdded) > [18:42:18.266] 0L) { [18:42:18.266] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:18.266] base::names(opts) <- ...future.futureOptionsAdded [18:42:18.266] base::options(opts) [18:42:18.266] } [18:42:18.266] { [18:42:18.266] { [18:42:18.266] base::options(mc.cores = ...future.mc.cores.old) [18:42:18.266] NULL [18:42:18.266] } [18:42:18.266] options(future.plan = NULL) [18:42:18.266] if (is.na(NA_character_)) [18:42:18.266] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.266] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:18.266] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:18.266] .init = FALSE) [18:42:18.266] } [18:42:18.266] } [18:42:18.266] } [18:42:18.266] }) [18:42:18.266] if (TRUE) { [18:42:18.266] base::sink(type = "output", split = FALSE) [18:42:18.266] if (TRUE) { [18:42:18.266] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:18.266] } [18:42:18.266] else { [18:42:18.266] ...future.result["stdout"] <- base::list(NULL) [18:42:18.266] } [18:42:18.266] base::close(...future.stdout) [18:42:18.266] ...future.stdout <- NULL [18:42:18.266] } [18:42:18.266] ...future.result$conditions <- ...future.conditions [18:42:18.266] ...future.result$finished <- base::Sys.time() [18:42:18.266] ...future.result [18:42:18.266] } [18:42:18.275] Exporting 5 global objects (1.46 KiB) to cluster node #2 ... [18:42:18.275] Exporting '...future.FUN' (841 bytes) to cluster node #2 ... [18:42:18.276] Exporting '...future.FUN' (841 bytes) to cluster node #2 ... DONE [18:42:18.276] Exporting 'future.call.arguments' (97 bytes) to cluster node #2 ... [18:42:18.277] Exporting 'future.call.arguments' (97 bytes) to cluster node #2 ... DONE [18:42:18.277] Exporting '...future.elements_ii' (43 bytes) to cluster node #2 ... [18:42:18.278] Exporting '...future.elements_ii' (43 bytes) to cluster node #2 ... DONE [18:42:18.278] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... [18:42:18.279] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... DONE [18:42:18.279] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... [18:42:18.279] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... DONE [18:42:18.280] Exporting 5 global objects (1.46 KiB) to cluster node #2 ... DONE [18:42:18.281] MultisessionFuture started [18:42:18.281] - Launch lazy future ... done [18:42:18.281] run() for 'MultisessionFuture' ... done [18:42:18.282] Created future: [18:42:18.304] receiveMessageFromWorker() for ClusterFuture ... [18:42:18.305] - Validating connection of MultisessionFuture [18:42:18.305] - received message: FutureResult [18:42:18.306] - Received FutureResult [18:42:18.306] - Erased future from FutureRegistry [18:42:18.306] result() for ClusterFuture ... [18:42:18.306] - result already collected: FutureResult [18:42:18.307] result() for ClusterFuture ... done [18:42:18.307] receiveMessageFromWorker() for ClusterFuture ... done [18:42:18.282] MultisessionFuture: [18:42:18.282] Label: 'future_lapply-2' [18:42:18.282] Expression: [18:42:18.282] { [18:42:18.282] do.call(function(...) { [18:42:18.282] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.282] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.282] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.282] on.exit(options(oopts), add = TRUE) [18:42:18.282] } [18:42:18.282] { [18:42:18.282] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.282] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.282] ...future.FUN(...future.X_jj, ...) [18:42:18.282] }) [18:42:18.282] } [18:42:18.282] }, args = future.call.arguments) [18:42:18.282] } [18:42:18.282] Lazy evaluation: FALSE [18:42:18.282] Asynchronous evaluation: TRUE [18:42:18.282] Local evaluation: TRUE [18:42:18.282] Environment: R_GlobalEnv [18:42:18.282] Capture standard output: TRUE [18:42:18.282] Capture condition classes: 'condition' (excluding 'nothing') [18:42:18.282] Globals: 5 objects totaling 1.01 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:18.282] Packages: [18:42:18.282] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:18.282] Resolved: TRUE [18:42:18.282] Value: [18:42:18.282] Conditions captured: [18:42:18.282] Early signaling: FALSE [18:42:18.282] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:18.282] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.308] Chunk #2 of 2 ... DONE [18:42:18.308] Launching 2 futures (chunks) ... DONE [18:42:18.308] Resolving 2 futures (chunks) ... [18:42:18.308] resolve() on list ... [18:42:18.309] recursive: 0 [18:42:18.309] length: 2 [18:42:18.309] [18:42:18.507] Future #2 [18:42:18.507] result() for ClusterFuture ... [18:42:18.508] - result already collected: FutureResult [18:42:18.508] result() for ClusterFuture ... done [18:42:18.508] result() for ClusterFuture ... [18:42:18.509] - result already collected: FutureResult [18:42:18.509] result() for ClusterFuture ... done [18:42:18.509] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:42:18.509] - nx: 2 [18:42:18.510] - relay: TRUE [18:42:18.510] - stdout: TRUE [18:42:18.510] - signal: TRUE [18:42:18.510] - resignal: FALSE [18:42:18.511] - force: TRUE [18:42:18.511] - relayed: [n=2] FALSE, FALSE [18:42:18.511] - queued futures: [n=2] FALSE, FALSE [18:42:18.511] - until=1 [18:42:18.512] - relaying element #1 [18:42:18.512] - relayed: [n=2] FALSE, FALSE [18:42:18.512] - queued futures: [n=2] FALSE, TRUE [18:42:18.512] signalConditionsASAP(NULL, pos=2) ... done [18:42:18.513] length: 1 (resolved future 2) [18:42:18.563] receiveMessageFromWorker() for ClusterFuture ... [18:42:18.563] - Validating connection of MultisessionFuture [18:42:18.564] - received message: FutureResult [18:42:18.564] - Received FutureResult [18:42:18.564] - Erased future from FutureRegistry [18:42:18.564] result() for ClusterFuture ... [18:42:18.565] - result already collected: FutureResult [18:42:18.565] result() for ClusterFuture ... done [18:42:18.565] receiveMessageFromWorker() for ClusterFuture ... done [18:42:18.565] Future #1 [18:42:18.566] result() for ClusterFuture ... [18:42:18.566] - result already collected: FutureResult [18:42:18.566] result() for ClusterFuture ... done [18:42:18.567] result() for ClusterFuture ... [18:42:18.567] - result already collected: FutureResult [18:42:18.567] result() for ClusterFuture ... done [18:42:18.567] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:42:18.568] - nx: 2 [18:42:18.568] - relay: TRUE [18:42:18.568] - stdout: TRUE [18:42:18.568] - signal: TRUE [18:42:18.569] - resignal: FALSE [18:42:18.569] - force: TRUE [18:42:18.569] - relayed: [n=2] FALSE, FALSE [18:42:18.569] - queued futures: [n=2] FALSE, TRUE [18:42:18.570] - until=1 [18:42:18.570] - relaying element #1 [18:42:18.570] result() for ClusterFuture ... [18:42:18.570] - result already collected: FutureResult [18:42:18.571] result() for ClusterFuture ... done [18:42:18.571] result() for ClusterFuture ... [18:42:18.571] - result already collected: FutureResult [18:42:18.571] result() for ClusterFuture ... done [18:42:18.572] result() for ClusterFuture ... [18:42:18.572] - result already collected: FutureResult [18:42:18.572] result() for ClusterFuture ... done [18:42:18.572] result() for ClusterFuture ... [18:42:18.573] - result already collected: FutureResult [18:42:18.573] result() for ClusterFuture ... done [18:42:18.573] - relayed: [n=2] TRUE, FALSE [18:42:18.573] - queued futures: [n=2] TRUE, TRUE [18:42:18.574] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:42:18.574] length: 0 (resolved future 1) [18:42:18.574] Relaying remaining futures [18:42:18.575] signalConditionsASAP(NULL, pos=0) ... [18:42:18.575] - nx: 2 [18:42:18.575] - relay: TRUE [18:42:18.575] - stdout: TRUE [18:42:18.575] - signal: TRUE [18:42:18.576] - resignal: FALSE [18:42:18.576] - force: TRUE [18:42:18.576] - relayed: [n=2] TRUE, FALSE [18:42:18.576] - queued futures: [n=2] TRUE, TRUE - flush all [18:42:18.577] - relaying element #2 [18:42:18.577] result() for ClusterFuture ... [18:42:18.577] - result already collected: FutureResult [18:42:18.578] result() for ClusterFuture ... done [18:42:18.578] result() for ClusterFuture ... [18:42:18.578] - result already collected: FutureResult [18:42:18.578] result() for ClusterFuture ... done [18:42:18.579] result() for ClusterFuture ... [18:42:18.579] - result already collected: FutureResult [18:42:18.579] result() for ClusterFuture ... done [18:42:18.580] result() for ClusterFuture ... [18:42:18.580] - result already collected: FutureResult [18:42:18.580] result() for ClusterFuture ... done [18:42:18.580] - relayed: [n=2] TRUE, TRUE [18:42:18.580] - queued futures: [n=2] TRUE, TRUE [18:42:18.581] signalConditionsASAP(MultisessionFuture, pos=0) ... done [18:42:18.581] resolve() on list ... DONE [18:42:18.581] result() for ClusterFuture ... [18:42:18.581] - result already collected: FutureResult [18:42:18.582] result() for ClusterFuture ... done [18:42:18.582] result() for ClusterFuture ... [18:42:18.582] - result already collected: FutureResult [18:42:18.582] result() for ClusterFuture ... done [18:42:18.583] result() for ClusterFuture ... [18:42:18.583] - result already collected: FutureResult [18:42:18.583] result() for ClusterFuture ... done [18:42:18.583] result() for ClusterFuture ... [18:42:18.584] - result already collected: FutureResult [18:42:18.584] result() for ClusterFuture ... done [18:42:18.584] - Number of value chunks collected: 2 [18:42:18.585] Resolving 2 futures (chunks) ... DONE [18:42:18.585] Reducing values from 2 chunks ... [18:42:18.585] - Number of values collected after concatenation: 2 [18:42:18.585] - Number of values expected: 2 [18:42:18.586] Reducing values from 2 chunks ... DONE [18:42:18.586] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = TRUE) ... DONE * future_lapply(x, ..., future.stdout = NA) ... [18:42:18.587] future_lapply() ... [18:42:18.592] Number of chunks: 2 [18:42:18.592] getGlobalsAndPackagesXApply() ... [18:42:18.593] - future.globals: TRUE [18:42:18.593] getGlobalsAndPackages() ... [18:42:18.593] Searching for globals... [18:42:18.596] - globals found: [5] 'FUN', '{', 'Sys.sleep', '/', 'print' [18:42:18.596] Searching for globals ... DONE [18:42:18.597] Resolving globals: FALSE [18:42:18.597] The total size of the 1 globals is 841 bytes (841 bytes) [18:42:18.598] The total size of the 1 globals exported for future expression ('FUN()') is 841 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (841 bytes of class 'function') [18:42:18.598] - globals: [1] 'FUN' [18:42:18.599] [18:42:18.599] getGlobalsAndPackages() ... DONE [18:42:18.599] - globals found/used: [n=1] 'FUN' [18:42:18.600] - needed namespaces: [n=0] [18:42:18.600] Finding globals ... DONE [18:42:18.600] - use_args: TRUE [18:42:18.600] - Getting '...' globals ... [18:42:18.601] resolve() on list ... [18:42:18.601] recursive: 0 [18:42:18.602] length: 1 [18:42:18.602] elements: '...' [18:42:18.602] length: 0 (resolved future 1) [18:42:18.602] resolve() on list ... DONE [18:42:18.603] - '...' content: [n=0] [18:42:18.603] List of 1 [18:42:18.603] $ ...: list() [18:42:18.603] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:18.603] - attr(*, "where")=List of 1 [18:42:18.603] ..$ ...: [18:42:18.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:18.603] - attr(*, "resolved")= logi TRUE [18:42:18.603] - attr(*, "total_size")= num NA [18:42:18.611] - Getting '...' globals ... DONE [18:42:18.611] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:42:18.611] List of 2 [18:42:18.611] $ ...future.FUN:function (x) [18:42:18.611] $ ... : list() [18:42:18.611] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:42:18.611] - attr(*, "where")=List of 2 [18:42:18.611] ..$ ...future.FUN: [18:42:18.611] ..$ ... : [18:42:18.611] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:18.611] - attr(*, "resolved")= logi FALSE [18:42:18.611] - attr(*, "total_size")= int 5632 [18:42:18.617] Packages to be attached in all futures: [n=0] [18:42:18.617] getGlobalsAndPackagesXApply() ... DONE [18:42:18.617] Number of futures (= number of chunks): 2 [18:42:18.618] Launching 2 futures (chunks) ... [18:42:18.618] Chunk #1 of 2 ... [18:42:18.618] - Finding globals in 'X' for chunk #1 ... [18:42:18.618] getGlobalsAndPackages() ... [18:42:18.619] Searching for globals... [18:42:18.619] [18:42:18.619] Searching for globals ... DONE [18:42:18.620] - globals: [0] [18:42:18.620] getGlobalsAndPackages() ... DONE [18:42:18.620] + additional globals found: [n=0] [18:42:18.620] + additional namespaces needed: [n=0] [18:42:18.621] - Finding globals in 'X' for chunk #1 ... DONE [18:42:18.621] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:18.621] - seeds: [18:42:18.621] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.622] getGlobalsAndPackages() ... [18:42:18.622] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.622] Resolving globals: FALSE [18:42:18.623] Tweak future expression to call with '...' arguments ... [18:42:18.623] { [18:42:18.623] do.call(function(...) { [18:42:18.623] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.623] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.623] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.623] on.exit(options(oopts), add = TRUE) [18:42:18.623] } [18:42:18.623] { [18:42:18.623] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.623] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.623] ...future.FUN(...future.X_jj, ...) [18:42:18.623] }) [18:42:18.623] } [18:42:18.623] }, args = future.call.arguments) [18:42:18.623] } [18:42:18.624] Tweak future expression to call with '...' arguments ... DONE [18:42:18.624] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.625] [18:42:18.625] getGlobalsAndPackages() ... DONE [18:42:18.625] run() for 'Future' ... [18:42:18.626] - state: 'created' [18:42:18.626] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:18.647] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.647] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:18.647] - Field: 'node' [18:42:18.648] - Field: 'label' [18:42:18.648] - Field: 'local' [18:42:18.648] - Field: 'owner' [18:42:18.648] - Field: 'envir' [18:42:18.649] - Field: 'workers' [18:42:18.649] - Field: 'packages' [18:42:18.649] - Field: 'gc' [18:42:18.650] - Field: 'conditions' [18:42:18.650] - Field: 'persistent' [18:42:18.650] - Field: 'expr' [18:42:18.650] - Field: 'uuid' [18:42:18.651] - Field: 'seed' [18:42:18.651] - Field: 'version' [18:42:18.651] - Field: 'result' [18:42:18.652] - Field: 'asynchronous' [18:42:18.652] - Field: 'calls' [18:42:18.652] - Field: 'globals' [18:42:18.652] - Field: 'stdout' [18:42:18.653] - Field: 'earlySignal' [18:42:18.653] - Field: 'lazy' [18:42:18.653] - Field: 'state' [18:42:18.653] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:18.654] - Launch lazy future ... [18:42:18.654] Packages needed by the future expression (n = 0): [18:42:18.655] Packages needed by future strategies (n = 0): [18:42:18.655] { [18:42:18.655] { [18:42:18.655] { [18:42:18.655] ...future.startTime <- base::Sys.time() [18:42:18.655] { [18:42:18.655] { [18:42:18.655] { [18:42:18.655] { [18:42:18.655] base::local({ [18:42:18.655] has_future <- base::requireNamespace("future", [18:42:18.655] quietly = TRUE) [18:42:18.655] if (has_future) { [18:42:18.655] ns <- base::getNamespace("future") [18:42:18.655] version <- ns[[".package"]][["version"]] [18:42:18.655] if (is.null(version)) [18:42:18.655] version <- utils::packageVersion("future") [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] version <- NULL [18:42:18.655] } [18:42:18.655] if (!has_future || version < "1.8.0") { [18:42:18.655] info <- base::c(r_version = base::gsub("R version ", [18:42:18.655] "", base::R.version$version.string), [18:42:18.655] platform = base::sprintf("%s (%s-bit)", [18:42:18.655] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:18.655] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:18.655] "release", "version")], collapse = " "), [18:42:18.655] hostname = base::Sys.info()[["nodename"]]) [18:42:18.655] info <- base::sprintf("%s: %s", base::names(info), [18:42:18.655] info) [18:42:18.655] info <- base::paste(info, collapse = "; ") [18:42:18.655] if (!has_future) { [18:42:18.655] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:18.655] info) [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:18.655] info, version) [18:42:18.655] } [18:42:18.655] base::stop(msg) [18:42:18.655] } [18:42:18.655] }) [18:42:18.655] } [18:42:18.655] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:18.655] base::options(mc.cores = 1L) [18:42:18.655] } [18:42:18.655] ...future.strategy.old <- future::plan("list") [18:42:18.655] options(future.plan = NULL) [18:42:18.655] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.655] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:18.655] } [18:42:18.655] ...future.workdir <- getwd() [18:42:18.655] } [18:42:18.655] ...future.oldOptions <- base::as.list(base::.Options) [18:42:18.655] ...future.oldEnvVars <- base::Sys.getenv() [18:42:18.655] } [18:42:18.655] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:18.655] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:18.655] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:18.655] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:18.655] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:18.655] future.stdout.windows.reencode = NULL, width = 80L) [18:42:18.655] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:18.655] base::names(...future.oldOptions)) [18:42:18.655] } [18:42:18.655] if (TRUE) { [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] if (NA) { [18:42:18.655] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:18.655] open = "w") [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:18.655] windows = "NUL", "/dev/null"), open = "w") [18:42:18.655] } [18:42:18.655] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:18.655] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:18.655] base::sink(type = "output", split = FALSE) [18:42:18.655] base::close(...future.stdout) [18:42:18.655] }, add = TRUE) [18:42:18.655] } [18:42:18.655] ...future.frame <- base::sys.nframe() [18:42:18.655] ...future.conditions <- base::list() [18:42:18.655] ...future.rng <- base::globalenv()$.Random.seed [18:42:18.655] if (FALSE) { [18:42:18.655] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:18.655] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:18.655] } [18:42:18.655] ...future.result <- base::tryCatch({ [18:42:18.655] base::withCallingHandlers({ [18:42:18.655] ...future.value <- base::withVisible(base::local({ [18:42:18.655] ...future.makeSendCondition <- base::local({ [18:42:18.655] sendCondition <- NULL [18:42:18.655] function(frame = 1L) { [18:42:18.655] if (is.function(sendCondition)) [18:42:18.655] return(sendCondition) [18:42:18.655] ns <- getNamespace("parallel") [18:42:18.655] if (exists("sendData", mode = "function", [18:42:18.655] envir = ns)) { [18:42:18.655] parallel_sendData <- get("sendData", mode = "function", [18:42:18.655] envir = ns) [18:42:18.655] envir <- sys.frame(frame) [18:42:18.655] master <- NULL [18:42:18.655] while (!identical(envir, .GlobalEnv) && [18:42:18.655] !identical(envir, emptyenv())) { [18:42:18.655] if (exists("master", mode = "list", envir = envir, [18:42:18.655] inherits = FALSE)) { [18:42:18.655] master <- get("master", mode = "list", [18:42:18.655] envir = envir, inherits = FALSE) [18:42:18.655] if (inherits(master, c("SOCKnode", [18:42:18.655] "SOCK0node"))) { [18:42:18.655] sendCondition <<- function(cond) { [18:42:18.655] data <- list(type = "VALUE", value = cond, [18:42:18.655] success = TRUE) [18:42:18.655] parallel_sendData(master, data) [18:42:18.655] } [18:42:18.655] return(sendCondition) [18:42:18.655] } [18:42:18.655] } [18:42:18.655] frame <- frame + 1L [18:42:18.655] envir <- sys.frame(frame) [18:42:18.655] } [18:42:18.655] } [18:42:18.655] sendCondition <<- function(cond) NULL [18:42:18.655] } [18:42:18.655] }) [18:42:18.655] withCallingHandlers({ [18:42:18.655] { [18:42:18.655] do.call(function(...) { [18:42:18.655] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.655] if (!identical(...future.globals.maxSize.org, [18:42:18.655] ...future.globals.maxSize)) { [18:42:18.655] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.655] on.exit(options(oopts), add = TRUE) [18:42:18.655] } [18:42:18.655] { [18:42:18.655] lapply(seq_along(...future.elements_ii), [18:42:18.655] FUN = function(jj) { [18:42:18.655] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.655] ...future.FUN(...future.X_jj, ...) [18:42:18.655] }) [18:42:18.655] } [18:42:18.655] }, args = future.call.arguments) [18:42:18.655] } [18:42:18.655] }, immediateCondition = function(cond) { [18:42:18.655] sendCondition <- ...future.makeSendCondition() [18:42:18.655] sendCondition(cond) [18:42:18.655] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.655] { [18:42:18.655] inherits <- base::inherits [18:42:18.655] invokeRestart <- base::invokeRestart [18:42:18.655] is.null <- base::is.null [18:42:18.655] muffled <- FALSE [18:42:18.655] if (inherits(cond, "message")) { [18:42:18.655] muffled <- grepl(pattern, "muffleMessage") [18:42:18.655] if (muffled) [18:42:18.655] invokeRestart("muffleMessage") [18:42:18.655] } [18:42:18.655] else if (inherits(cond, "warning")) { [18:42:18.655] muffled <- grepl(pattern, "muffleWarning") [18:42:18.655] if (muffled) [18:42:18.655] invokeRestart("muffleWarning") [18:42:18.655] } [18:42:18.655] else if (inherits(cond, "condition")) { [18:42:18.655] if (!is.null(pattern)) { [18:42:18.655] computeRestarts <- base::computeRestarts [18:42:18.655] grepl <- base::grepl [18:42:18.655] restarts <- computeRestarts(cond) [18:42:18.655] for (restart in restarts) { [18:42:18.655] name <- restart$name [18:42:18.655] if (is.null(name)) [18:42:18.655] next [18:42:18.655] if (!grepl(pattern, name)) [18:42:18.655] next [18:42:18.655] invokeRestart(restart) [18:42:18.655] muffled <- TRUE [18:42:18.655] break [18:42:18.655] } [18:42:18.655] } [18:42:18.655] } [18:42:18.655] invisible(muffled) [18:42:18.655] } [18:42:18.655] muffleCondition(cond) [18:42:18.655] }) [18:42:18.655] })) [18:42:18.655] future::FutureResult(value = ...future.value$value, [18:42:18.655] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.655] ...future.rng), globalenv = if (FALSE) [18:42:18.655] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:18.655] ...future.globalenv.names)) [18:42:18.655] else NULL, started = ...future.startTime, version = "1.8") [18:42:18.655] }, condition = base::local({ [18:42:18.655] c <- base::c [18:42:18.655] inherits <- base::inherits [18:42:18.655] invokeRestart <- base::invokeRestart [18:42:18.655] length <- base::length [18:42:18.655] list <- base::list [18:42:18.655] seq.int <- base::seq.int [18:42:18.655] signalCondition <- base::signalCondition [18:42:18.655] sys.calls <- base::sys.calls [18:42:18.655] `[[` <- base::`[[` [18:42:18.655] `+` <- base::`+` [18:42:18.655] `<<-` <- base::`<<-` [18:42:18.655] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:18.655] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:18.655] 3L)] [18:42:18.655] } [18:42:18.655] function(cond) { [18:42:18.655] is_error <- inherits(cond, "error") [18:42:18.655] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:18.655] NULL) [18:42:18.655] if (is_error) { [18:42:18.655] sessionInformation <- function() { [18:42:18.655] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:18.655] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:18.655] search = base::search(), system = base::Sys.info()) [18:42:18.655] } [18:42:18.655] ...future.conditions[[length(...future.conditions) + [18:42:18.655] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:18.655] cond$call), session = sessionInformation(), [18:42:18.655] timestamp = base::Sys.time(), signaled = 0L) [18:42:18.655] signalCondition(cond) [18:42:18.655] } [18:42:18.655] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:18.655] "immediateCondition"))) { [18:42:18.655] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:18.655] ...future.conditions[[length(...future.conditions) + [18:42:18.655] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:18.655] if (TRUE && !signal) { [18:42:18.655] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.655] { [18:42:18.655] inherits <- base::inherits [18:42:18.655] invokeRestart <- base::invokeRestart [18:42:18.655] is.null <- base::is.null [18:42:18.655] muffled <- FALSE [18:42:18.655] if (inherits(cond, "message")) { [18:42:18.655] muffled <- grepl(pattern, "muffleMessage") [18:42:18.655] if (muffled) [18:42:18.655] invokeRestart("muffleMessage") [18:42:18.655] } [18:42:18.655] else if (inherits(cond, "warning")) { [18:42:18.655] muffled <- grepl(pattern, "muffleWarning") [18:42:18.655] if (muffled) [18:42:18.655] invokeRestart("muffleWarning") [18:42:18.655] } [18:42:18.655] else if (inherits(cond, "condition")) { [18:42:18.655] if (!is.null(pattern)) { [18:42:18.655] computeRestarts <- base::computeRestarts [18:42:18.655] grepl <- base::grepl [18:42:18.655] restarts <- computeRestarts(cond) [18:42:18.655] for (restart in restarts) { [18:42:18.655] name <- restart$name [18:42:18.655] if (is.null(name)) [18:42:18.655] next [18:42:18.655] if (!grepl(pattern, name)) [18:42:18.655] next [18:42:18.655] invokeRestart(restart) [18:42:18.655] muffled <- TRUE [18:42:18.655] break [18:42:18.655] } [18:42:18.655] } [18:42:18.655] } [18:42:18.655] invisible(muffled) [18:42:18.655] } [18:42:18.655] muffleCondition(cond, pattern = "^muffle") [18:42:18.655] } [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] if (TRUE) { [18:42:18.655] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.655] { [18:42:18.655] inherits <- base::inherits [18:42:18.655] invokeRestart <- base::invokeRestart [18:42:18.655] is.null <- base::is.null [18:42:18.655] muffled <- FALSE [18:42:18.655] if (inherits(cond, "message")) { [18:42:18.655] muffled <- grepl(pattern, "muffleMessage") [18:42:18.655] if (muffled) [18:42:18.655] invokeRestart("muffleMessage") [18:42:18.655] } [18:42:18.655] else if (inherits(cond, "warning")) { [18:42:18.655] muffled <- grepl(pattern, "muffleWarning") [18:42:18.655] if (muffled) [18:42:18.655] invokeRestart("muffleWarning") [18:42:18.655] } [18:42:18.655] else if (inherits(cond, "condition")) { [18:42:18.655] if (!is.null(pattern)) { [18:42:18.655] computeRestarts <- base::computeRestarts [18:42:18.655] grepl <- base::grepl [18:42:18.655] restarts <- computeRestarts(cond) [18:42:18.655] for (restart in restarts) { [18:42:18.655] name <- restart$name [18:42:18.655] if (is.null(name)) [18:42:18.655] next [18:42:18.655] if (!grepl(pattern, name)) [18:42:18.655] next [18:42:18.655] invokeRestart(restart) [18:42:18.655] muffled <- TRUE [18:42:18.655] break [18:42:18.655] } [18:42:18.655] } [18:42:18.655] } [18:42:18.655] invisible(muffled) [18:42:18.655] } [18:42:18.655] muffleCondition(cond, pattern = "^muffle") [18:42:18.655] } [18:42:18.655] } [18:42:18.655] } [18:42:18.655] })) [18:42:18.655] }, error = function(ex) { [18:42:18.655] base::structure(base::list(value = NULL, visible = NULL, [18:42:18.655] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.655] ...future.rng), started = ...future.startTime, [18:42:18.655] finished = Sys.time(), session_uuid = NA_character_, [18:42:18.655] version = "1.8"), class = "FutureResult") [18:42:18.655] }, finally = { [18:42:18.655] if (!identical(...future.workdir, getwd())) [18:42:18.655] setwd(...future.workdir) [18:42:18.655] { [18:42:18.655] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:18.655] ...future.oldOptions$nwarnings <- NULL [18:42:18.655] } [18:42:18.655] base::options(...future.oldOptions) [18:42:18.655] if (.Platform$OS.type == "windows") { [18:42:18.655] old_names <- names(...future.oldEnvVars) [18:42:18.655] envs <- base::Sys.getenv() [18:42:18.655] names <- names(envs) [18:42:18.655] common <- intersect(names, old_names) [18:42:18.655] added <- setdiff(names, old_names) [18:42:18.655] removed <- setdiff(old_names, names) [18:42:18.655] changed <- common[...future.oldEnvVars[common] != [18:42:18.655] envs[common]] [18:42:18.655] NAMES <- toupper(changed) [18:42:18.655] args <- list() [18:42:18.655] for (kk in seq_along(NAMES)) { [18:42:18.655] name <- changed[[kk]] [18:42:18.655] NAME <- NAMES[[kk]] [18:42:18.655] if (name != NAME && is.element(NAME, old_names)) [18:42:18.655] next [18:42:18.655] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.655] } [18:42:18.655] NAMES <- toupper(added) [18:42:18.655] for (kk in seq_along(NAMES)) { [18:42:18.655] name <- added[[kk]] [18:42:18.655] NAME <- NAMES[[kk]] [18:42:18.655] if (name != NAME && is.element(NAME, old_names)) [18:42:18.655] next [18:42:18.655] args[[name]] <- "" [18:42:18.655] } [18:42:18.655] NAMES <- toupper(removed) [18:42:18.655] for (kk in seq_along(NAMES)) { [18:42:18.655] name <- removed[[kk]] [18:42:18.655] NAME <- NAMES[[kk]] [18:42:18.655] if (name != NAME && is.element(NAME, old_names)) [18:42:18.655] next [18:42:18.655] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.655] } [18:42:18.655] if (length(args) > 0) [18:42:18.655] base::do.call(base::Sys.setenv, args = args) [18:42:18.655] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:18.655] } [18:42:18.655] { [18:42:18.655] if (base::length(...future.futureOptionsAdded) > [18:42:18.655] 0L) { [18:42:18.655] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:18.655] base::names(opts) <- ...future.futureOptionsAdded [18:42:18.655] base::options(opts) [18:42:18.655] } [18:42:18.655] { [18:42:18.655] { [18:42:18.655] base::options(mc.cores = ...future.mc.cores.old) [18:42:18.655] NULL [18:42:18.655] } [18:42:18.655] options(future.plan = NULL) [18:42:18.655] if (is.na(NA_character_)) [18:42:18.655] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.655] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:18.655] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:18.655] .init = FALSE) [18:42:18.655] } [18:42:18.655] } [18:42:18.655] } [18:42:18.655] }) [18:42:18.655] if (FALSE) { [18:42:18.655] base::sink(type = "output", split = FALSE) [18:42:18.655] if (NA) { [18:42:18.655] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:18.655] } [18:42:18.655] else { [18:42:18.655] ...future.result["stdout"] <- base::list(NULL) [18:42:18.655] } [18:42:18.655] base::close(...future.stdout) [18:42:18.655] ...future.stdout <- NULL [18:42:18.655] } [18:42:18.655] ...future.result$conditions <- ...future.conditions [18:42:18.655] ...future.result$finished <- base::Sys.time() [18:42:18.655] ...future.result [18:42:18.655] } [18:42:18.665] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:42:18.665] Exporting '...future.FUN' (841 bytes) to cluster node #1 ... [18:42:18.666] Exporting '...future.FUN' (841 bytes) to cluster node #1 ... DONE [18:42:18.666] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:42:18.667] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:42:18.667] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:42:18.668] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:42:18.668] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:42:18.669] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:42:18.669] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:42:18.670] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:42:18.670] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:42:18.671] MultisessionFuture started [18:42:18.671] - Launch lazy future ... done [18:42:18.671] run() for 'MultisessionFuture' ... done [18:42:18.672] Created future: [18:42:18.672] MultisessionFuture: [18:42:18.672] Label: 'future_lapply-1' [18:42:18.672] Expression: [18:42:18.672] { [18:42:18.672] do.call(function(...) { [18:42:18.672] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.672] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.672] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.672] on.exit(options(oopts), add = TRUE) [18:42:18.672] } [18:42:18.672] { [18:42:18.672] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.672] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.672] ...future.FUN(...future.X_jj, ...) [18:42:18.672] }) [18:42:18.672] } [18:42:18.672] }, args = future.call.arguments) [18:42:18.672] } [18:42:18.672] Lazy evaluation: FALSE [18:42:18.672] Asynchronous evaluation: TRUE [18:42:18.672] Local evaluation: TRUE [18:42:18.672] Environment: R_GlobalEnv [18:42:18.672] Capture standard output: NA [18:42:18.672] Capture condition classes: 'condition' (excluding 'nothing') [18:42:18.672] Globals: 5 objects totaling 1.01 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:18.672] Packages: [18:42:18.672] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:18.672] Resolved: FALSE [18:42:18.672] Value: [18:42:18.672] Conditions captured: [18:42:18.672] Early signaling: FALSE [18:42:18.672] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:18.672] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.867] Chunk #1 of 2 ... DONE [18:42:18.867] Chunk #2 of 2 ... [18:42:18.867] - Finding globals in 'X' for chunk #2 ... [18:42:18.868] getGlobalsAndPackages() ... [18:42:18.868] Searching for globals... [18:42:18.869] [18:42:18.869] Searching for globals ... DONE [18:42:18.869] - globals: [0] [18:42:18.869] getGlobalsAndPackages() ... DONE [18:42:18.870] + additional globals found: [n=0] [18:42:18.870] + additional namespaces needed: [n=0] [18:42:18.870] - Finding globals in 'X' for chunk #2 ... DONE [18:42:18.871] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:18.871] - seeds: [18:42:18.871] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.871] getGlobalsAndPackages() ... [18:42:18.872] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.872] Resolving globals: FALSE [18:42:18.872] Tweak future expression to call with '...' arguments ... [18:42:18.873] { [18:42:18.873] do.call(function(...) { [18:42:18.873] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.873] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.873] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.873] on.exit(options(oopts), add = TRUE) [18:42:18.873] } [18:42:18.873] { [18:42:18.873] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.873] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.873] ...future.FUN(...future.X_jj, ...) [18:42:18.873] }) [18:42:18.873] } [18:42:18.873] }, args = future.call.arguments) [18:42:18.873] } [18:42:18.873] Tweak future expression to call with '...' arguments ... DONE [18:42:18.874] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:18.874] [18:42:18.875] getGlobalsAndPackages() ... DONE [18:42:18.875] run() for 'Future' ... [18:42:18.876] - state: 'created' [18:42:18.876] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:18.896] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.897] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:18.897] - Field: 'node' [18:42:18.897] - Field: 'label' [18:42:18.898] - Field: 'local' [18:42:18.898] - Field: 'owner' [18:42:18.898] - Field: 'envir' [18:42:18.898] - Field: 'workers' [18:42:18.899] - Field: 'packages' [18:42:18.899] - Field: 'gc' [18:42:18.899] - Field: 'conditions' [18:42:18.900] - Field: 'persistent' [18:42:18.900] - Field: 'expr' [18:42:18.900] - Field: 'uuid' [18:42:18.901] - Field: 'seed' [18:42:18.901] - Field: 'version' [18:42:18.901] - Field: 'result' [18:42:18.902] - Field: 'asynchronous' [18:42:18.902] - Field: 'calls' [18:42:18.902] - Field: 'globals' [18:42:18.902] - Field: 'stdout' [18:42:18.903] - Field: 'earlySignal' [18:42:18.903] - Field: 'lazy' [18:42:18.903] - Field: 'state' [18:42:18.904] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:18.904] - Launch lazy future ... [18:42:18.904] Packages needed by the future expression (n = 0): [18:42:18.905] Packages needed by future strategies (n = 0): [18:42:18.906] { [18:42:18.906] { [18:42:18.906] { [18:42:18.906] ...future.startTime <- base::Sys.time() [18:42:18.906] { [18:42:18.906] { [18:42:18.906] { [18:42:18.906] { [18:42:18.906] base::local({ [18:42:18.906] has_future <- base::requireNamespace("future", [18:42:18.906] quietly = TRUE) [18:42:18.906] if (has_future) { [18:42:18.906] ns <- base::getNamespace("future") [18:42:18.906] version <- ns[[".package"]][["version"]] [18:42:18.906] if (is.null(version)) [18:42:18.906] version <- utils::packageVersion("future") [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] version <- NULL [18:42:18.906] } [18:42:18.906] if (!has_future || version < "1.8.0") { [18:42:18.906] info <- base::c(r_version = base::gsub("R version ", [18:42:18.906] "", base::R.version$version.string), [18:42:18.906] platform = base::sprintf("%s (%s-bit)", [18:42:18.906] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:18.906] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:18.906] "release", "version")], collapse = " "), [18:42:18.906] hostname = base::Sys.info()[["nodename"]]) [18:42:18.906] info <- base::sprintf("%s: %s", base::names(info), [18:42:18.906] info) [18:42:18.906] info <- base::paste(info, collapse = "; ") [18:42:18.906] if (!has_future) { [18:42:18.906] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:18.906] info) [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:18.906] info, version) [18:42:18.906] } [18:42:18.906] base::stop(msg) [18:42:18.906] } [18:42:18.906] }) [18:42:18.906] } [18:42:18.906] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:18.906] base::options(mc.cores = 1L) [18:42:18.906] } [18:42:18.906] ...future.strategy.old <- future::plan("list") [18:42:18.906] options(future.plan = NULL) [18:42:18.906] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.906] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:18.906] } [18:42:18.906] ...future.workdir <- getwd() [18:42:18.906] } [18:42:18.906] ...future.oldOptions <- base::as.list(base::.Options) [18:42:18.906] ...future.oldEnvVars <- base::Sys.getenv() [18:42:18.906] } [18:42:18.906] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:18.906] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:18.906] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:18.906] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:18.906] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:18.906] future.stdout.windows.reencode = NULL, width = 80L) [18:42:18.906] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:18.906] base::names(...future.oldOptions)) [18:42:18.906] } [18:42:18.906] if (TRUE) { [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] if (NA) { [18:42:18.906] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:18.906] open = "w") [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:18.906] windows = "NUL", "/dev/null"), open = "w") [18:42:18.906] } [18:42:18.906] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:18.906] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:18.906] base::sink(type = "output", split = FALSE) [18:42:18.906] base::close(...future.stdout) [18:42:18.906] }, add = TRUE) [18:42:18.906] } [18:42:18.906] ...future.frame <- base::sys.nframe() [18:42:18.906] ...future.conditions <- base::list() [18:42:18.906] ...future.rng <- base::globalenv()$.Random.seed [18:42:18.906] if (FALSE) { [18:42:18.906] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:18.906] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:18.906] } [18:42:18.906] ...future.result <- base::tryCatch({ [18:42:18.906] base::withCallingHandlers({ [18:42:18.906] ...future.value <- base::withVisible(base::local({ [18:42:18.906] ...future.makeSendCondition <- base::local({ [18:42:18.906] sendCondition <- NULL [18:42:18.906] function(frame = 1L) { [18:42:18.906] if (is.function(sendCondition)) [18:42:18.906] return(sendCondition) [18:42:18.906] ns <- getNamespace("parallel") [18:42:18.906] if (exists("sendData", mode = "function", [18:42:18.906] envir = ns)) { [18:42:18.906] parallel_sendData <- get("sendData", mode = "function", [18:42:18.906] envir = ns) [18:42:18.906] envir <- sys.frame(frame) [18:42:18.906] master <- NULL [18:42:18.906] while (!identical(envir, .GlobalEnv) && [18:42:18.906] !identical(envir, emptyenv())) { [18:42:18.906] if (exists("master", mode = "list", envir = envir, [18:42:18.906] inherits = FALSE)) { [18:42:18.906] master <- get("master", mode = "list", [18:42:18.906] envir = envir, inherits = FALSE) [18:42:18.906] if (inherits(master, c("SOCKnode", [18:42:18.906] "SOCK0node"))) { [18:42:18.906] sendCondition <<- function(cond) { [18:42:18.906] data <- list(type = "VALUE", value = cond, [18:42:18.906] success = TRUE) [18:42:18.906] parallel_sendData(master, data) [18:42:18.906] } [18:42:18.906] return(sendCondition) [18:42:18.906] } [18:42:18.906] } [18:42:18.906] frame <- frame + 1L [18:42:18.906] envir <- sys.frame(frame) [18:42:18.906] } [18:42:18.906] } [18:42:18.906] sendCondition <<- function(cond) NULL [18:42:18.906] } [18:42:18.906] }) [18:42:18.906] withCallingHandlers({ [18:42:18.906] { [18:42:18.906] do.call(function(...) { [18:42:18.906] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.906] if (!identical(...future.globals.maxSize.org, [18:42:18.906] ...future.globals.maxSize)) { [18:42:18.906] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.906] on.exit(options(oopts), add = TRUE) [18:42:18.906] } [18:42:18.906] { [18:42:18.906] lapply(seq_along(...future.elements_ii), [18:42:18.906] FUN = function(jj) { [18:42:18.906] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.906] ...future.FUN(...future.X_jj, ...) [18:42:18.906] }) [18:42:18.906] } [18:42:18.906] }, args = future.call.arguments) [18:42:18.906] } [18:42:18.906] }, immediateCondition = function(cond) { [18:42:18.906] sendCondition <- ...future.makeSendCondition() [18:42:18.906] sendCondition(cond) [18:42:18.906] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.906] { [18:42:18.906] inherits <- base::inherits [18:42:18.906] invokeRestart <- base::invokeRestart [18:42:18.906] is.null <- base::is.null [18:42:18.906] muffled <- FALSE [18:42:18.906] if (inherits(cond, "message")) { [18:42:18.906] muffled <- grepl(pattern, "muffleMessage") [18:42:18.906] if (muffled) [18:42:18.906] invokeRestart("muffleMessage") [18:42:18.906] } [18:42:18.906] else if (inherits(cond, "warning")) { [18:42:18.906] muffled <- grepl(pattern, "muffleWarning") [18:42:18.906] if (muffled) [18:42:18.906] invokeRestart("muffleWarning") [18:42:18.906] } [18:42:18.906] else if (inherits(cond, "condition")) { [18:42:18.906] if (!is.null(pattern)) { [18:42:18.906] computeRestarts <- base::computeRestarts [18:42:18.906] grepl <- base::grepl [18:42:18.906] restarts <- computeRestarts(cond) [18:42:18.906] for (restart in restarts) { [18:42:18.906] name <- restart$name [18:42:18.906] if (is.null(name)) [18:42:18.906] next [18:42:18.906] if (!grepl(pattern, name)) [18:42:18.906] next [18:42:18.906] invokeRestart(restart) [18:42:18.906] muffled <- TRUE [18:42:18.906] break [18:42:18.906] } [18:42:18.906] } [18:42:18.906] } [18:42:18.906] invisible(muffled) [18:42:18.906] } [18:42:18.906] muffleCondition(cond) [18:42:18.906] }) [18:42:18.906] })) [18:42:18.906] future::FutureResult(value = ...future.value$value, [18:42:18.906] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.906] ...future.rng), globalenv = if (FALSE) [18:42:18.906] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:18.906] ...future.globalenv.names)) [18:42:18.906] else NULL, started = ...future.startTime, version = "1.8") [18:42:18.906] }, condition = base::local({ [18:42:18.906] c <- base::c [18:42:18.906] inherits <- base::inherits [18:42:18.906] invokeRestart <- base::invokeRestart [18:42:18.906] length <- base::length [18:42:18.906] list <- base::list [18:42:18.906] seq.int <- base::seq.int [18:42:18.906] signalCondition <- base::signalCondition [18:42:18.906] sys.calls <- base::sys.calls [18:42:18.906] `[[` <- base::`[[` [18:42:18.906] `+` <- base::`+` [18:42:18.906] `<<-` <- base::`<<-` [18:42:18.906] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:18.906] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:18.906] 3L)] [18:42:18.906] } [18:42:18.906] function(cond) { [18:42:18.906] is_error <- inherits(cond, "error") [18:42:18.906] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:18.906] NULL) [18:42:18.906] if (is_error) { [18:42:18.906] sessionInformation <- function() { [18:42:18.906] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:18.906] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:18.906] search = base::search(), system = base::Sys.info()) [18:42:18.906] } [18:42:18.906] ...future.conditions[[length(...future.conditions) + [18:42:18.906] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:18.906] cond$call), session = sessionInformation(), [18:42:18.906] timestamp = base::Sys.time(), signaled = 0L) [18:42:18.906] signalCondition(cond) [18:42:18.906] } [18:42:18.906] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:18.906] "immediateCondition"))) { [18:42:18.906] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:18.906] ...future.conditions[[length(...future.conditions) + [18:42:18.906] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:18.906] if (TRUE && !signal) { [18:42:18.906] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.906] { [18:42:18.906] inherits <- base::inherits [18:42:18.906] invokeRestart <- base::invokeRestart [18:42:18.906] is.null <- base::is.null [18:42:18.906] muffled <- FALSE [18:42:18.906] if (inherits(cond, "message")) { [18:42:18.906] muffled <- grepl(pattern, "muffleMessage") [18:42:18.906] if (muffled) [18:42:18.906] invokeRestart("muffleMessage") [18:42:18.906] } [18:42:18.906] else if (inherits(cond, "warning")) { [18:42:18.906] muffled <- grepl(pattern, "muffleWarning") [18:42:18.906] if (muffled) [18:42:18.906] invokeRestart("muffleWarning") [18:42:18.906] } [18:42:18.906] else if (inherits(cond, "condition")) { [18:42:18.906] if (!is.null(pattern)) { [18:42:18.906] computeRestarts <- base::computeRestarts [18:42:18.906] grepl <- base::grepl [18:42:18.906] restarts <- computeRestarts(cond) [18:42:18.906] for (restart in restarts) { [18:42:18.906] name <- restart$name [18:42:18.906] if (is.null(name)) [18:42:18.906] next [18:42:18.906] if (!grepl(pattern, name)) [18:42:18.906] next [18:42:18.906] invokeRestart(restart) [18:42:18.906] muffled <- TRUE [18:42:18.906] break [18:42:18.906] } [18:42:18.906] } [18:42:18.906] } [18:42:18.906] invisible(muffled) [18:42:18.906] } [18:42:18.906] muffleCondition(cond, pattern = "^muffle") [18:42:18.906] } [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] if (TRUE) { [18:42:18.906] muffleCondition <- function (cond, pattern = "^muffle") [18:42:18.906] { [18:42:18.906] inherits <- base::inherits [18:42:18.906] invokeRestart <- base::invokeRestart [18:42:18.906] is.null <- base::is.null [18:42:18.906] muffled <- FALSE [18:42:18.906] if (inherits(cond, "message")) { [18:42:18.906] muffled <- grepl(pattern, "muffleMessage") [18:42:18.906] if (muffled) [18:42:18.906] invokeRestart("muffleMessage") [18:42:18.906] } [18:42:18.906] else if (inherits(cond, "warning")) { [18:42:18.906] muffled <- grepl(pattern, "muffleWarning") [18:42:18.906] if (muffled) [18:42:18.906] invokeRestart("muffleWarning") [18:42:18.906] } [18:42:18.906] else if (inherits(cond, "condition")) { [18:42:18.906] if (!is.null(pattern)) { [18:42:18.906] computeRestarts <- base::computeRestarts [18:42:18.906] grepl <- base::grepl [18:42:18.906] restarts <- computeRestarts(cond) [18:42:18.906] for (restart in restarts) { [18:42:18.906] name <- restart$name [18:42:18.906] if (is.null(name)) [18:42:18.906] next [18:42:18.906] if (!grepl(pattern, name)) [18:42:18.906] next [18:42:18.906] invokeRestart(restart) [18:42:18.906] muffled <- TRUE [18:42:18.906] break [18:42:18.906] } [18:42:18.906] } [18:42:18.906] } [18:42:18.906] invisible(muffled) [18:42:18.906] } [18:42:18.906] muffleCondition(cond, pattern = "^muffle") [18:42:18.906] } [18:42:18.906] } [18:42:18.906] } [18:42:18.906] })) [18:42:18.906] }, error = function(ex) { [18:42:18.906] base::structure(base::list(value = NULL, visible = NULL, [18:42:18.906] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:18.906] ...future.rng), started = ...future.startTime, [18:42:18.906] finished = Sys.time(), session_uuid = NA_character_, [18:42:18.906] version = "1.8"), class = "FutureResult") [18:42:18.906] }, finally = { [18:42:18.906] if (!identical(...future.workdir, getwd())) [18:42:18.906] setwd(...future.workdir) [18:42:18.906] { [18:42:18.906] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:18.906] ...future.oldOptions$nwarnings <- NULL [18:42:18.906] } [18:42:18.906] base::options(...future.oldOptions) [18:42:18.906] if (.Platform$OS.type == "windows") { [18:42:18.906] old_names <- names(...future.oldEnvVars) [18:42:18.906] envs <- base::Sys.getenv() [18:42:18.906] names <- names(envs) [18:42:18.906] common <- intersect(names, old_names) [18:42:18.906] added <- setdiff(names, old_names) [18:42:18.906] removed <- setdiff(old_names, names) [18:42:18.906] changed <- common[...future.oldEnvVars[common] != [18:42:18.906] envs[common]] [18:42:18.906] NAMES <- toupper(changed) [18:42:18.906] args <- list() [18:42:18.906] for (kk in seq_along(NAMES)) { [18:42:18.906] name <- changed[[kk]] [18:42:18.906] NAME <- NAMES[[kk]] [18:42:18.906] if (name != NAME && is.element(NAME, old_names)) [18:42:18.906] next [18:42:18.906] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.906] } [18:42:18.906] NAMES <- toupper(added) [18:42:18.906] for (kk in seq_along(NAMES)) { [18:42:18.906] name <- added[[kk]] [18:42:18.906] NAME <- NAMES[[kk]] [18:42:18.906] if (name != NAME && is.element(NAME, old_names)) [18:42:18.906] next [18:42:18.906] args[[name]] <- "" [18:42:18.906] } [18:42:18.906] NAMES <- toupper(removed) [18:42:18.906] for (kk in seq_along(NAMES)) { [18:42:18.906] name <- removed[[kk]] [18:42:18.906] NAME <- NAMES[[kk]] [18:42:18.906] if (name != NAME && is.element(NAME, old_names)) [18:42:18.906] next [18:42:18.906] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:18.906] } [18:42:18.906] if (length(args) > 0) [18:42:18.906] base::do.call(base::Sys.setenv, args = args) [18:42:18.906] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:18.906] } [18:42:18.906] { [18:42:18.906] if (base::length(...future.futureOptionsAdded) > [18:42:18.906] 0L) { [18:42:18.906] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:18.906] base::names(opts) <- ...future.futureOptionsAdded [18:42:18.906] base::options(opts) [18:42:18.906] } [18:42:18.906] { [18:42:18.906] { [18:42:18.906] base::options(mc.cores = ...future.mc.cores.old) [18:42:18.906] NULL [18:42:18.906] } [18:42:18.906] options(future.plan = NULL) [18:42:18.906] if (is.na(NA_character_)) [18:42:18.906] Sys.unsetenv("R_FUTURE_PLAN") [18:42:18.906] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:18.906] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:18.906] .init = FALSE) [18:42:18.906] } [18:42:18.906] } [18:42:18.906] } [18:42:18.906] }) [18:42:18.906] if (FALSE) { [18:42:18.906] base::sink(type = "output", split = FALSE) [18:42:18.906] if (NA) { [18:42:18.906] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:18.906] } [18:42:18.906] else { [18:42:18.906] ...future.result["stdout"] <- base::list(NULL) [18:42:18.906] } [18:42:18.906] base::close(...future.stdout) [18:42:18.906] ...future.stdout <- NULL [18:42:18.906] } [18:42:18.906] ...future.result$conditions <- ...future.conditions [18:42:18.906] ...future.result$finished <- base::Sys.time() [18:42:18.906] ...future.result [18:42:18.906] } [18:42:18.915] Exporting 5 global objects (1.46 KiB) to cluster node #2 ... [18:42:18.915] Exporting '...future.FUN' (841 bytes) to cluster node #2 ... [18:42:18.916] Exporting '...future.FUN' (841 bytes) to cluster node #2 ... DONE [18:42:18.916] Exporting 'future.call.arguments' (97 bytes) to cluster node #2 ... [18:42:18.916] Exporting 'future.call.arguments' (97 bytes) to cluster node #2 ... DONE [18:42:18.917] Exporting '...future.elements_ii' (43 bytes) to cluster node #2 ... [18:42:18.917] Exporting '...future.elements_ii' (43 bytes) to cluster node #2 ... DONE [18:42:18.918] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... [18:42:18.918] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... DONE [18:42:18.918] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... [18:42:18.919] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... DONE [18:42:18.919] Exporting 5 global objects (1.46 KiB) to cluster node #2 ... DONE [18:42:18.920] MultisessionFuture started [18:42:18.920] - Launch lazy future ... done [18:42:18.921] run() for 'MultisessionFuture' ... done [18:42:18.921] Created future: [18:42:18.951] receiveMessageFromWorker() for ClusterFuture ... [18:42:18.951] - Validating connection of MultisessionFuture [18:42:18.952] - received message: FutureResult [18:42:18.952] - Received FutureResult [18:42:18.952] - Erased future from FutureRegistry [18:42:18.953] result() for ClusterFuture ... [18:42:18.953] - result already collected: FutureResult [18:42:18.953] result() for ClusterFuture ... done [18:42:18.953] receiveMessageFromWorker() for ClusterFuture ... done [18:42:18.921] MultisessionFuture: [18:42:18.921] Label: 'future_lapply-2' [18:42:18.921] Expression: [18:42:18.921] { [18:42:18.921] do.call(function(...) { [18:42:18.921] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:18.921] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:18.921] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:18.921] on.exit(options(oopts), add = TRUE) [18:42:18.921] } [18:42:18.921] { [18:42:18.921] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:42:18.921] ...future.X_jj <- ...future.elements_ii[[jj]] [18:42:18.921] ...future.FUN(...future.X_jj, ...) [18:42:18.921] }) [18:42:18.921] } [18:42:18.921] }, args = future.call.arguments) [18:42:18.921] } [18:42:18.921] Lazy evaluation: FALSE [18:42:18.921] Asynchronous evaluation: TRUE [18:42:18.921] Local evaluation: TRUE [18:42:18.921] Environment: R_GlobalEnv [18:42:18.921] Capture standard output: NA [18:42:18.921] Capture condition classes: 'condition' (excluding 'nothing') [18:42:18.921] Globals: 5 objects totaling 1.01 KiB (function '...future.FUN' of 841 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:18.921] Packages: [18:42:18.921] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:18.921] Resolved: TRUE [18:42:18.921] Value: [18:42:18.921] Conditions captured: [18:42:18.921] Early signaling: FALSE [18:42:18.921] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:18.921] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:18.954] Chunk #2 of 2 ... DONE [18:42:18.954] Launching 2 futures (chunks) ... DONE [18:42:18.954] Resolving 2 futures (chunks) ... [18:42:18.955] resolve() on list ... [18:42:18.955] recursive: 0 [18:42:18.955] length: 2 [18:42:18.956] [18:42:19.147] Future #2 [18:42:19.147] result() for ClusterFuture ... [18:42:19.148] - result already collected: FutureResult [18:42:19.148] result() for ClusterFuture ... done [18:42:19.148] result() for ClusterFuture ... [18:42:19.148] - result already collected: FutureResult [18:42:19.148] result() for ClusterFuture ... done [18:42:19.149] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:42:19.149] - nx: 2 [18:42:19.149] - relay: TRUE [18:42:19.149] - stdout: TRUE [18:42:19.149] - signal: TRUE [18:42:19.149] - resignal: FALSE [18:42:19.149] - force: TRUE [18:42:19.150] - relayed: [n=2] FALSE, FALSE [18:42:19.150] - queued futures: [n=2] FALSE, FALSE [18:42:19.150] - until=1 [18:42:19.150] - relaying element #1 [18:42:19.150] - relayed: [n=2] FALSE, FALSE [18:42:19.150] - queued futures: [n=2] FALSE, TRUE [18:42:19.151] signalConditionsASAP(NULL, pos=2) ... done [18:42:19.151] length: 1 (resolved future 2) [18:42:19.192] receiveMessageFromWorker() for ClusterFuture ... [18:42:19.193] - Validating connection of MultisessionFuture [18:42:19.193] - received message: FutureResult [18:42:19.193] - Received FutureResult [18:42:19.193] - Erased future from FutureRegistry [18:42:19.193] result() for ClusterFuture ... [18:42:19.194] - result already collected: FutureResult [18:42:19.194] result() for ClusterFuture ... done [18:42:19.194] receiveMessageFromWorker() for ClusterFuture ... done [18:42:19.194] Future #1 [18:42:19.194] result() for ClusterFuture ... [18:42:19.194] - result already collected: FutureResult [18:42:19.195] result() for ClusterFuture ... done [18:42:19.195] result() for ClusterFuture ... [18:42:19.195] - result already collected: FutureResult [18:42:19.195] result() for ClusterFuture ... done [18:42:19.195] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:42:19.195] - nx: 2 [18:42:19.195] - relay: TRUE [18:42:19.196] - stdout: TRUE [18:42:19.196] - signal: TRUE [18:42:19.196] - resignal: FALSE [18:42:19.196] - force: TRUE [18:42:19.196] - relayed: [n=2] FALSE, FALSE [18:42:19.196] - queued futures: [n=2] FALSE, TRUE [18:42:19.197] - until=1 [18:42:19.197] - relaying element #1 [18:42:19.197] result() for ClusterFuture ... [18:42:19.197] - result already collected: FutureResult [18:42:19.197] result() for ClusterFuture ... done [18:42:19.197] result() for ClusterFuture ... [18:42:19.197] - result already collected: FutureResult [18:42:19.198] result() for ClusterFuture ... done [18:42:19.198] result() for ClusterFuture ... [18:42:19.198] - result already collected: FutureResult [18:42:19.198] result() for ClusterFuture ... done [18:42:19.198] result() for ClusterFuture ... [18:42:19.198] - result already collected: FutureResult [18:42:19.199] result() for ClusterFuture ... done [18:42:19.199] - relayed: [n=2] TRUE, FALSE [18:42:19.199] - queued futures: [n=2] TRUE, TRUE [18:42:19.199] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:42:19.199] length: 0 (resolved future 1) [18:42:19.199] Relaying remaining futures [18:42:19.200] signalConditionsASAP(NULL, pos=0) ... [18:42:19.200] - nx: 2 [18:42:19.200] - relay: TRUE [18:42:19.200] - stdout: TRUE [18:42:19.200] - signal: TRUE [18:42:19.200] - resignal: FALSE [18:42:19.200] - force: TRUE [18:42:19.201] - relayed: [n=2] TRUE, FALSE [18:42:19.201] - queued futures: [n=2] TRUE, TRUE - flush all [18:42:19.201] - relaying element #2 [18:42:19.201] result() for ClusterFuture ... [18:42:19.201] - result already collected: FutureResult [18:42:19.201] result() for ClusterFuture ... done [18:42:19.202] result() for ClusterFuture ... [18:42:19.202] - result already collected: FutureResult [18:42:19.202] result() for ClusterFuture ... done [18:42:19.202] result() for ClusterFuture ... [18:42:19.202] - result already collected: FutureResult [18:42:19.202] result() for ClusterFuture ... done [18:42:19.203] result() for ClusterFuture ... [18:42:19.203] - result already collected: FutureResult [18:42:19.203] result() for ClusterFuture ... done [18:42:19.203] - relayed: [n=2] TRUE, TRUE [18:42:19.203] - queued futures: [n=2] TRUE, TRUE [18:42:19.203] signalConditionsASAP(MultisessionFuture, pos=0) ... done [18:42:19.204] resolve() on list ... DONE [18:42:19.204] result() for ClusterFuture ... [18:42:19.204] - result already collected: FutureResult [18:42:19.204] result() for ClusterFuture ... done [18:42:19.204] result() for ClusterFuture ... [18:42:19.205] - result already collected: FutureResult [18:42:19.205] result() for ClusterFuture ... done [18:42:19.205] result() for ClusterFuture ... [18:42:19.205] - result already collected: FutureResult [18:42:19.205] result() for ClusterFuture ... done [18:42:19.205] result() for ClusterFuture ... [18:42:19.205] - result already collected: FutureResult [18:42:19.206] result() for ClusterFuture ... done [18:42:19.206] - Number of value chunks collected: 2 [18:42:19.206] Resolving 2 futures (chunks) ... DONE [18:42:19.206] Reducing values from 2 chunks ... [18:42:19.206] - Number of values collected after concatenation: 2 [18:42:19.206] - Number of values expected: 2 [18:42:19.207] Reducing values from 2 chunks ... DONE [18:42:19.207] future_lapply() ... DONE * future_lapply(x, ..., future.stdout = NA) ... DONE * future_mapply(x, ..., future.stdout = FALSE) ... [18:42:19.207] future_mapply() ... [18:42:19.210] Number of chunks: 2 [18:42:19.211] getGlobalsAndPackagesXApply() ... [18:42:19.211] - future.globals: TRUE [18:42:19.211] getGlobalsAndPackages() ... [18:42:19.211] Searching for globals... [18:42:19.214] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:19.215] Searching for globals ... DONE [18:42:19.215] Resolving globals: FALSE [18:42:19.215] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:19.216] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:19.216] - globals: [1] 'FUN' [18:42:19.216] [18:42:19.216] getGlobalsAndPackages() ... DONE [18:42:19.217] - globals found/used: [n=1] 'FUN' [18:42:19.217] - needed namespaces: [n=0] [18:42:19.217] Finding globals ... DONE [18:42:19.217] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:19.217] List of 2 [18:42:19.217] $ ...future.FUN:function (x, y) [18:42:19.217] $ MoreArgs : NULL [18:42:19.217] - attr(*, "where")=List of 2 [18:42:19.217] ..$ ...future.FUN: [18:42:19.217] ..$ MoreArgs : [18:42:19.217] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:19.217] - attr(*, "resolved")= logi FALSE [18:42:19.217] - attr(*, "total_size")= num NA [18:42:19.221] Packages to be attached in all futures: [n=0] [18:42:19.221] getGlobalsAndPackagesXApply() ... DONE [18:42:19.221] Number of futures (= number of chunks): 2 [18:42:19.221] Launching 2 futures (chunks) ... [18:42:19.222] Chunk #1 of 2 ... [18:42:19.222] - Finding globals in '...' for chunk #1 ... [18:42:19.222] getGlobalsAndPackages() ... [18:42:19.222] Searching for globals... [18:42:19.223] [18:42:19.223] Searching for globals ... DONE [18:42:19.223] - globals: [0] [18:42:19.223] getGlobalsAndPackages() ... DONE [18:42:19.223] + additional globals found: [n=0] [18:42:19.223] + additional namespaces needed: [n=0] [18:42:19.223] - Finding globals in '...' for chunk #1 ... DONE [18:42:19.224] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:19.224] - seeds: [18:42:19.224] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.224] getGlobalsAndPackages() ... [18:42:19.224] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.225] Resolving globals: FALSE [18:42:19.225] The total size of the 5 globals is 1.19 KiB (1218 bytes) [18:42:19.226] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.19 KiB.. This exceeds the maximum allowed size of 0.98 GiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (71 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:19.226] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.226] [18:42:19.226] getGlobalsAndPackages() ... DONE [18:42:19.227] run() for 'Future' ... [18:42:19.227] - state: 'created' [18:42:19.227] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:19.244] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:19.244] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:19.244] - Field: 'node' [18:42:19.244] - Field: 'label' [18:42:19.244] - Field: 'local' [18:42:19.245] - Field: 'owner' [18:42:19.245] - Field: 'envir' [18:42:19.245] - Field: 'workers' [18:42:19.245] - Field: 'packages' [18:42:19.245] - Field: 'gc' [18:42:19.245] - Field: 'conditions' [18:42:19.246] - Field: 'persistent' [18:42:19.246] - Field: 'expr' [18:42:19.246] - Field: 'uuid' [18:42:19.246] - Field: 'seed' [18:42:19.246] - Field: 'version' [18:42:19.247] - Field: 'result' [18:42:19.247] - Field: 'asynchronous' [18:42:19.247] - Field: 'calls' [18:42:19.247] - Field: 'globals' [18:42:19.247] - Field: 'stdout' [18:42:19.247] - Field: 'earlySignal' [18:42:19.248] - Field: 'lazy' [18:42:19.248] - Field: 'state' [18:42:19.248] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:19.248] - Launch lazy future ... [18:42:19.249] Packages needed by the future expression (n = 0): [18:42:19.249] Packages needed by future strategies (n = 0): [18:42:19.249] { [18:42:19.249] { [18:42:19.249] { [18:42:19.249] ...future.startTime <- base::Sys.time() [18:42:19.249] { [18:42:19.249] { [18:42:19.249] { [18:42:19.249] { [18:42:19.249] base::local({ [18:42:19.249] has_future <- base::requireNamespace("future", [18:42:19.249] quietly = TRUE) [18:42:19.249] if (has_future) { [18:42:19.249] ns <- base::getNamespace("future") [18:42:19.249] version <- ns[[".package"]][["version"]] [18:42:19.249] if (is.null(version)) [18:42:19.249] version <- utils::packageVersion("future") [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] version <- NULL [18:42:19.249] } [18:42:19.249] if (!has_future || version < "1.8.0") { [18:42:19.249] info <- base::c(r_version = base::gsub("R version ", [18:42:19.249] "", base::R.version$version.string), [18:42:19.249] platform = base::sprintf("%s (%s-bit)", [18:42:19.249] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:19.249] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:19.249] "release", "version")], collapse = " "), [18:42:19.249] hostname = base::Sys.info()[["nodename"]]) [18:42:19.249] info <- base::sprintf("%s: %s", base::names(info), [18:42:19.249] info) [18:42:19.249] info <- base::paste(info, collapse = "; ") [18:42:19.249] if (!has_future) { [18:42:19.249] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:19.249] info) [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:19.249] info, version) [18:42:19.249] } [18:42:19.249] base::stop(msg) [18:42:19.249] } [18:42:19.249] }) [18:42:19.249] } [18:42:19.249] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:19.249] base::options(mc.cores = 1L) [18:42:19.249] } [18:42:19.249] ...future.strategy.old <- future::plan("list") [18:42:19.249] options(future.plan = NULL) [18:42:19.249] Sys.unsetenv("R_FUTURE_PLAN") [18:42:19.249] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:19.249] } [18:42:19.249] ...future.workdir <- getwd() [18:42:19.249] } [18:42:19.249] ...future.oldOptions <- base::as.list(base::.Options) [18:42:19.249] ...future.oldEnvVars <- base::Sys.getenv() [18:42:19.249] } [18:42:19.249] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:19.249] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:19.249] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:19.249] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:19.249] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:19.249] future.stdout.windows.reencode = NULL, width = 80L) [18:42:19.249] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:19.249] base::names(...future.oldOptions)) [18:42:19.249] } [18:42:19.249] if (FALSE) { [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] if (FALSE) { [18:42:19.249] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:19.249] open = "w") [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:19.249] windows = "NUL", "/dev/null"), open = "w") [18:42:19.249] } [18:42:19.249] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:19.249] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:19.249] base::sink(type = "output", split = FALSE) [18:42:19.249] base::close(...future.stdout) [18:42:19.249] }, add = TRUE) [18:42:19.249] } [18:42:19.249] ...future.frame <- base::sys.nframe() [18:42:19.249] ...future.conditions <- base::list() [18:42:19.249] ...future.rng <- base::globalenv()$.Random.seed [18:42:19.249] if (FALSE) { [18:42:19.249] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:19.249] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:19.249] } [18:42:19.249] ...future.result <- base::tryCatch({ [18:42:19.249] base::withCallingHandlers({ [18:42:19.249] ...future.value <- base::withVisible(base::local({ [18:42:19.249] ...future.makeSendCondition <- base::local({ [18:42:19.249] sendCondition <- NULL [18:42:19.249] function(frame = 1L) { [18:42:19.249] if (is.function(sendCondition)) [18:42:19.249] return(sendCondition) [18:42:19.249] ns <- getNamespace("parallel") [18:42:19.249] if (exists("sendData", mode = "function", [18:42:19.249] envir = ns)) { [18:42:19.249] parallel_sendData <- get("sendData", mode = "function", [18:42:19.249] envir = ns) [18:42:19.249] envir <- sys.frame(frame) [18:42:19.249] master <- NULL [18:42:19.249] while (!identical(envir, .GlobalEnv) && [18:42:19.249] !identical(envir, emptyenv())) { [18:42:19.249] if (exists("master", mode = "list", envir = envir, [18:42:19.249] inherits = FALSE)) { [18:42:19.249] master <- get("master", mode = "list", [18:42:19.249] envir = envir, inherits = FALSE) [18:42:19.249] if (inherits(master, c("SOCKnode", [18:42:19.249] "SOCK0node"))) { [18:42:19.249] sendCondition <<- function(cond) { [18:42:19.249] data <- list(type = "VALUE", value = cond, [18:42:19.249] success = TRUE) [18:42:19.249] parallel_sendData(master, data) [18:42:19.249] } [18:42:19.249] return(sendCondition) [18:42:19.249] } [18:42:19.249] } [18:42:19.249] frame <- frame + 1L [18:42:19.249] envir <- sys.frame(frame) [18:42:19.249] } [18:42:19.249] } [18:42:19.249] sendCondition <<- function(cond) NULL [18:42:19.249] } [18:42:19.249] }) [18:42:19.249] withCallingHandlers({ [18:42:19.249] { [18:42:19.249] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:19.249] if (!identical(...future.globals.maxSize.org, [18:42:19.249] ...future.globals.maxSize)) { [18:42:19.249] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:19.249] on.exit(options(oopts), add = TRUE) [18:42:19.249] } [18:42:19.249] { [18:42:19.249] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:19.249] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:19.249] USE.NAMES = FALSE) [18:42:19.249] do.call(mapply, args = args) [18:42:19.249] } [18:42:19.249] } [18:42:19.249] }, immediateCondition = function(cond) { [18:42:19.249] sendCondition <- ...future.makeSendCondition() [18:42:19.249] sendCondition(cond) [18:42:19.249] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.249] { [18:42:19.249] inherits <- base::inherits [18:42:19.249] invokeRestart <- base::invokeRestart [18:42:19.249] is.null <- base::is.null [18:42:19.249] muffled <- FALSE [18:42:19.249] if (inherits(cond, "message")) { [18:42:19.249] muffled <- grepl(pattern, "muffleMessage") [18:42:19.249] if (muffled) [18:42:19.249] invokeRestart("muffleMessage") [18:42:19.249] } [18:42:19.249] else if (inherits(cond, "warning")) { [18:42:19.249] muffled <- grepl(pattern, "muffleWarning") [18:42:19.249] if (muffled) [18:42:19.249] invokeRestart("muffleWarning") [18:42:19.249] } [18:42:19.249] else if (inherits(cond, "condition")) { [18:42:19.249] if (!is.null(pattern)) { [18:42:19.249] computeRestarts <- base::computeRestarts [18:42:19.249] grepl <- base::grepl [18:42:19.249] restarts <- computeRestarts(cond) [18:42:19.249] for (restart in restarts) { [18:42:19.249] name <- restart$name [18:42:19.249] if (is.null(name)) [18:42:19.249] next [18:42:19.249] if (!grepl(pattern, name)) [18:42:19.249] next [18:42:19.249] invokeRestart(restart) [18:42:19.249] muffled <- TRUE [18:42:19.249] break [18:42:19.249] } [18:42:19.249] } [18:42:19.249] } [18:42:19.249] invisible(muffled) [18:42:19.249] } [18:42:19.249] muffleCondition(cond) [18:42:19.249] }) [18:42:19.249] })) [18:42:19.249] future::FutureResult(value = ...future.value$value, [18:42:19.249] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:19.249] ...future.rng), globalenv = if (FALSE) [18:42:19.249] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:19.249] ...future.globalenv.names)) [18:42:19.249] else NULL, started = ...future.startTime, version = "1.8") [18:42:19.249] }, condition = base::local({ [18:42:19.249] c <- base::c [18:42:19.249] inherits <- base::inherits [18:42:19.249] invokeRestart <- base::invokeRestart [18:42:19.249] length <- base::length [18:42:19.249] list <- base::list [18:42:19.249] seq.int <- base::seq.int [18:42:19.249] signalCondition <- base::signalCondition [18:42:19.249] sys.calls <- base::sys.calls [18:42:19.249] `[[` <- base::`[[` [18:42:19.249] `+` <- base::`+` [18:42:19.249] `<<-` <- base::`<<-` [18:42:19.249] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:19.249] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:19.249] 3L)] [18:42:19.249] } [18:42:19.249] function(cond) { [18:42:19.249] is_error <- inherits(cond, "error") [18:42:19.249] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:19.249] NULL) [18:42:19.249] if (is_error) { [18:42:19.249] sessionInformation <- function() { [18:42:19.249] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:19.249] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:19.249] search = base::search(), system = base::Sys.info()) [18:42:19.249] } [18:42:19.249] ...future.conditions[[length(...future.conditions) + [18:42:19.249] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:19.249] cond$call), session = sessionInformation(), [18:42:19.249] timestamp = base::Sys.time(), signaled = 0L) [18:42:19.249] signalCondition(cond) [18:42:19.249] } [18:42:19.249] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:19.249] "immediateCondition"))) { [18:42:19.249] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:19.249] ...future.conditions[[length(...future.conditions) + [18:42:19.249] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:19.249] if (TRUE && !signal) { [18:42:19.249] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.249] { [18:42:19.249] inherits <- base::inherits [18:42:19.249] invokeRestart <- base::invokeRestart [18:42:19.249] is.null <- base::is.null [18:42:19.249] muffled <- FALSE [18:42:19.249] if (inherits(cond, "message")) { [18:42:19.249] muffled <- grepl(pattern, "muffleMessage") [18:42:19.249] if (muffled) [18:42:19.249] invokeRestart("muffleMessage") [18:42:19.249] } [18:42:19.249] else if (inherits(cond, "warning")) { [18:42:19.249] muffled <- grepl(pattern, "muffleWarning") [18:42:19.249] if (muffled) [18:42:19.249] invokeRestart("muffleWarning") [18:42:19.249] } [18:42:19.249] else if (inherits(cond, "condition")) { [18:42:19.249] if (!is.null(pattern)) { [18:42:19.249] computeRestarts <- base::computeRestarts [18:42:19.249] grepl <- base::grepl [18:42:19.249] restarts <- computeRestarts(cond) [18:42:19.249] for (restart in restarts) { [18:42:19.249] name <- restart$name [18:42:19.249] if (is.null(name)) [18:42:19.249] next [18:42:19.249] if (!grepl(pattern, name)) [18:42:19.249] next [18:42:19.249] invokeRestart(restart) [18:42:19.249] muffled <- TRUE [18:42:19.249] break [18:42:19.249] } [18:42:19.249] } [18:42:19.249] } [18:42:19.249] invisible(muffled) [18:42:19.249] } [18:42:19.249] muffleCondition(cond, pattern = "^muffle") [18:42:19.249] } [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] if (TRUE) { [18:42:19.249] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.249] { [18:42:19.249] inherits <- base::inherits [18:42:19.249] invokeRestart <- base::invokeRestart [18:42:19.249] is.null <- base::is.null [18:42:19.249] muffled <- FALSE [18:42:19.249] if (inherits(cond, "message")) { [18:42:19.249] muffled <- grepl(pattern, "muffleMessage") [18:42:19.249] if (muffled) [18:42:19.249] invokeRestart("muffleMessage") [18:42:19.249] } [18:42:19.249] else if (inherits(cond, "warning")) { [18:42:19.249] muffled <- grepl(pattern, "muffleWarning") [18:42:19.249] if (muffled) [18:42:19.249] invokeRestart("muffleWarning") [18:42:19.249] } [18:42:19.249] else if (inherits(cond, "condition")) { [18:42:19.249] if (!is.null(pattern)) { [18:42:19.249] computeRestarts <- base::computeRestarts [18:42:19.249] grepl <- base::grepl [18:42:19.249] restarts <- computeRestarts(cond) [18:42:19.249] for (restart in restarts) { [18:42:19.249] name <- restart$name [18:42:19.249] if (is.null(name)) [18:42:19.249] next [18:42:19.249] if (!grepl(pattern, name)) [18:42:19.249] next [18:42:19.249] invokeRestart(restart) [18:42:19.249] muffled <- TRUE [18:42:19.249] break [18:42:19.249] } [18:42:19.249] } [18:42:19.249] } [18:42:19.249] invisible(muffled) [18:42:19.249] } [18:42:19.249] muffleCondition(cond, pattern = "^muffle") [18:42:19.249] } [18:42:19.249] } [18:42:19.249] } [18:42:19.249] })) [18:42:19.249] }, error = function(ex) { [18:42:19.249] base::structure(base::list(value = NULL, visible = NULL, [18:42:19.249] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:19.249] ...future.rng), started = ...future.startTime, [18:42:19.249] finished = Sys.time(), session_uuid = NA_character_, [18:42:19.249] version = "1.8"), class = "FutureResult") [18:42:19.249] }, finally = { [18:42:19.249] if (!identical(...future.workdir, getwd())) [18:42:19.249] setwd(...future.workdir) [18:42:19.249] { [18:42:19.249] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:19.249] ...future.oldOptions$nwarnings <- NULL [18:42:19.249] } [18:42:19.249] base::options(...future.oldOptions) [18:42:19.249] if (.Platform$OS.type == "windows") { [18:42:19.249] old_names <- names(...future.oldEnvVars) [18:42:19.249] envs <- base::Sys.getenv() [18:42:19.249] names <- names(envs) [18:42:19.249] common <- intersect(names, old_names) [18:42:19.249] added <- setdiff(names, old_names) [18:42:19.249] removed <- setdiff(old_names, names) [18:42:19.249] changed <- common[...future.oldEnvVars[common] != [18:42:19.249] envs[common]] [18:42:19.249] NAMES <- toupper(changed) [18:42:19.249] args <- list() [18:42:19.249] for (kk in seq_along(NAMES)) { [18:42:19.249] name <- changed[[kk]] [18:42:19.249] NAME <- NAMES[[kk]] [18:42:19.249] if (name != NAME && is.element(NAME, old_names)) [18:42:19.249] next [18:42:19.249] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:19.249] } [18:42:19.249] NAMES <- toupper(added) [18:42:19.249] for (kk in seq_along(NAMES)) { [18:42:19.249] name <- added[[kk]] [18:42:19.249] NAME <- NAMES[[kk]] [18:42:19.249] if (name != NAME && is.element(NAME, old_names)) [18:42:19.249] next [18:42:19.249] args[[name]] <- "" [18:42:19.249] } [18:42:19.249] NAMES <- toupper(removed) [18:42:19.249] for (kk in seq_along(NAMES)) { [18:42:19.249] name <- removed[[kk]] [18:42:19.249] NAME <- NAMES[[kk]] [18:42:19.249] if (name != NAME && is.element(NAME, old_names)) [18:42:19.249] next [18:42:19.249] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:19.249] } [18:42:19.249] if (length(args) > 0) [18:42:19.249] base::do.call(base::Sys.setenv, args = args) [18:42:19.249] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:19.249] } [18:42:19.249] { [18:42:19.249] if (base::length(...future.futureOptionsAdded) > [18:42:19.249] 0L) { [18:42:19.249] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:19.249] base::names(opts) <- ...future.futureOptionsAdded [18:42:19.249] base::options(opts) [18:42:19.249] } [18:42:19.249] { [18:42:19.249] { [18:42:19.249] base::options(mc.cores = ...future.mc.cores.old) [18:42:19.249] NULL [18:42:19.249] } [18:42:19.249] options(future.plan = NULL) [18:42:19.249] if (is.na(NA_character_)) [18:42:19.249] Sys.unsetenv("R_FUTURE_PLAN") [18:42:19.249] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:19.249] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:19.249] .init = FALSE) [18:42:19.249] } [18:42:19.249] } [18:42:19.249] } [18:42:19.249] }) [18:42:19.249] if (TRUE) { [18:42:19.249] base::sink(type = "output", split = FALSE) [18:42:19.249] if (FALSE) { [18:42:19.249] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:19.249] } [18:42:19.249] else { [18:42:19.249] ...future.result["stdout"] <- base::list(NULL) [18:42:19.249] } [18:42:19.249] base::close(...future.stdout) [18:42:19.249] ...future.stdout <- NULL [18:42:19.249] } [18:42:19.249] ...future.result$conditions <- ...future.conditions [18:42:19.249] ...future.result$finished <- base::Sys.time() [18:42:19.249] ...future.result [18:42:19.249] } [18:42:19.255] Exporting 5 global objects (1.62 KiB) to cluster node #1 ... [18:42:19.255] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... [18:42:19.256] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... DONE [18:42:19.256] Exporting 'MoreArgs' (27 bytes) to cluster node #1 ... [18:42:19.256] Exporting 'MoreArgs' (27 bytes) to cluster node #1 ... DONE [18:42:19.256] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:42:19.257] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:42:19.257] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:42:19.257] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:42:19.258] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:42:19.258] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:42:19.258] Exporting 5 global objects (1.62 KiB) to cluster node #1 ... DONE [18:42:19.259] MultisessionFuture started [18:42:19.259] - Launch lazy future ... done [18:42:19.260] run() for 'MultisessionFuture' ... done [18:42:19.260] Created future: [18:42:19.260] MultisessionFuture: [18:42:19.260] Label: 'future_mapply-1' [18:42:19.260] Expression: [18:42:19.260] { [18:42:19.260] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:19.260] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:19.260] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:19.260] on.exit(options(oopts), add = TRUE) [18:42:19.260] } [18:42:19.260] { [18:42:19.260] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:19.260] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:19.260] do.call(mapply, args = args) [18:42:19.260] } [18:42:19.260] } [18:42:19.260] Lazy evaluation: FALSE [18:42:19.260] Asynchronous evaluation: TRUE [18:42:19.260] Local evaluation: TRUE [18:42:19.260] Environment: R_GlobalEnv [18:42:19.260] Capture standard output: FALSE [18:42:19.260] Capture condition classes: 'condition' (excluding 'nothing') [18:42:19.260] Globals: 5 objects totaling 1.19 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:19.260] Packages: [18:42:19.260] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:19.260] Resolved: FALSE [18:42:19.260] Value: [18:42:19.260] Conditions captured: [18:42:19.260] Early signaling: FALSE [18:42:19.260] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:19.260] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:19.460] Chunk #1 of 2 ... DONE [18:42:19.460] Chunk #2 of 2 ... [18:42:19.461] - Finding globals in '...' for chunk #2 ... [18:42:19.461] getGlobalsAndPackages() ... [18:42:19.461] Searching for globals... [18:42:19.461] [18:42:19.462] Searching for globals ... DONE [18:42:19.462] - globals: [0] [18:42:19.462] getGlobalsAndPackages() ... DONE [18:42:19.462] + additional globals found: [n=0] [18:42:19.462] + additional namespaces needed: [n=0] [18:42:19.462] - Finding globals in '...' for chunk #2 ... DONE [18:42:19.463] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:19.463] - seeds: [18:42:19.463] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.463] getGlobalsAndPackages() ... [18:42:19.463] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.463] Resolving globals: FALSE [18:42:19.464] The total size of the 5 globals is 1.19 KiB (1218 bytes) [18:42:19.465] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.19 KiB.. This exceeds the maximum allowed size of 0.98 GiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (71 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:19.465] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.465] [18:42:19.465] getGlobalsAndPackages() ... DONE [18:42:19.466] run() for 'Future' ... [18:42:19.466] - state: 'created' [18:42:19.466] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:19.482] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:19.483] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:19.483] - Field: 'node' [18:42:19.483] - Field: 'label' [18:42:19.483] - Field: 'local' [18:42:19.483] - Field: 'owner' [18:42:19.484] - Field: 'envir' [18:42:19.484] - Field: 'workers' [18:42:19.484] - Field: 'packages' [18:42:19.484] - Field: 'gc' [18:42:19.484] - Field: 'conditions' [18:42:19.484] - Field: 'persistent' [18:42:19.485] - Field: 'expr' [18:42:19.487] - Field: 'uuid' [18:42:19.487] - Field: 'seed' [18:42:19.488] - Field: 'version' [18:42:19.488] - Field: 'result' [18:42:19.488] - Field: 'asynchronous' [18:42:19.488] - Field: 'calls' [18:42:19.488] - Field: 'globals' [18:42:19.488] - Field: 'stdout' [18:42:19.489] - Field: 'earlySignal' [18:42:19.489] - Field: 'lazy' [18:42:19.489] - Field: 'state' [18:42:19.489] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:19.489] - Launch lazy future ... [18:42:19.490] Packages needed by the future expression (n = 0): [18:42:19.490] Packages needed by future strategies (n = 0): [18:42:19.490] { [18:42:19.490] { [18:42:19.490] { [18:42:19.490] ...future.startTime <- base::Sys.time() [18:42:19.490] { [18:42:19.490] { [18:42:19.490] { [18:42:19.490] { [18:42:19.490] base::local({ [18:42:19.490] has_future <- base::requireNamespace("future", [18:42:19.490] quietly = TRUE) [18:42:19.490] if (has_future) { [18:42:19.490] ns <- base::getNamespace("future") [18:42:19.490] version <- ns[[".package"]][["version"]] [18:42:19.490] if (is.null(version)) [18:42:19.490] version <- utils::packageVersion("future") [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] version <- NULL [18:42:19.490] } [18:42:19.490] if (!has_future || version < "1.8.0") { [18:42:19.490] info <- base::c(r_version = base::gsub("R version ", [18:42:19.490] "", base::R.version$version.string), [18:42:19.490] platform = base::sprintf("%s (%s-bit)", [18:42:19.490] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:19.490] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:19.490] "release", "version")], collapse = " "), [18:42:19.490] hostname = base::Sys.info()[["nodename"]]) [18:42:19.490] info <- base::sprintf("%s: %s", base::names(info), [18:42:19.490] info) [18:42:19.490] info <- base::paste(info, collapse = "; ") [18:42:19.490] if (!has_future) { [18:42:19.490] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:19.490] info) [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:19.490] info, version) [18:42:19.490] } [18:42:19.490] base::stop(msg) [18:42:19.490] } [18:42:19.490] }) [18:42:19.490] } [18:42:19.490] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:19.490] base::options(mc.cores = 1L) [18:42:19.490] } [18:42:19.490] ...future.strategy.old <- future::plan("list") [18:42:19.490] options(future.plan = NULL) [18:42:19.490] Sys.unsetenv("R_FUTURE_PLAN") [18:42:19.490] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:19.490] } [18:42:19.490] ...future.workdir <- getwd() [18:42:19.490] } [18:42:19.490] ...future.oldOptions <- base::as.list(base::.Options) [18:42:19.490] ...future.oldEnvVars <- base::Sys.getenv() [18:42:19.490] } [18:42:19.490] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:19.490] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:19.490] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:19.490] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:19.490] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:19.490] future.stdout.windows.reencode = NULL, width = 80L) [18:42:19.490] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:19.490] base::names(...future.oldOptions)) [18:42:19.490] } [18:42:19.490] if (FALSE) { [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] if (FALSE) { [18:42:19.490] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:19.490] open = "w") [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:19.490] windows = "NUL", "/dev/null"), open = "w") [18:42:19.490] } [18:42:19.490] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:19.490] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:19.490] base::sink(type = "output", split = FALSE) [18:42:19.490] base::close(...future.stdout) [18:42:19.490] }, add = TRUE) [18:42:19.490] } [18:42:19.490] ...future.frame <- base::sys.nframe() [18:42:19.490] ...future.conditions <- base::list() [18:42:19.490] ...future.rng <- base::globalenv()$.Random.seed [18:42:19.490] if (FALSE) { [18:42:19.490] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:19.490] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:19.490] } [18:42:19.490] ...future.result <- base::tryCatch({ [18:42:19.490] base::withCallingHandlers({ [18:42:19.490] ...future.value <- base::withVisible(base::local({ [18:42:19.490] ...future.makeSendCondition <- base::local({ [18:42:19.490] sendCondition <- NULL [18:42:19.490] function(frame = 1L) { [18:42:19.490] if (is.function(sendCondition)) [18:42:19.490] return(sendCondition) [18:42:19.490] ns <- getNamespace("parallel") [18:42:19.490] if (exists("sendData", mode = "function", [18:42:19.490] envir = ns)) { [18:42:19.490] parallel_sendData <- get("sendData", mode = "function", [18:42:19.490] envir = ns) [18:42:19.490] envir <- sys.frame(frame) [18:42:19.490] master <- NULL [18:42:19.490] while (!identical(envir, .GlobalEnv) && [18:42:19.490] !identical(envir, emptyenv())) { [18:42:19.490] if (exists("master", mode = "list", envir = envir, [18:42:19.490] inherits = FALSE)) { [18:42:19.490] master <- get("master", mode = "list", [18:42:19.490] envir = envir, inherits = FALSE) [18:42:19.490] if (inherits(master, c("SOCKnode", [18:42:19.490] "SOCK0node"))) { [18:42:19.490] sendCondition <<- function(cond) { [18:42:19.490] data <- list(type = "VALUE", value = cond, [18:42:19.490] success = TRUE) [18:42:19.490] parallel_sendData(master, data) [18:42:19.490] } [18:42:19.490] return(sendCondition) [18:42:19.490] } [18:42:19.490] } [18:42:19.490] frame <- frame + 1L [18:42:19.490] envir <- sys.frame(frame) [18:42:19.490] } [18:42:19.490] } [18:42:19.490] sendCondition <<- function(cond) NULL [18:42:19.490] } [18:42:19.490] }) [18:42:19.490] withCallingHandlers({ [18:42:19.490] { [18:42:19.490] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:19.490] if (!identical(...future.globals.maxSize.org, [18:42:19.490] ...future.globals.maxSize)) { [18:42:19.490] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:19.490] on.exit(options(oopts), add = TRUE) [18:42:19.490] } [18:42:19.490] { [18:42:19.490] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:19.490] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:19.490] USE.NAMES = FALSE) [18:42:19.490] do.call(mapply, args = args) [18:42:19.490] } [18:42:19.490] } [18:42:19.490] }, immediateCondition = function(cond) { [18:42:19.490] sendCondition <- ...future.makeSendCondition() [18:42:19.490] sendCondition(cond) [18:42:19.490] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.490] { [18:42:19.490] inherits <- base::inherits [18:42:19.490] invokeRestart <- base::invokeRestart [18:42:19.490] is.null <- base::is.null [18:42:19.490] muffled <- FALSE [18:42:19.490] if (inherits(cond, "message")) { [18:42:19.490] muffled <- grepl(pattern, "muffleMessage") [18:42:19.490] if (muffled) [18:42:19.490] invokeRestart("muffleMessage") [18:42:19.490] } [18:42:19.490] else if (inherits(cond, "warning")) { [18:42:19.490] muffled <- grepl(pattern, "muffleWarning") [18:42:19.490] if (muffled) [18:42:19.490] invokeRestart("muffleWarning") [18:42:19.490] } [18:42:19.490] else if (inherits(cond, "condition")) { [18:42:19.490] if (!is.null(pattern)) { [18:42:19.490] computeRestarts <- base::computeRestarts [18:42:19.490] grepl <- base::grepl [18:42:19.490] restarts <- computeRestarts(cond) [18:42:19.490] for (restart in restarts) { [18:42:19.490] name <- restart$name [18:42:19.490] if (is.null(name)) [18:42:19.490] next [18:42:19.490] if (!grepl(pattern, name)) [18:42:19.490] next [18:42:19.490] invokeRestart(restart) [18:42:19.490] muffled <- TRUE [18:42:19.490] break [18:42:19.490] } [18:42:19.490] } [18:42:19.490] } [18:42:19.490] invisible(muffled) [18:42:19.490] } [18:42:19.490] muffleCondition(cond) [18:42:19.490] }) [18:42:19.490] })) [18:42:19.490] future::FutureResult(value = ...future.value$value, [18:42:19.490] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:19.490] ...future.rng), globalenv = if (FALSE) [18:42:19.490] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:19.490] ...future.globalenv.names)) [18:42:19.490] else NULL, started = ...future.startTime, version = "1.8") [18:42:19.490] }, condition = base::local({ [18:42:19.490] c <- base::c [18:42:19.490] inherits <- base::inherits [18:42:19.490] invokeRestart <- base::invokeRestart [18:42:19.490] length <- base::length [18:42:19.490] list <- base::list [18:42:19.490] seq.int <- base::seq.int [18:42:19.490] signalCondition <- base::signalCondition [18:42:19.490] sys.calls <- base::sys.calls [18:42:19.490] `[[` <- base::`[[` [18:42:19.490] `+` <- base::`+` [18:42:19.490] `<<-` <- base::`<<-` [18:42:19.490] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:19.490] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:19.490] 3L)] [18:42:19.490] } [18:42:19.490] function(cond) { [18:42:19.490] is_error <- inherits(cond, "error") [18:42:19.490] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:19.490] NULL) [18:42:19.490] if (is_error) { [18:42:19.490] sessionInformation <- function() { [18:42:19.490] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:19.490] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:19.490] search = base::search(), system = base::Sys.info()) [18:42:19.490] } [18:42:19.490] ...future.conditions[[length(...future.conditions) + [18:42:19.490] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:19.490] cond$call), session = sessionInformation(), [18:42:19.490] timestamp = base::Sys.time(), signaled = 0L) [18:42:19.490] signalCondition(cond) [18:42:19.490] } [18:42:19.490] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:19.490] "immediateCondition"))) { [18:42:19.490] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:19.490] ...future.conditions[[length(...future.conditions) + [18:42:19.490] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:19.490] if (TRUE && !signal) { [18:42:19.490] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.490] { [18:42:19.490] inherits <- base::inherits [18:42:19.490] invokeRestart <- base::invokeRestart [18:42:19.490] is.null <- base::is.null [18:42:19.490] muffled <- FALSE [18:42:19.490] if (inherits(cond, "message")) { [18:42:19.490] muffled <- grepl(pattern, "muffleMessage") [18:42:19.490] if (muffled) [18:42:19.490] invokeRestart("muffleMessage") [18:42:19.490] } [18:42:19.490] else if (inherits(cond, "warning")) { [18:42:19.490] muffled <- grepl(pattern, "muffleWarning") [18:42:19.490] if (muffled) [18:42:19.490] invokeRestart("muffleWarning") [18:42:19.490] } [18:42:19.490] else if (inherits(cond, "condition")) { [18:42:19.490] if (!is.null(pattern)) { [18:42:19.490] computeRestarts <- base::computeRestarts [18:42:19.490] grepl <- base::grepl [18:42:19.490] restarts <- computeRestarts(cond) [18:42:19.490] for (restart in restarts) { [18:42:19.490] name <- restart$name [18:42:19.490] if (is.null(name)) [18:42:19.490] next [18:42:19.490] if (!grepl(pattern, name)) [18:42:19.490] next [18:42:19.490] invokeRestart(restart) [18:42:19.490] muffled <- TRUE [18:42:19.490] break [18:42:19.490] } [18:42:19.490] } [18:42:19.490] } [18:42:19.490] invisible(muffled) [18:42:19.490] } [18:42:19.490] muffleCondition(cond, pattern = "^muffle") [18:42:19.490] } [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] if (TRUE) { [18:42:19.490] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.490] { [18:42:19.490] inherits <- base::inherits [18:42:19.490] invokeRestart <- base::invokeRestart [18:42:19.490] is.null <- base::is.null [18:42:19.490] muffled <- FALSE [18:42:19.490] if (inherits(cond, "message")) { [18:42:19.490] muffled <- grepl(pattern, "muffleMessage") [18:42:19.490] if (muffled) [18:42:19.490] invokeRestart("muffleMessage") [18:42:19.490] } [18:42:19.490] else if (inherits(cond, "warning")) { [18:42:19.490] muffled <- grepl(pattern, "muffleWarning") [18:42:19.490] if (muffled) [18:42:19.490] invokeRestart("muffleWarning") [18:42:19.490] } [18:42:19.490] else if (inherits(cond, "condition")) { [18:42:19.490] if (!is.null(pattern)) { [18:42:19.490] computeRestarts <- base::computeRestarts [18:42:19.490] grepl <- base::grepl [18:42:19.490] restarts <- computeRestarts(cond) [18:42:19.490] for (restart in restarts) { [18:42:19.490] name <- restart$name [18:42:19.490] if (is.null(name)) [18:42:19.490] next [18:42:19.490] if (!grepl(pattern, name)) [18:42:19.490] next [18:42:19.490] invokeRestart(restart) [18:42:19.490] muffled <- TRUE [18:42:19.490] break [18:42:19.490] } [18:42:19.490] } [18:42:19.490] } [18:42:19.490] invisible(muffled) [18:42:19.490] } [18:42:19.490] muffleCondition(cond, pattern = "^muffle") [18:42:19.490] } [18:42:19.490] } [18:42:19.490] } [18:42:19.490] })) [18:42:19.490] }, error = function(ex) { [18:42:19.490] base::structure(base::list(value = NULL, visible = NULL, [18:42:19.490] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:19.490] ...future.rng), started = ...future.startTime, [18:42:19.490] finished = Sys.time(), session_uuid = NA_character_, [18:42:19.490] version = "1.8"), class = "FutureResult") [18:42:19.490] }, finally = { [18:42:19.490] if (!identical(...future.workdir, getwd())) [18:42:19.490] setwd(...future.workdir) [18:42:19.490] { [18:42:19.490] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:19.490] ...future.oldOptions$nwarnings <- NULL [18:42:19.490] } [18:42:19.490] base::options(...future.oldOptions) [18:42:19.490] if (.Platform$OS.type == "windows") { [18:42:19.490] old_names <- names(...future.oldEnvVars) [18:42:19.490] envs <- base::Sys.getenv() [18:42:19.490] names <- names(envs) [18:42:19.490] common <- intersect(names, old_names) [18:42:19.490] added <- setdiff(names, old_names) [18:42:19.490] removed <- setdiff(old_names, names) [18:42:19.490] changed <- common[...future.oldEnvVars[common] != [18:42:19.490] envs[common]] [18:42:19.490] NAMES <- toupper(changed) [18:42:19.490] args <- list() [18:42:19.490] for (kk in seq_along(NAMES)) { [18:42:19.490] name <- changed[[kk]] [18:42:19.490] NAME <- NAMES[[kk]] [18:42:19.490] if (name != NAME && is.element(NAME, old_names)) [18:42:19.490] next [18:42:19.490] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:19.490] } [18:42:19.490] NAMES <- toupper(added) [18:42:19.490] for (kk in seq_along(NAMES)) { [18:42:19.490] name <- added[[kk]] [18:42:19.490] NAME <- NAMES[[kk]] [18:42:19.490] if (name != NAME && is.element(NAME, old_names)) [18:42:19.490] next [18:42:19.490] args[[name]] <- "" [18:42:19.490] } [18:42:19.490] NAMES <- toupper(removed) [18:42:19.490] for (kk in seq_along(NAMES)) { [18:42:19.490] name <- removed[[kk]] [18:42:19.490] NAME <- NAMES[[kk]] [18:42:19.490] if (name != NAME && is.element(NAME, old_names)) [18:42:19.490] next [18:42:19.490] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:19.490] } [18:42:19.490] if (length(args) > 0) [18:42:19.490] base::do.call(base::Sys.setenv, args = args) [18:42:19.490] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:19.490] } [18:42:19.490] { [18:42:19.490] if (base::length(...future.futureOptionsAdded) > [18:42:19.490] 0L) { [18:42:19.490] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:19.490] base::names(opts) <- ...future.futureOptionsAdded [18:42:19.490] base::options(opts) [18:42:19.490] } [18:42:19.490] { [18:42:19.490] { [18:42:19.490] base::options(mc.cores = ...future.mc.cores.old) [18:42:19.490] NULL [18:42:19.490] } [18:42:19.490] options(future.plan = NULL) [18:42:19.490] if (is.na(NA_character_)) [18:42:19.490] Sys.unsetenv("R_FUTURE_PLAN") [18:42:19.490] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:19.490] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:19.490] .init = FALSE) [18:42:19.490] } [18:42:19.490] } [18:42:19.490] } [18:42:19.490] }) [18:42:19.490] if (TRUE) { [18:42:19.490] base::sink(type = "output", split = FALSE) [18:42:19.490] if (FALSE) { [18:42:19.490] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:19.490] } [18:42:19.490] else { [18:42:19.490] ...future.result["stdout"] <- base::list(NULL) [18:42:19.490] } [18:42:19.490] base::close(...future.stdout) [18:42:19.490] ...future.stdout <- NULL [18:42:19.490] } [18:42:19.490] ...future.result$conditions <- ...future.conditions [18:42:19.490] ...future.result$finished <- base::Sys.time() [18:42:19.490] ...future.result [18:42:19.490] } [18:42:19.496] Exporting 5 global objects (1.62 KiB) to cluster node #2 ... [18:42:19.496] Exporting '...future.FUN' (1.04 KiB) to cluster node #2 ... [18:42:19.497] Exporting '...future.FUN' (1.04 KiB) to cluster node #2 ... DONE [18:42:19.497] Exporting 'MoreArgs' (27 bytes) to cluster node #2 ... [18:42:19.497] Exporting 'MoreArgs' (27 bytes) to cluster node #2 ... DONE [18:42:19.497] Exporting '...future.elements_ii' (71 bytes) to cluster node #2 ... [18:42:19.498] Exporting '...future.elements_ii' (71 bytes) to cluster node #2 ... DONE [18:42:19.498] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... [18:42:19.498] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... DONE [18:42:19.499] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... [18:42:19.499] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... DONE [18:42:19.499] Exporting 5 global objects (1.62 KiB) to cluster node #2 ... DONE [18:42:19.500] MultisessionFuture started [18:42:19.500] - Launch lazy future ... done [18:42:19.501] run() for 'MultisessionFuture' ... done [18:42:19.501] Created future: [18:42:19.516] receiveMessageFromWorker() for ClusterFuture ... [18:42:19.516] - Validating connection of MultisessionFuture [18:42:19.517] - received message: FutureResult [18:42:19.517] - Received FutureResult [18:42:19.517] - Erased future from FutureRegistry [18:42:19.517] result() for ClusterFuture ... [18:42:19.517] - result already collected: FutureResult [18:42:19.518] result() for ClusterFuture ... done [18:42:19.518] receiveMessageFromWorker() for ClusterFuture ... done [18:42:19.501] MultisessionFuture: [18:42:19.501] Label: 'future_mapply-2' [18:42:19.501] Expression: [18:42:19.501] { [18:42:19.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:19.501] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:19.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:19.501] on.exit(options(oopts), add = TRUE) [18:42:19.501] } [18:42:19.501] { [18:42:19.501] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:19.501] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:19.501] do.call(mapply, args = args) [18:42:19.501] } [18:42:19.501] } [18:42:19.501] Lazy evaluation: FALSE [18:42:19.501] Asynchronous evaluation: TRUE [18:42:19.501] Local evaluation: TRUE [18:42:19.501] Environment: R_GlobalEnv [18:42:19.501] Capture standard output: FALSE [18:42:19.501] Capture condition classes: 'condition' (excluding 'nothing') [18:42:19.501] Globals: 5 objects totaling 1.19 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:19.501] Packages: [18:42:19.501] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:19.501] Resolved: TRUE [18:42:19.501] Value: [18:42:19.501] Conditions captured: [18:42:19.501] Early signaling: FALSE [18:42:19.501] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:19.501] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:19.518] Chunk #2 of 2 ... DONE [18:42:19.518] Launching 2 futures (chunks) ... DONE [18:42:19.519] Resolving 2 futures (chunks) ... [18:42:19.519] resolve() on list ... [18:42:19.519] recursive: 0 [18:42:19.519] length: 2 [18:42:19.519] [18:42:19.710] Future #2 [18:42:19.710] result() for ClusterFuture ... [18:42:19.710] - result already collected: FutureResult [18:42:19.710] result() for ClusterFuture ... done [18:42:19.711] result() for ClusterFuture ... [18:42:19.711] - result already collected: FutureResult [18:42:19.711] result() for ClusterFuture ... done [18:42:19.711] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:42:19.711] - nx: 2 [18:42:19.711] - relay: TRUE [18:42:19.712] - stdout: TRUE [18:42:19.712] - signal: TRUE [18:42:19.712] - resignal: FALSE [18:42:19.712] - force: TRUE [18:42:19.712] - relayed: [n=2] FALSE, FALSE [18:42:19.712] - queued futures: [n=2] FALSE, FALSE [18:42:19.713] - until=1 [18:42:19.713] - relaying element #1 [18:42:19.713] - relayed: [n=2] FALSE, FALSE [18:42:19.713] - queued futures: [n=2] FALSE, TRUE [18:42:19.713] signalConditionsASAP(NULL, pos=2) ... done [18:42:19.713] length: 1 (resolved future 2) [18:42:19.788] receiveMessageFromWorker() for ClusterFuture ... [18:42:19.788] - Validating connection of MultisessionFuture [18:42:19.789] - received message: FutureResult [18:42:19.789] - Received FutureResult [18:42:19.789] - Erased future from FutureRegistry [18:42:19.789] result() for ClusterFuture ... [18:42:19.789] - result already collected: FutureResult [18:42:19.790] result() for ClusterFuture ... done [18:42:19.790] receiveMessageFromWorker() for ClusterFuture ... done [18:42:19.790] Future #1 [18:42:19.790] result() for ClusterFuture ... [18:42:19.790] - result already collected: FutureResult [18:42:19.790] result() for ClusterFuture ... done [18:42:19.791] result() for ClusterFuture ... [18:42:19.791] - result already collected: FutureResult [18:42:19.791] result() for ClusterFuture ... done [18:42:19.791] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:42:19.791] - nx: 2 [18:42:19.791] - relay: TRUE [18:42:19.792] - stdout: TRUE [18:42:19.792] - signal: TRUE [18:42:19.792] - resignal: FALSE [18:42:19.792] - force: TRUE [18:42:19.792] - relayed: [n=2] FALSE, FALSE [18:42:19.792] - queued futures: [n=2] FALSE, TRUE [18:42:19.792] - until=1 [18:42:19.793] - relaying element #1 [18:42:19.793] result() for ClusterFuture ... [18:42:19.793] - result already collected: FutureResult [18:42:19.793] result() for ClusterFuture ... done [18:42:19.793] result() for ClusterFuture ... [18:42:19.793] - result already collected: FutureResult [18:42:19.794] result() for ClusterFuture ... done [18:42:19.794] result() for ClusterFuture ... [18:42:19.794] - result already collected: FutureResult [18:42:19.794] result() for ClusterFuture ... done [18:42:19.794] result() for ClusterFuture ... [18:42:19.794] - result already collected: FutureResult [18:42:19.794] result() for ClusterFuture ... done [18:42:19.795] - relayed: [n=2] TRUE, FALSE [18:42:19.795] - queued futures: [n=2] TRUE, TRUE [18:42:19.795] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:42:19.795] length: 0 (resolved future 1) [18:42:19.795] Relaying remaining futures [18:42:19.795] signalConditionsASAP(NULL, pos=0) ... [18:42:19.796] - nx: 2 [18:42:19.796] - relay: TRUE [18:42:19.796] - stdout: TRUE [18:42:19.796] - signal: TRUE [18:42:19.796] - resignal: FALSE [18:42:19.796] - force: TRUE [18:42:19.797] - relayed: [n=2] TRUE, FALSE [18:42:19.797] - queued futures: [n=2] TRUE, TRUE - flush all [18:42:19.797] - relaying element #2 [18:42:19.797] result() for ClusterFuture ... [18:42:19.797] - result already collected: FutureResult [18:42:19.797] result() for ClusterFuture ... done [18:42:19.798] result() for ClusterFuture ... [18:42:19.798] - result already collected: FutureResult [18:42:19.798] result() for ClusterFuture ... done [18:42:19.798] result() for ClusterFuture ... [18:42:19.798] - result already collected: FutureResult [18:42:19.798] result() for ClusterFuture ... done [18:42:19.799] result() for ClusterFuture ... [18:42:19.799] - result already collected: FutureResult [18:42:19.799] result() for ClusterFuture ... done [18:42:19.799] - relayed: [n=2] TRUE, TRUE [18:42:19.799] - queued futures: [n=2] TRUE, TRUE [18:42:19.799] signalConditionsASAP(MultisessionFuture, pos=0) ... done [18:42:19.799] resolve() on list ... DONE [18:42:19.800] result() for ClusterFuture ... [18:42:19.800] - result already collected: FutureResult [18:42:19.800] result() for ClusterFuture ... done [18:42:19.800] result() for ClusterFuture ... [18:42:19.800] - result already collected: FutureResult [18:42:19.800] result() for ClusterFuture ... done [18:42:19.801] result() for ClusterFuture ... [18:42:19.801] - result already collected: FutureResult [18:42:19.801] result() for ClusterFuture ... done [18:42:19.801] result() for ClusterFuture ... [18:42:19.801] - result already collected: FutureResult [18:42:19.801] result() for ClusterFuture ... done [18:42:19.802] - Number of value chunks collected: 2 [18:42:19.802] Resolving 2 futures (chunks) ... DONE [18:42:19.802] Reducing values from 2 chunks ... [18:42:19.802] - Number of values collected after concatenation: 2 [18:42:19.802] - Number of values expected: 2 [18:42:19.802] Reducing values from 2 chunks ... DONE [18:42:19.803] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = FALSE) ... DONE * future_mapply(x, ..., future.stdout = TRUE) ... [18:42:19.803] future_mapply() ... [18:42:19.806] Number of chunks: 2 [18:42:19.806] getGlobalsAndPackagesXApply() ... [18:42:19.806] - future.globals: TRUE [18:42:19.806] getGlobalsAndPackages() ... [18:42:19.807] Searching for globals... [18:42:19.809] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:19.809] Searching for globals ... DONE [18:42:19.809] Resolving globals: FALSE [18:42:19.810] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:19.810] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:19.810] - globals: [1] 'FUN' [18:42:19.811] [18:42:19.811] getGlobalsAndPackages() ... DONE [18:42:19.811] - globals found/used: [n=1] 'FUN' [18:42:19.811] - needed namespaces: [n=0] [18:42:19.811] Finding globals ... DONE [18:42:19.811] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:19.812] List of 2 [18:42:19.812] $ ...future.FUN:function (x, y) [18:42:19.812] $ MoreArgs : NULL [18:42:19.812] - attr(*, "where")=List of 2 [18:42:19.812] ..$ ...future.FUN: [18:42:19.812] ..$ MoreArgs : [18:42:19.812] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:19.812] - attr(*, "resolved")= logi FALSE [18:42:19.812] - attr(*, "total_size")= num NA [18:42:19.815] Packages to be attached in all futures: [n=0] [18:42:19.815] getGlobalsAndPackagesXApply() ... DONE [18:42:19.815] Number of futures (= number of chunks): 2 [18:42:19.816] Launching 2 futures (chunks) ... [18:42:19.816] Chunk #1 of 2 ... [18:42:19.816] - Finding globals in '...' for chunk #1 ... [18:42:19.816] getGlobalsAndPackages() ... [18:42:19.816] Searching for globals... [18:42:19.817] [18:42:19.817] Searching for globals ... DONE [18:42:19.817] - globals: [0] [18:42:19.817] getGlobalsAndPackages() ... DONE [18:42:19.817] + additional globals found: [n=0] [18:42:19.817] + additional namespaces needed: [n=0] [18:42:19.818] - Finding globals in '...' for chunk #1 ... DONE [18:42:19.818] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:19.818] - seeds: [18:42:19.818] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.818] getGlobalsAndPackages() ... [18:42:19.818] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.819] Resolving globals: FALSE [18:42:19.819] The total size of the 5 globals is 1.19 KiB (1218 bytes) [18:42:19.820] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.19 KiB.. This exceeds the maximum allowed size of 0.98 GiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (71 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:19.820] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:19.820] [18:42:19.820] getGlobalsAndPackages() ... DONE [18:42:19.821] run() for 'Future' ... [18:42:19.821] - state: 'created' [18:42:19.821] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:19.838] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:19.838] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:19.838] - Field: 'node' [18:42:19.839] - Field: 'label' [18:42:19.839] - Field: 'local' [18:42:19.839] - Field: 'owner' [18:42:19.839] - Field: 'envir' [18:42:19.839] - Field: 'workers' [18:42:19.840] - Field: 'packages' [18:42:19.840] - Field: 'gc' [18:42:19.840] - Field: 'conditions' [18:42:19.840] - Field: 'persistent' [18:42:19.840] - Field: 'expr' [18:42:19.841] - Field: 'uuid' [18:42:19.841] - Field: 'seed' [18:42:19.841] - Field: 'version' [18:42:19.841] - Field: 'result' [18:42:19.841] - Field: 'asynchronous' [18:42:19.841] - Field: 'calls' [18:42:19.842] - Field: 'globals' [18:42:19.842] - Field: 'stdout' [18:42:19.842] - Field: 'earlySignal' [18:42:19.842] - Field: 'lazy' [18:42:19.842] - Field: 'state' [18:42:19.842] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:19.843] - Launch lazy future ... [18:42:19.843] Packages needed by the future expression (n = 0): [18:42:19.843] Packages needed by future strategies (n = 0): [18:42:19.844] { [18:42:19.844] { [18:42:19.844] { [18:42:19.844] ...future.startTime <- base::Sys.time() [18:42:19.844] { [18:42:19.844] { [18:42:19.844] { [18:42:19.844] { [18:42:19.844] base::local({ [18:42:19.844] has_future <- base::requireNamespace("future", [18:42:19.844] quietly = TRUE) [18:42:19.844] if (has_future) { [18:42:19.844] ns <- base::getNamespace("future") [18:42:19.844] version <- ns[[".package"]][["version"]] [18:42:19.844] if (is.null(version)) [18:42:19.844] version <- utils::packageVersion("future") [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] version <- NULL [18:42:19.844] } [18:42:19.844] if (!has_future || version < "1.8.0") { [18:42:19.844] info <- base::c(r_version = base::gsub("R version ", [18:42:19.844] "", base::R.version$version.string), [18:42:19.844] platform = base::sprintf("%s (%s-bit)", [18:42:19.844] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:19.844] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:19.844] "release", "version")], collapse = " "), [18:42:19.844] hostname = base::Sys.info()[["nodename"]]) [18:42:19.844] info <- base::sprintf("%s: %s", base::names(info), [18:42:19.844] info) [18:42:19.844] info <- base::paste(info, collapse = "; ") [18:42:19.844] if (!has_future) { [18:42:19.844] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:19.844] info) [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:19.844] info, version) [18:42:19.844] } [18:42:19.844] base::stop(msg) [18:42:19.844] } [18:42:19.844] }) [18:42:19.844] } [18:42:19.844] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:19.844] base::options(mc.cores = 1L) [18:42:19.844] } [18:42:19.844] ...future.strategy.old <- future::plan("list") [18:42:19.844] options(future.plan = NULL) [18:42:19.844] Sys.unsetenv("R_FUTURE_PLAN") [18:42:19.844] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:19.844] } [18:42:19.844] ...future.workdir <- getwd() [18:42:19.844] } [18:42:19.844] ...future.oldOptions <- base::as.list(base::.Options) [18:42:19.844] ...future.oldEnvVars <- base::Sys.getenv() [18:42:19.844] } [18:42:19.844] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:19.844] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:19.844] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:19.844] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:19.844] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:19.844] future.stdout.windows.reencode = NULL, width = 80L) [18:42:19.844] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:19.844] base::names(...future.oldOptions)) [18:42:19.844] } [18:42:19.844] if (FALSE) { [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] if (TRUE) { [18:42:19.844] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:19.844] open = "w") [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:19.844] windows = "NUL", "/dev/null"), open = "w") [18:42:19.844] } [18:42:19.844] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:19.844] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:19.844] base::sink(type = "output", split = FALSE) [18:42:19.844] base::close(...future.stdout) [18:42:19.844] }, add = TRUE) [18:42:19.844] } [18:42:19.844] ...future.frame <- base::sys.nframe() [18:42:19.844] ...future.conditions <- base::list() [18:42:19.844] ...future.rng <- base::globalenv()$.Random.seed [18:42:19.844] if (FALSE) { [18:42:19.844] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:19.844] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:19.844] } [18:42:19.844] ...future.result <- base::tryCatch({ [18:42:19.844] base::withCallingHandlers({ [18:42:19.844] ...future.value <- base::withVisible(base::local({ [18:42:19.844] ...future.makeSendCondition <- base::local({ [18:42:19.844] sendCondition <- NULL [18:42:19.844] function(frame = 1L) { [18:42:19.844] if (is.function(sendCondition)) [18:42:19.844] return(sendCondition) [18:42:19.844] ns <- getNamespace("parallel") [18:42:19.844] if (exists("sendData", mode = "function", [18:42:19.844] envir = ns)) { [18:42:19.844] parallel_sendData <- get("sendData", mode = "function", [18:42:19.844] envir = ns) [18:42:19.844] envir <- sys.frame(frame) [18:42:19.844] master <- NULL [18:42:19.844] while (!identical(envir, .GlobalEnv) && [18:42:19.844] !identical(envir, emptyenv())) { [18:42:19.844] if (exists("master", mode = "list", envir = envir, [18:42:19.844] inherits = FALSE)) { [18:42:19.844] master <- get("master", mode = "list", [18:42:19.844] envir = envir, inherits = FALSE) [18:42:19.844] if (inherits(master, c("SOCKnode", [18:42:19.844] "SOCK0node"))) { [18:42:19.844] sendCondition <<- function(cond) { [18:42:19.844] data <- list(type = "VALUE", value = cond, [18:42:19.844] success = TRUE) [18:42:19.844] parallel_sendData(master, data) [18:42:19.844] } [18:42:19.844] return(sendCondition) [18:42:19.844] } [18:42:19.844] } [18:42:19.844] frame <- frame + 1L [18:42:19.844] envir <- sys.frame(frame) [18:42:19.844] } [18:42:19.844] } [18:42:19.844] sendCondition <<- function(cond) NULL [18:42:19.844] } [18:42:19.844] }) [18:42:19.844] withCallingHandlers({ [18:42:19.844] { [18:42:19.844] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:19.844] if (!identical(...future.globals.maxSize.org, [18:42:19.844] ...future.globals.maxSize)) { [18:42:19.844] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:19.844] on.exit(options(oopts), add = TRUE) [18:42:19.844] } [18:42:19.844] { [18:42:19.844] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:19.844] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:19.844] USE.NAMES = FALSE) [18:42:19.844] do.call(mapply, args = args) [18:42:19.844] } [18:42:19.844] } [18:42:19.844] }, immediateCondition = function(cond) { [18:42:19.844] sendCondition <- ...future.makeSendCondition() [18:42:19.844] sendCondition(cond) [18:42:19.844] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.844] { [18:42:19.844] inherits <- base::inherits [18:42:19.844] invokeRestart <- base::invokeRestart [18:42:19.844] is.null <- base::is.null [18:42:19.844] muffled <- FALSE [18:42:19.844] if (inherits(cond, "message")) { [18:42:19.844] muffled <- grepl(pattern, "muffleMessage") [18:42:19.844] if (muffled) [18:42:19.844] invokeRestart("muffleMessage") [18:42:19.844] } [18:42:19.844] else if (inherits(cond, "warning")) { [18:42:19.844] muffled <- grepl(pattern, "muffleWarning") [18:42:19.844] if (muffled) [18:42:19.844] invokeRestart("muffleWarning") [18:42:19.844] } [18:42:19.844] else if (inherits(cond, "condition")) { [18:42:19.844] if (!is.null(pattern)) { [18:42:19.844] computeRestarts <- base::computeRestarts [18:42:19.844] grepl <- base::grepl [18:42:19.844] restarts <- computeRestarts(cond) [18:42:19.844] for (restart in restarts) { [18:42:19.844] name <- restart$name [18:42:19.844] if (is.null(name)) [18:42:19.844] next [18:42:19.844] if (!grepl(pattern, name)) [18:42:19.844] next [18:42:19.844] invokeRestart(restart) [18:42:19.844] muffled <- TRUE [18:42:19.844] break [18:42:19.844] } [18:42:19.844] } [18:42:19.844] } [18:42:19.844] invisible(muffled) [18:42:19.844] } [18:42:19.844] muffleCondition(cond) [18:42:19.844] }) [18:42:19.844] })) [18:42:19.844] future::FutureResult(value = ...future.value$value, [18:42:19.844] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:19.844] ...future.rng), globalenv = if (FALSE) [18:42:19.844] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:19.844] ...future.globalenv.names)) [18:42:19.844] else NULL, started = ...future.startTime, version = "1.8") [18:42:19.844] }, condition = base::local({ [18:42:19.844] c <- base::c [18:42:19.844] inherits <- base::inherits [18:42:19.844] invokeRestart <- base::invokeRestart [18:42:19.844] length <- base::length [18:42:19.844] list <- base::list [18:42:19.844] seq.int <- base::seq.int [18:42:19.844] signalCondition <- base::signalCondition [18:42:19.844] sys.calls <- base::sys.calls [18:42:19.844] `[[` <- base::`[[` [18:42:19.844] `+` <- base::`+` [18:42:19.844] `<<-` <- base::`<<-` [18:42:19.844] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:19.844] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:19.844] 3L)] [18:42:19.844] } [18:42:19.844] function(cond) { [18:42:19.844] is_error <- inherits(cond, "error") [18:42:19.844] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:19.844] NULL) [18:42:19.844] if (is_error) { [18:42:19.844] sessionInformation <- function() { [18:42:19.844] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:19.844] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:19.844] search = base::search(), system = base::Sys.info()) [18:42:19.844] } [18:42:19.844] ...future.conditions[[length(...future.conditions) + [18:42:19.844] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:19.844] cond$call), session = sessionInformation(), [18:42:19.844] timestamp = base::Sys.time(), signaled = 0L) [18:42:19.844] signalCondition(cond) [18:42:19.844] } [18:42:19.844] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:19.844] "immediateCondition"))) { [18:42:19.844] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:19.844] ...future.conditions[[length(...future.conditions) + [18:42:19.844] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:19.844] if (TRUE && !signal) { [18:42:19.844] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.844] { [18:42:19.844] inherits <- base::inherits [18:42:19.844] invokeRestart <- base::invokeRestart [18:42:19.844] is.null <- base::is.null [18:42:19.844] muffled <- FALSE [18:42:19.844] if (inherits(cond, "message")) { [18:42:19.844] muffled <- grepl(pattern, "muffleMessage") [18:42:19.844] if (muffled) [18:42:19.844] invokeRestart("muffleMessage") [18:42:19.844] } [18:42:19.844] else if (inherits(cond, "warning")) { [18:42:19.844] muffled <- grepl(pattern, "muffleWarning") [18:42:19.844] if (muffled) [18:42:19.844] invokeRestart("muffleWarning") [18:42:19.844] } [18:42:19.844] else if (inherits(cond, "condition")) { [18:42:19.844] if (!is.null(pattern)) { [18:42:19.844] computeRestarts <- base::computeRestarts [18:42:19.844] grepl <- base::grepl [18:42:19.844] restarts <- computeRestarts(cond) [18:42:19.844] for (restart in restarts) { [18:42:19.844] name <- restart$name [18:42:19.844] if (is.null(name)) [18:42:19.844] next [18:42:19.844] if (!grepl(pattern, name)) [18:42:19.844] next [18:42:19.844] invokeRestart(restart) [18:42:19.844] muffled <- TRUE [18:42:19.844] break [18:42:19.844] } [18:42:19.844] } [18:42:19.844] } [18:42:19.844] invisible(muffled) [18:42:19.844] } [18:42:19.844] muffleCondition(cond, pattern = "^muffle") [18:42:19.844] } [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] if (TRUE) { [18:42:19.844] muffleCondition <- function (cond, pattern = "^muffle") [18:42:19.844] { [18:42:19.844] inherits <- base::inherits [18:42:19.844] invokeRestart <- base::invokeRestart [18:42:19.844] is.null <- base::is.null [18:42:19.844] muffled <- FALSE [18:42:19.844] if (inherits(cond, "message")) { [18:42:19.844] muffled <- grepl(pattern, "muffleMessage") [18:42:19.844] if (muffled) [18:42:19.844] invokeRestart("muffleMessage") [18:42:19.844] } [18:42:19.844] else if (inherits(cond, "warning")) { [18:42:19.844] muffled <- grepl(pattern, "muffleWarning") [18:42:19.844] if (muffled) [18:42:19.844] invokeRestart("muffleWarning") [18:42:19.844] } [18:42:19.844] else if (inherits(cond, "condition")) { [18:42:19.844] if (!is.null(pattern)) { [18:42:19.844] computeRestarts <- base::computeRestarts [18:42:19.844] grepl <- base::grepl [18:42:19.844] restarts <- computeRestarts(cond) [18:42:19.844] for (restart in restarts) { [18:42:19.844] name <- restart$name [18:42:19.844] if (is.null(name)) [18:42:19.844] next [18:42:19.844] if (!grepl(pattern, name)) [18:42:19.844] next [18:42:19.844] invokeRestart(restart) [18:42:19.844] muffled <- TRUE [18:42:19.844] break [18:42:19.844] } [18:42:19.844] } [18:42:19.844] } [18:42:19.844] invisible(muffled) [18:42:19.844] } [18:42:19.844] muffleCondition(cond, pattern = "^muffle") [18:42:19.844] } [18:42:19.844] } [18:42:19.844] } [18:42:19.844] })) [18:42:19.844] }, error = function(ex) { [18:42:19.844] base::structure(base::list(value = NULL, visible = NULL, [18:42:19.844] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:19.844] ...future.rng), started = ...future.startTime, [18:42:19.844] finished = Sys.time(), session_uuid = NA_character_, [18:42:19.844] version = "1.8"), class = "FutureResult") [18:42:19.844] }, finally = { [18:42:19.844] if (!identical(...future.workdir, getwd())) [18:42:19.844] setwd(...future.workdir) [18:42:19.844] { [18:42:19.844] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:19.844] ...future.oldOptions$nwarnings <- NULL [18:42:19.844] } [18:42:19.844] base::options(...future.oldOptions) [18:42:19.844] if (.Platform$OS.type == "windows") { [18:42:19.844] old_names <- names(...future.oldEnvVars) [18:42:19.844] envs <- base::Sys.getenv() [18:42:19.844] names <- names(envs) [18:42:19.844] common <- intersect(names, old_names) [18:42:19.844] added <- setdiff(names, old_names) [18:42:19.844] removed <- setdiff(old_names, names) [18:42:19.844] changed <- common[...future.oldEnvVars[common] != [18:42:19.844] envs[common]] [18:42:19.844] NAMES <- toupper(changed) [18:42:19.844] args <- list() [18:42:19.844] for (kk in seq_along(NAMES)) { [18:42:19.844] name <- changed[[kk]] [18:42:19.844] NAME <- NAMES[[kk]] [18:42:19.844] if (name != NAME && is.element(NAME, old_names)) [18:42:19.844] next [18:42:19.844] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:19.844] } [18:42:19.844] NAMES <- toupper(added) [18:42:19.844] for (kk in seq_along(NAMES)) { [18:42:19.844] name <- added[[kk]] [18:42:19.844] NAME <- NAMES[[kk]] [18:42:19.844] if (name != NAME && is.element(NAME, old_names)) [18:42:19.844] next [18:42:19.844] args[[name]] <- "" [18:42:19.844] } [18:42:19.844] NAMES <- toupper(removed) [18:42:19.844] for (kk in seq_along(NAMES)) { [18:42:19.844] name <- removed[[kk]] [18:42:19.844] NAME <- NAMES[[kk]] [18:42:19.844] if (name != NAME && is.element(NAME, old_names)) [18:42:19.844] next [18:42:19.844] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:19.844] } [18:42:19.844] if (length(args) > 0) [18:42:19.844] base::do.call(base::Sys.setenv, args = args) [18:42:19.844] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:19.844] } [18:42:19.844] { [18:42:19.844] if (base::length(...future.futureOptionsAdded) > [18:42:19.844] 0L) { [18:42:19.844] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:19.844] base::names(opts) <- ...future.futureOptionsAdded [18:42:19.844] base::options(opts) [18:42:19.844] } [18:42:19.844] { [18:42:19.844] { [18:42:19.844] base::options(mc.cores = ...future.mc.cores.old) [18:42:19.844] NULL [18:42:19.844] } [18:42:19.844] options(future.plan = NULL) [18:42:19.844] if (is.na(NA_character_)) [18:42:19.844] Sys.unsetenv("R_FUTURE_PLAN") [18:42:19.844] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:19.844] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:19.844] .init = FALSE) [18:42:19.844] } [18:42:19.844] } [18:42:19.844] } [18:42:19.844] }) [18:42:19.844] if (TRUE) { [18:42:19.844] base::sink(type = "output", split = FALSE) [18:42:19.844] if (TRUE) { [18:42:19.844] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:19.844] } [18:42:19.844] else { [18:42:19.844] ...future.result["stdout"] <- base::list(NULL) [18:42:19.844] } [18:42:19.844] base::close(...future.stdout) [18:42:19.844] ...future.stdout <- NULL [18:42:19.844] } [18:42:19.844] ...future.result$conditions <- ...future.conditions [18:42:19.844] ...future.result$finished <- base::Sys.time() [18:42:19.844] ...future.result [18:42:19.844] } [18:42:19.849] Exporting 5 global objects (1.62 KiB) to cluster node #1 ... [18:42:19.849] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... [18:42:19.850] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... DONE [18:42:19.850] Exporting 'MoreArgs' (27 bytes) to cluster node #1 ... [18:42:19.851] Exporting 'MoreArgs' (27 bytes) to cluster node #1 ... DONE [18:42:19.852] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:42:19.852] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:42:19.853] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:42:19.853] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:42:19.853] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:42:19.854] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:42:19.854] Exporting 5 global objects (1.62 KiB) to cluster node #1 ... DONE [18:42:19.854] MultisessionFuture started [18:42:19.855] - Launch lazy future ... done [18:42:19.855] run() for 'MultisessionFuture' ... done [18:42:19.855] Created future: [18:42:19.855] MultisessionFuture: [18:42:19.855] Label: 'future_mapply-1' [18:42:19.855] Expression: [18:42:19.855] { [18:42:19.855] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:19.855] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:19.855] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:19.855] on.exit(options(oopts), add = TRUE) [18:42:19.855] } [18:42:19.855] { [18:42:19.855] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:19.855] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:19.855] do.call(mapply, args = args) [18:42:19.855] } [18:42:19.855] } [18:42:19.855] Lazy evaluation: FALSE [18:42:19.855] Asynchronous evaluation: TRUE [18:42:19.855] Local evaluation: TRUE [18:42:19.855] Environment: R_GlobalEnv [18:42:19.855] Capture standard output: TRUE [18:42:19.855] Capture condition classes: 'condition' (excluding 'nothing') [18:42:19.855] Globals: 5 objects totaling 1.19 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:19.855] Packages: [18:42:19.855] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:19.855] Resolved: FALSE [18:42:19.855] Value: [18:42:19.855] Conditions captured: [18:42:19.855] Early signaling: FALSE [18:42:19.855] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:19.855] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.054] Chunk #1 of 2 ... DONE [18:42:20.054] Chunk #2 of 2 ... [18:42:20.055] - Finding globals in '...' for chunk #2 ... [18:42:20.055] getGlobalsAndPackages() ... [18:42:20.055] Searching for globals... [18:42:20.056] [18:42:20.057] Searching for globals ... DONE [18:42:20.057] - globals: [0] [18:42:20.057] getGlobalsAndPackages() ... DONE [18:42:20.057] + additional globals found: [n=0] [18:42:20.058] + additional namespaces needed: [n=0] [18:42:20.058] - Finding globals in '...' for chunk #2 ... DONE [18:42:20.058] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:20.059] - seeds: [18:42:20.059] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.059] getGlobalsAndPackages() ... [18:42:20.060] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.060] Resolving globals: FALSE [18:42:20.061] The total size of the 5 globals is 1.19 KiB (1218 bytes) [18:42:20.062] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.19 KiB.. This exceeds the maximum allowed size of 0.98 GiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (71 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:20.062] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.063] [18:42:20.063] getGlobalsAndPackages() ... DONE [18:42:20.064] run() for 'Future' ... [18:42:20.064] - state: 'created' [18:42:20.064] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:20.093] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.094] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:20.094] - Field: 'node' [18:42:20.095] - Field: 'label' [18:42:20.095] - Field: 'local' [18:42:20.095] - Field: 'owner' [18:42:20.096] - Field: 'envir' [18:42:20.096] - Field: 'workers' [18:42:20.096] - Field: 'packages' [18:42:20.097] - Field: 'gc' [18:42:20.097] - Field: 'conditions' [18:42:20.097] - Field: 'persistent' [18:42:20.098] - Field: 'expr' [18:42:20.098] - Field: 'uuid' [18:42:20.098] - Field: 'seed' [18:42:20.098] - Field: 'version' [18:42:20.099] - Field: 'result' [18:42:20.099] - Field: 'asynchronous' [18:42:20.099] - Field: 'calls' [18:42:20.100] - Field: 'globals' [18:42:20.100] - Field: 'stdout' [18:42:20.100] - Field: 'earlySignal' [18:42:20.101] - Field: 'lazy' [18:42:20.101] - Field: 'state' [18:42:20.101] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:20.102] - Launch lazy future ... [18:42:20.102] Packages needed by the future expression (n = 0): [18:42:20.103] Packages needed by future strategies (n = 0): [18:42:20.104] { [18:42:20.104] { [18:42:20.104] { [18:42:20.104] ...future.startTime <- base::Sys.time() [18:42:20.104] { [18:42:20.104] { [18:42:20.104] { [18:42:20.104] { [18:42:20.104] base::local({ [18:42:20.104] has_future <- base::requireNamespace("future", [18:42:20.104] quietly = TRUE) [18:42:20.104] if (has_future) { [18:42:20.104] ns <- base::getNamespace("future") [18:42:20.104] version <- ns[[".package"]][["version"]] [18:42:20.104] if (is.null(version)) [18:42:20.104] version <- utils::packageVersion("future") [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] version <- NULL [18:42:20.104] } [18:42:20.104] if (!has_future || version < "1.8.0") { [18:42:20.104] info <- base::c(r_version = base::gsub("R version ", [18:42:20.104] "", base::R.version$version.string), [18:42:20.104] platform = base::sprintf("%s (%s-bit)", [18:42:20.104] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:20.104] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:20.104] "release", "version")], collapse = " "), [18:42:20.104] hostname = base::Sys.info()[["nodename"]]) [18:42:20.104] info <- base::sprintf("%s: %s", base::names(info), [18:42:20.104] info) [18:42:20.104] info <- base::paste(info, collapse = "; ") [18:42:20.104] if (!has_future) { [18:42:20.104] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:20.104] info) [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:20.104] info, version) [18:42:20.104] } [18:42:20.104] base::stop(msg) [18:42:20.104] } [18:42:20.104] }) [18:42:20.104] } [18:42:20.104] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:20.104] base::options(mc.cores = 1L) [18:42:20.104] } [18:42:20.104] ...future.strategy.old <- future::plan("list") [18:42:20.104] options(future.plan = NULL) [18:42:20.104] Sys.unsetenv("R_FUTURE_PLAN") [18:42:20.104] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:20.104] } [18:42:20.104] ...future.workdir <- getwd() [18:42:20.104] } [18:42:20.104] ...future.oldOptions <- base::as.list(base::.Options) [18:42:20.104] ...future.oldEnvVars <- base::Sys.getenv() [18:42:20.104] } [18:42:20.104] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:20.104] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:20.104] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:20.104] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:20.104] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:20.104] future.stdout.windows.reencode = NULL, width = 80L) [18:42:20.104] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:20.104] base::names(...future.oldOptions)) [18:42:20.104] } [18:42:20.104] if (FALSE) { [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] if (TRUE) { [18:42:20.104] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:20.104] open = "w") [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:20.104] windows = "NUL", "/dev/null"), open = "w") [18:42:20.104] } [18:42:20.104] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:20.104] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:20.104] base::sink(type = "output", split = FALSE) [18:42:20.104] base::close(...future.stdout) [18:42:20.104] }, add = TRUE) [18:42:20.104] } [18:42:20.104] ...future.frame <- base::sys.nframe() [18:42:20.104] ...future.conditions <- base::list() [18:42:20.104] ...future.rng <- base::globalenv()$.Random.seed [18:42:20.104] if (FALSE) { [18:42:20.104] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:20.104] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:20.104] } [18:42:20.104] ...future.result <- base::tryCatch({ [18:42:20.104] base::withCallingHandlers({ [18:42:20.104] ...future.value <- base::withVisible(base::local({ [18:42:20.104] ...future.makeSendCondition <- base::local({ [18:42:20.104] sendCondition <- NULL [18:42:20.104] function(frame = 1L) { [18:42:20.104] if (is.function(sendCondition)) [18:42:20.104] return(sendCondition) [18:42:20.104] ns <- getNamespace("parallel") [18:42:20.104] if (exists("sendData", mode = "function", [18:42:20.104] envir = ns)) { [18:42:20.104] parallel_sendData <- get("sendData", mode = "function", [18:42:20.104] envir = ns) [18:42:20.104] envir <- sys.frame(frame) [18:42:20.104] master <- NULL [18:42:20.104] while (!identical(envir, .GlobalEnv) && [18:42:20.104] !identical(envir, emptyenv())) { [18:42:20.104] if (exists("master", mode = "list", envir = envir, [18:42:20.104] inherits = FALSE)) { [18:42:20.104] master <- get("master", mode = "list", [18:42:20.104] envir = envir, inherits = FALSE) [18:42:20.104] if (inherits(master, c("SOCKnode", [18:42:20.104] "SOCK0node"))) { [18:42:20.104] sendCondition <<- function(cond) { [18:42:20.104] data <- list(type = "VALUE", value = cond, [18:42:20.104] success = TRUE) [18:42:20.104] parallel_sendData(master, data) [18:42:20.104] } [18:42:20.104] return(sendCondition) [18:42:20.104] } [18:42:20.104] } [18:42:20.104] frame <- frame + 1L [18:42:20.104] envir <- sys.frame(frame) [18:42:20.104] } [18:42:20.104] } [18:42:20.104] sendCondition <<- function(cond) NULL [18:42:20.104] } [18:42:20.104] }) [18:42:20.104] withCallingHandlers({ [18:42:20.104] { [18:42:20.104] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:20.104] if (!identical(...future.globals.maxSize.org, [18:42:20.104] ...future.globals.maxSize)) { [18:42:20.104] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:20.104] on.exit(options(oopts), add = TRUE) [18:42:20.104] } [18:42:20.104] { [18:42:20.104] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:20.104] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:20.104] USE.NAMES = FALSE) [18:42:20.104] do.call(mapply, args = args) [18:42:20.104] } [18:42:20.104] } [18:42:20.104] }, immediateCondition = function(cond) { [18:42:20.104] sendCondition <- ...future.makeSendCondition() [18:42:20.104] sendCondition(cond) [18:42:20.104] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.104] { [18:42:20.104] inherits <- base::inherits [18:42:20.104] invokeRestart <- base::invokeRestart [18:42:20.104] is.null <- base::is.null [18:42:20.104] muffled <- FALSE [18:42:20.104] if (inherits(cond, "message")) { [18:42:20.104] muffled <- grepl(pattern, "muffleMessage") [18:42:20.104] if (muffled) [18:42:20.104] invokeRestart("muffleMessage") [18:42:20.104] } [18:42:20.104] else if (inherits(cond, "warning")) { [18:42:20.104] muffled <- grepl(pattern, "muffleWarning") [18:42:20.104] if (muffled) [18:42:20.104] invokeRestart("muffleWarning") [18:42:20.104] } [18:42:20.104] else if (inherits(cond, "condition")) { [18:42:20.104] if (!is.null(pattern)) { [18:42:20.104] computeRestarts <- base::computeRestarts [18:42:20.104] grepl <- base::grepl [18:42:20.104] restarts <- computeRestarts(cond) [18:42:20.104] for (restart in restarts) { [18:42:20.104] name <- restart$name [18:42:20.104] if (is.null(name)) [18:42:20.104] next [18:42:20.104] if (!grepl(pattern, name)) [18:42:20.104] next [18:42:20.104] invokeRestart(restart) [18:42:20.104] muffled <- TRUE [18:42:20.104] break [18:42:20.104] } [18:42:20.104] } [18:42:20.104] } [18:42:20.104] invisible(muffled) [18:42:20.104] } [18:42:20.104] muffleCondition(cond) [18:42:20.104] }) [18:42:20.104] })) [18:42:20.104] future::FutureResult(value = ...future.value$value, [18:42:20.104] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:20.104] ...future.rng), globalenv = if (FALSE) [18:42:20.104] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:20.104] ...future.globalenv.names)) [18:42:20.104] else NULL, started = ...future.startTime, version = "1.8") [18:42:20.104] }, condition = base::local({ [18:42:20.104] c <- base::c [18:42:20.104] inherits <- base::inherits [18:42:20.104] invokeRestart <- base::invokeRestart [18:42:20.104] length <- base::length [18:42:20.104] list <- base::list [18:42:20.104] seq.int <- base::seq.int [18:42:20.104] signalCondition <- base::signalCondition [18:42:20.104] sys.calls <- base::sys.calls [18:42:20.104] `[[` <- base::`[[` [18:42:20.104] `+` <- base::`+` [18:42:20.104] `<<-` <- base::`<<-` [18:42:20.104] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:20.104] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:20.104] 3L)] [18:42:20.104] } [18:42:20.104] function(cond) { [18:42:20.104] is_error <- inherits(cond, "error") [18:42:20.104] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:20.104] NULL) [18:42:20.104] if (is_error) { [18:42:20.104] sessionInformation <- function() { [18:42:20.104] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:20.104] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:20.104] search = base::search(), system = base::Sys.info()) [18:42:20.104] } [18:42:20.104] ...future.conditions[[length(...future.conditions) + [18:42:20.104] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:20.104] cond$call), session = sessionInformation(), [18:42:20.104] timestamp = base::Sys.time(), signaled = 0L) [18:42:20.104] signalCondition(cond) [18:42:20.104] } [18:42:20.104] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:20.104] "immediateCondition"))) { [18:42:20.104] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:20.104] ...future.conditions[[length(...future.conditions) + [18:42:20.104] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:20.104] if (TRUE && !signal) { [18:42:20.104] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.104] { [18:42:20.104] inherits <- base::inherits [18:42:20.104] invokeRestart <- base::invokeRestart [18:42:20.104] is.null <- base::is.null [18:42:20.104] muffled <- FALSE [18:42:20.104] if (inherits(cond, "message")) { [18:42:20.104] muffled <- grepl(pattern, "muffleMessage") [18:42:20.104] if (muffled) [18:42:20.104] invokeRestart("muffleMessage") [18:42:20.104] } [18:42:20.104] else if (inherits(cond, "warning")) { [18:42:20.104] muffled <- grepl(pattern, "muffleWarning") [18:42:20.104] if (muffled) [18:42:20.104] invokeRestart("muffleWarning") [18:42:20.104] } [18:42:20.104] else if (inherits(cond, "condition")) { [18:42:20.104] if (!is.null(pattern)) { [18:42:20.104] computeRestarts <- base::computeRestarts [18:42:20.104] grepl <- base::grepl [18:42:20.104] restarts <- computeRestarts(cond) [18:42:20.104] for (restart in restarts) { [18:42:20.104] name <- restart$name [18:42:20.104] if (is.null(name)) [18:42:20.104] next [18:42:20.104] if (!grepl(pattern, name)) [18:42:20.104] next [18:42:20.104] invokeRestart(restart) [18:42:20.104] muffled <- TRUE [18:42:20.104] break [18:42:20.104] } [18:42:20.104] } [18:42:20.104] } [18:42:20.104] invisible(muffled) [18:42:20.104] } [18:42:20.104] muffleCondition(cond, pattern = "^muffle") [18:42:20.104] } [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] if (TRUE) { [18:42:20.104] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.104] { [18:42:20.104] inherits <- base::inherits [18:42:20.104] invokeRestart <- base::invokeRestart [18:42:20.104] is.null <- base::is.null [18:42:20.104] muffled <- FALSE [18:42:20.104] if (inherits(cond, "message")) { [18:42:20.104] muffled <- grepl(pattern, "muffleMessage") [18:42:20.104] if (muffled) [18:42:20.104] invokeRestart("muffleMessage") [18:42:20.104] } [18:42:20.104] else if (inherits(cond, "warning")) { [18:42:20.104] muffled <- grepl(pattern, "muffleWarning") [18:42:20.104] if (muffled) [18:42:20.104] invokeRestart("muffleWarning") [18:42:20.104] } [18:42:20.104] else if (inherits(cond, "condition")) { [18:42:20.104] if (!is.null(pattern)) { [18:42:20.104] computeRestarts <- base::computeRestarts [18:42:20.104] grepl <- base::grepl [18:42:20.104] restarts <- computeRestarts(cond) [18:42:20.104] for (restart in restarts) { [18:42:20.104] name <- restart$name [18:42:20.104] if (is.null(name)) [18:42:20.104] next [18:42:20.104] if (!grepl(pattern, name)) [18:42:20.104] next [18:42:20.104] invokeRestart(restart) [18:42:20.104] muffled <- TRUE [18:42:20.104] break [18:42:20.104] } [18:42:20.104] } [18:42:20.104] } [18:42:20.104] invisible(muffled) [18:42:20.104] } [18:42:20.104] muffleCondition(cond, pattern = "^muffle") [18:42:20.104] } [18:42:20.104] } [18:42:20.104] } [18:42:20.104] })) [18:42:20.104] }, error = function(ex) { [18:42:20.104] base::structure(base::list(value = NULL, visible = NULL, [18:42:20.104] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:20.104] ...future.rng), started = ...future.startTime, [18:42:20.104] finished = Sys.time(), session_uuid = NA_character_, [18:42:20.104] version = "1.8"), class = "FutureResult") [18:42:20.104] }, finally = { [18:42:20.104] if (!identical(...future.workdir, getwd())) [18:42:20.104] setwd(...future.workdir) [18:42:20.104] { [18:42:20.104] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:20.104] ...future.oldOptions$nwarnings <- NULL [18:42:20.104] } [18:42:20.104] base::options(...future.oldOptions) [18:42:20.104] if (.Platform$OS.type == "windows") { [18:42:20.104] old_names <- names(...future.oldEnvVars) [18:42:20.104] envs <- base::Sys.getenv() [18:42:20.104] names <- names(envs) [18:42:20.104] common <- intersect(names, old_names) [18:42:20.104] added <- setdiff(names, old_names) [18:42:20.104] removed <- setdiff(old_names, names) [18:42:20.104] changed <- common[...future.oldEnvVars[common] != [18:42:20.104] envs[common]] [18:42:20.104] NAMES <- toupper(changed) [18:42:20.104] args <- list() [18:42:20.104] for (kk in seq_along(NAMES)) { [18:42:20.104] name <- changed[[kk]] [18:42:20.104] NAME <- NAMES[[kk]] [18:42:20.104] if (name != NAME && is.element(NAME, old_names)) [18:42:20.104] next [18:42:20.104] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:20.104] } [18:42:20.104] NAMES <- toupper(added) [18:42:20.104] for (kk in seq_along(NAMES)) { [18:42:20.104] name <- added[[kk]] [18:42:20.104] NAME <- NAMES[[kk]] [18:42:20.104] if (name != NAME && is.element(NAME, old_names)) [18:42:20.104] next [18:42:20.104] args[[name]] <- "" [18:42:20.104] } [18:42:20.104] NAMES <- toupper(removed) [18:42:20.104] for (kk in seq_along(NAMES)) { [18:42:20.104] name <- removed[[kk]] [18:42:20.104] NAME <- NAMES[[kk]] [18:42:20.104] if (name != NAME && is.element(NAME, old_names)) [18:42:20.104] next [18:42:20.104] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:20.104] } [18:42:20.104] if (length(args) > 0) [18:42:20.104] base::do.call(base::Sys.setenv, args = args) [18:42:20.104] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:20.104] } [18:42:20.104] { [18:42:20.104] if (base::length(...future.futureOptionsAdded) > [18:42:20.104] 0L) { [18:42:20.104] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:20.104] base::names(opts) <- ...future.futureOptionsAdded [18:42:20.104] base::options(opts) [18:42:20.104] } [18:42:20.104] { [18:42:20.104] { [18:42:20.104] base::options(mc.cores = ...future.mc.cores.old) [18:42:20.104] NULL [18:42:20.104] } [18:42:20.104] options(future.plan = NULL) [18:42:20.104] if (is.na(NA_character_)) [18:42:20.104] Sys.unsetenv("R_FUTURE_PLAN") [18:42:20.104] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:20.104] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:20.104] .init = FALSE) [18:42:20.104] } [18:42:20.104] } [18:42:20.104] } [18:42:20.104] }) [18:42:20.104] if (TRUE) { [18:42:20.104] base::sink(type = "output", split = FALSE) [18:42:20.104] if (TRUE) { [18:42:20.104] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:20.104] } [18:42:20.104] else { [18:42:20.104] ...future.result["stdout"] <- base::list(NULL) [18:42:20.104] } [18:42:20.104] base::close(...future.stdout) [18:42:20.104] ...future.stdout <- NULL [18:42:20.104] } [18:42:20.104] ...future.result$conditions <- ...future.conditions [18:42:20.104] ...future.result$finished <- base::Sys.time() [18:42:20.104] ...future.result [18:42:20.104] } [18:42:20.113] Exporting 5 global objects (1.62 KiB) to cluster node #2 ... [18:42:20.113] Exporting '...future.FUN' (1.04 KiB) to cluster node #2 ... [18:42:20.113] Exporting '...future.FUN' (1.04 KiB) to cluster node #2 ... DONE [18:42:20.114] Exporting 'MoreArgs' (27 bytes) to cluster node #2 ... [18:42:20.114] Exporting 'MoreArgs' (27 bytes) to cluster node #2 ... DONE [18:42:20.114] Exporting '...future.elements_ii' (71 bytes) to cluster node #2 ... [18:42:20.115] Exporting '...future.elements_ii' (71 bytes) to cluster node #2 ... DONE [18:42:20.115] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... [18:42:20.115] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... DONE [18:42:20.115] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... [18:42:20.116] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... DONE [18:42:20.116] Exporting 5 global objects (1.62 KiB) to cluster node #2 ... DONE [18:42:20.117] MultisessionFuture started [18:42:20.117] - Launch lazy future ... done [18:42:20.117] run() for 'MultisessionFuture' ... done [18:42:20.118] Created future: [18:42:20.134] receiveMessageFromWorker() for ClusterFuture ... [18:42:20.134] - Validating connection of MultisessionFuture [18:42:20.134] - received message: FutureResult [18:42:20.134] - Received FutureResult [18:42:20.135] - Erased future from FutureRegistry [18:42:20.135] result() for ClusterFuture ... [18:42:20.135] - result already collected: FutureResult [18:42:20.135] result() for ClusterFuture ... done [18:42:20.135] receiveMessageFromWorker() for ClusterFuture ... done [18:42:20.118] MultisessionFuture: [18:42:20.118] Label: 'future_mapply-2' [18:42:20.118] Expression: [18:42:20.118] { [18:42:20.118] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:20.118] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:20.118] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:20.118] on.exit(options(oopts), add = TRUE) [18:42:20.118] } [18:42:20.118] { [18:42:20.118] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:20.118] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:20.118] do.call(mapply, args = args) [18:42:20.118] } [18:42:20.118] } [18:42:20.118] Lazy evaluation: FALSE [18:42:20.118] Asynchronous evaluation: TRUE [18:42:20.118] Local evaluation: TRUE [18:42:20.118] Environment: R_GlobalEnv [18:42:20.118] Capture standard output: TRUE [18:42:20.118] Capture condition classes: 'condition' (excluding 'nothing') [18:42:20.118] Globals: 5 objects totaling 1.19 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:20.118] Packages: [18:42:20.118] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:20.118] Resolved: TRUE [18:42:20.118] Value: [18:42:20.118] Conditions captured: [18:42:20.118] Early signaling: FALSE [18:42:20.118] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:20.118] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.136] Chunk #2 of 2 ... DONE [18:42:20.136] Launching 2 futures (chunks) ... DONE [18:42:20.136] Resolving 2 futures (chunks) ... [18:42:20.136] resolve() on list ... [18:42:20.136] recursive: 0 [18:42:20.137] length: 2 [18:42:20.137] [18:42:20.335] Future #2 [18:42:20.335] result() for ClusterFuture ... [18:42:20.336] - result already collected: FutureResult [18:42:20.336] result() for ClusterFuture ... done [18:42:20.336] result() for ClusterFuture ... [18:42:20.336] - result already collected: FutureResult [18:42:20.337] result() for ClusterFuture ... done [18:42:20.337] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:42:20.337] - nx: 2 [18:42:20.338] - relay: TRUE [18:42:20.338] - stdout: TRUE [18:42:20.338] - signal: TRUE [18:42:20.338] - resignal: FALSE [18:42:20.339] - force: TRUE [18:42:20.339] - relayed: [n=2] FALSE, FALSE [18:42:20.339] - queued futures: [n=2] FALSE, FALSE [18:42:20.340] - until=1 [18:42:20.340] - relaying element #1 [18:42:20.340] - relayed: [n=2] FALSE, FALSE [18:42:20.340] - queued futures: [n=2] FALSE, TRUE [18:42:20.341] signalConditionsASAP(NULL, pos=2) ... done [18:42:20.341] length: 1 (resolved future 2) [18:42:20.390] receiveMessageFromWorker() for ClusterFuture ... [18:42:20.390] - Validating connection of MultisessionFuture [18:42:20.391] - received message: FutureResult [18:42:20.391] - Received FutureResult [18:42:20.391] - Erased future from FutureRegistry [18:42:20.391] result() for ClusterFuture ... [18:42:20.392] - result already collected: FutureResult [18:42:20.392] result() for ClusterFuture ... done [18:42:20.392] receiveMessageFromWorker() for ClusterFuture ... done [18:42:20.392] Future #1 [18:42:20.392] result() for ClusterFuture ... [18:42:20.392] - result already collected: FutureResult [18:42:20.393] result() for ClusterFuture ... done [18:42:20.393] result() for ClusterFuture ... [18:42:20.393] - result already collected: FutureResult [18:42:20.393] result() for ClusterFuture ... done [18:42:20.393] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:42:20.393] - nx: 2 [18:42:20.394] - relay: TRUE [18:42:20.394] - stdout: TRUE [18:42:20.394] - signal: TRUE [18:42:20.394] - resignal: FALSE [18:42:20.394] - force: TRUE [18:42:20.394] - relayed: [n=2] FALSE, FALSE [18:42:20.395] - queued futures: [n=2] FALSE, TRUE [18:42:20.395] - until=1 [18:42:20.395] - relaying element #1 [18:42:20.395] result() for ClusterFuture ... [18:42:20.395] - result already collected: FutureResult [18:42:20.395] result() for ClusterFuture ... done [18:42:20.395] result() for ClusterFuture ... [18:42:20.396] - result already collected: FutureResult [18:42:20.396] result() for ClusterFuture ... done [18:42:20.396] result() for ClusterFuture ... [18:42:20.396] - result already collected: FutureResult [18:42:20.396] result() for ClusterFuture ... done [18:42:20.397] result() for ClusterFuture ... [18:42:20.397] - result already collected: FutureResult [18:42:20.397] result() for ClusterFuture ... done [18:42:20.397] - relayed: [n=2] TRUE, FALSE [18:42:20.397] - queued futures: [n=2] TRUE, TRUE [18:42:20.397] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:42:20.398] length: 0 (resolved future 1) [18:42:20.398] Relaying remaining futures [18:42:20.398] signalConditionsASAP(NULL, pos=0) ... [18:42:20.398] - nx: 2 [18:42:20.398] - relay: TRUE [18:42:20.398] - stdout: TRUE [18:42:20.398] - signal: TRUE [18:42:20.399] - resignal: FALSE [18:42:20.399] - force: TRUE [18:42:20.399] - relayed: [n=2] TRUE, FALSE [18:42:20.399] - queued futures: [n=2] TRUE, TRUE - flush all [18:42:20.399] - relaying element #2 [18:42:20.400] result() for ClusterFuture ... [18:42:20.400] - result already collected: FutureResult [18:42:20.400] result() for ClusterFuture ... done [18:42:20.400] result() for ClusterFuture ... [18:42:20.400] - result already collected: FutureResult [18:42:20.400] result() for ClusterFuture ... done [18:42:20.401] result() for ClusterFuture ... [18:42:20.401] - result already collected: FutureResult [18:42:20.401] result() for ClusterFuture ... done [18:42:20.401] result() for ClusterFuture ... [18:42:20.401] - result already collected: FutureResult [18:42:20.401] result() for ClusterFuture ... done [18:42:20.402] - relayed: [n=2] TRUE, TRUE [18:42:20.402] - queued futures: [n=2] TRUE, TRUE [18:42:20.402] signalConditionsASAP(MultisessionFuture, pos=0) ... done [18:42:20.402] resolve() on list ... DONE [18:42:20.402] result() for ClusterFuture ... [18:42:20.402] - result already collected: FutureResult [18:42:20.402] result() for ClusterFuture ... done [18:42:20.403] result() for ClusterFuture ... [18:42:20.403] - result already collected: FutureResult [18:42:20.403] result() for ClusterFuture ... done [18:42:20.403] result() for ClusterFuture ... [18:42:20.403] - result already collected: FutureResult [18:42:20.403] result() for ClusterFuture ... done [18:42:20.404] result() for ClusterFuture ... [18:42:20.404] - result already collected: FutureResult [18:42:20.404] result() for ClusterFuture ... done [18:42:20.404] - Number of value chunks collected: 2 [18:42:20.404] Resolving 2 futures (chunks) ... DONE [18:42:20.404] Reducing values from 2 chunks ... [18:42:20.405] - Number of values collected after concatenation: 2 [18:42:20.405] - Number of values expected: 2 [18:42:20.405] Reducing values from 2 chunks ... DONE [18:42:20.405] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = TRUE) ... DONE * future_mapply(x, ..., future.stdout = NA) ... [18:42:20.406] future_mapply() ... [18:42:20.408] Number of chunks: 2 [18:42:20.409] getGlobalsAndPackagesXApply() ... [18:42:20.409] - future.globals: TRUE [18:42:20.409] getGlobalsAndPackages() ... [18:42:20.409] Searching for globals... [18:42:20.411] - globals found: [6] 'FUN', '{', 'Sys.sleep', '/', 'print', 'list' [18:42:20.411] Searching for globals ... DONE [18:42:20.412] Resolving globals: FALSE [18:42:20.412] The total size of the 1 globals is 1.04 KiB (1066 bytes) [18:42:20.413] The total size of the 1 globals exported for future expression ('FUN()') is 1.04 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.04 KiB of class 'function') [18:42:20.413] - globals: [1] 'FUN' [18:42:20.413] [18:42:20.413] getGlobalsAndPackages() ... DONE [18:42:20.413] - globals found/used: [n=1] 'FUN' [18:42:20.414] - needed namespaces: [n=0] [18:42:20.414] Finding globals ... DONE [18:42:20.414] Globals to be used in all futures (chunks): [n=2] '...future.FUN', 'MoreArgs' [18:42:20.414] List of 2 [18:42:20.414] $ ...future.FUN:function (x, y) [18:42:20.414] $ MoreArgs : NULL [18:42:20.414] - attr(*, "where")=List of 2 [18:42:20.414] ..$ ...future.FUN: [18:42:20.414] ..$ MoreArgs : [18:42:20.414] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:42:20.414] - attr(*, "resolved")= logi FALSE [18:42:20.414] - attr(*, "total_size")= num NA [18:42:20.420] Packages to be attached in all futures: [n=0] [18:42:20.420] getGlobalsAndPackagesXApply() ... DONE [18:42:20.420] Number of futures (= number of chunks): 2 [18:42:20.421] Launching 2 futures (chunks) ... [18:42:20.421] Chunk #1 of 2 ... [18:42:20.421] - Finding globals in '...' for chunk #1 ... [18:42:20.421] getGlobalsAndPackages() ... [18:42:20.421] Searching for globals... [18:42:20.422] [18:42:20.422] Searching for globals ... DONE [18:42:20.422] - globals: [0] [18:42:20.422] getGlobalsAndPackages() ... DONE [18:42:20.422] + additional globals found: [n=0] [18:42:20.422] + additional namespaces needed: [n=0] [18:42:20.423] - Finding globals in '...' for chunk #1 ... DONE [18:42:20.423] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:20.423] - seeds: [18:42:20.423] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.423] getGlobalsAndPackages() ... [18:42:20.423] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.424] Resolving globals: FALSE [18:42:20.424] The total size of the 5 globals is 1.19 KiB (1218 bytes) [18:42:20.425] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.19 KiB.. This exceeds the maximum allowed size of 0.98 GiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (71 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:20.425] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.425] [18:42:20.425] getGlobalsAndPackages() ... DONE [18:42:20.426] run() for 'Future' ... [18:42:20.426] - state: 'created' [18:42:20.426] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:20.442] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.442] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:20.443] - Field: 'node' [18:42:20.443] - Field: 'label' [18:42:20.443] - Field: 'local' [18:42:20.443] - Field: 'owner' [18:42:20.443] - Field: 'envir' [18:42:20.443] - Field: 'workers' [18:42:20.444] - Field: 'packages' [18:42:20.444] - Field: 'gc' [18:42:20.444] - Field: 'conditions' [18:42:20.444] - Field: 'persistent' [18:42:20.444] - Field: 'expr' [18:42:20.445] - Field: 'uuid' [18:42:20.445] - Field: 'seed' [18:42:20.445] - Field: 'version' [18:42:20.445] - Field: 'result' [18:42:20.445] - Field: 'asynchronous' [18:42:20.445] - Field: 'calls' [18:42:20.446] - Field: 'globals' [18:42:20.446] - Field: 'stdout' [18:42:20.446] - Field: 'earlySignal' [18:42:20.446] - Field: 'lazy' [18:42:20.446] - Field: 'state' [18:42:20.447] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:20.447] - Launch lazy future ... [18:42:20.447] Packages needed by the future expression (n = 0): [18:42:20.447] Packages needed by future strategies (n = 0): [18:42:20.448] { [18:42:20.448] { [18:42:20.448] { [18:42:20.448] ...future.startTime <- base::Sys.time() [18:42:20.448] { [18:42:20.448] { [18:42:20.448] { [18:42:20.448] { [18:42:20.448] base::local({ [18:42:20.448] has_future <- base::requireNamespace("future", [18:42:20.448] quietly = TRUE) [18:42:20.448] if (has_future) { [18:42:20.448] ns <- base::getNamespace("future") [18:42:20.448] version <- ns[[".package"]][["version"]] [18:42:20.448] if (is.null(version)) [18:42:20.448] version <- utils::packageVersion("future") [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] version <- NULL [18:42:20.448] } [18:42:20.448] if (!has_future || version < "1.8.0") { [18:42:20.448] info <- base::c(r_version = base::gsub("R version ", [18:42:20.448] "", base::R.version$version.string), [18:42:20.448] platform = base::sprintf("%s (%s-bit)", [18:42:20.448] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:20.448] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:20.448] "release", "version")], collapse = " "), [18:42:20.448] hostname = base::Sys.info()[["nodename"]]) [18:42:20.448] info <- base::sprintf("%s: %s", base::names(info), [18:42:20.448] info) [18:42:20.448] info <- base::paste(info, collapse = "; ") [18:42:20.448] if (!has_future) { [18:42:20.448] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:20.448] info) [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:20.448] info, version) [18:42:20.448] } [18:42:20.448] base::stop(msg) [18:42:20.448] } [18:42:20.448] }) [18:42:20.448] } [18:42:20.448] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:20.448] base::options(mc.cores = 1L) [18:42:20.448] } [18:42:20.448] ...future.strategy.old <- future::plan("list") [18:42:20.448] options(future.plan = NULL) [18:42:20.448] Sys.unsetenv("R_FUTURE_PLAN") [18:42:20.448] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:20.448] } [18:42:20.448] ...future.workdir <- getwd() [18:42:20.448] } [18:42:20.448] ...future.oldOptions <- base::as.list(base::.Options) [18:42:20.448] ...future.oldEnvVars <- base::Sys.getenv() [18:42:20.448] } [18:42:20.448] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:20.448] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:20.448] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:20.448] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:20.448] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:20.448] future.stdout.windows.reencode = NULL, width = 80L) [18:42:20.448] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:20.448] base::names(...future.oldOptions)) [18:42:20.448] } [18:42:20.448] if (TRUE) { [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] if (NA) { [18:42:20.448] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:20.448] open = "w") [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:20.448] windows = "NUL", "/dev/null"), open = "w") [18:42:20.448] } [18:42:20.448] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:20.448] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:20.448] base::sink(type = "output", split = FALSE) [18:42:20.448] base::close(...future.stdout) [18:42:20.448] }, add = TRUE) [18:42:20.448] } [18:42:20.448] ...future.frame <- base::sys.nframe() [18:42:20.448] ...future.conditions <- base::list() [18:42:20.448] ...future.rng <- base::globalenv()$.Random.seed [18:42:20.448] if (FALSE) { [18:42:20.448] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:20.448] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:20.448] } [18:42:20.448] ...future.result <- base::tryCatch({ [18:42:20.448] base::withCallingHandlers({ [18:42:20.448] ...future.value <- base::withVisible(base::local({ [18:42:20.448] ...future.makeSendCondition <- base::local({ [18:42:20.448] sendCondition <- NULL [18:42:20.448] function(frame = 1L) { [18:42:20.448] if (is.function(sendCondition)) [18:42:20.448] return(sendCondition) [18:42:20.448] ns <- getNamespace("parallel") [18:42:20.448] if (exists("sendData", mode = "function", [18:42:20.448] envir = ns)) { [18:42:20.448] parallel_sendData <- get("sendData", mode = "function", [18:42:20.448] envir = ns) [18:42:20.448] envir <- sys.frame(frame) [18:42:20.448] master <- NULL [18:42:20.448] while (!identical(envir, .GlobalEnv) && [18:42:20.448] !identical(envir, emptyenv())) { [18:42:20.448] if (exists("master", mode = "list", envir = envir, [18:42:20.448] inherits = FALSE)) { [18:42:20.448] master <- get("master", mode = "list", [18:42:20.448] envir = envir, inherits = FALSE) [18:42:20.448] if (inherits(master, c("SOCKnode", [18:42:20.448] "SOCK0node"))) { [18:42:20.448] sendCondition <<- function(cond) { [18:42:20.448] data <- list(type = "VALUE", value = cond, [18:42:20.448] success = TRUE) [18:42:20.448] parallel_sendData(master, data) [18:42:20.448] } [18:42:20.448] return(sendCondition) [18:42:20.448] } [18:42:20.448] } [18:42:20.448] frame <- frame + 1L [18:42:20.448] envir <- sys.frame(frame) [18:42:20.448] } [18:42:20.448] } [18:42:20.448] sendCondition <<- function(cond) NULL [18:42:20.448] } [18:42:20.448] }) [18:42:20.448] withCallingHandlers({ [18:42:20.448] { [18:42:20.448] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:20.448] if (!identical(...future.globals.maxSize.org, [18:42:20.448] ...future.globals.maxSize)) { [18:42:20.448] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:20.448] on.exit(options(oopts), add = TRUE) [18:42:20.448] } [18:42:20.448] { [18:42:20.448] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:20.448] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:20.448] USE.NAMES = FALSE) [18:42:20.448] do.call(mapply, args = args) [18:42:20.448] } [18:42:20.448] } [18:42:20.448] }, immediateCondition = function(cond) { [18:42:20.448] sendCondition <- ...future.makeSendCondition() [18:42:20.448] sendCondition(cond) [18:42:20.448] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.448] { [18:42:20.448] inherits <- base::inherits [18:42:20.448] invokeRestart <- base::invokeRestart [18:42:20.448] is.null <- base::is.null [18:42:20.448] muffled <- FALSE [18:42:20.448] if (inherits(cond, "message")) { [18:42:20.448] muffled <- grepl(pattern, "muffleMessage") [18:42:20.448] if (muffled) [18:42:20.448] invokeRestart("muffleMessage") [18:42:20.448] } [18:42:20.448] else if (inherits(cond, "warning")) { [18:42:20.448] muffled <- grepl(pattern, "muffleWarning") [18:42:20.448] if (muffled) [18:42:20.448] invokeRestart("muffleWarning") [18:42:20.448] } [18:42:20.448] else if (inherits(cond, "condition")) { [18:42:20.448] if (!is.null(pattern)) { [18:42:20.448] computeRestarts <- base::computeRestarts [18:42:20.448] grepl <- base::grepl [18:42:20.448] restarts <- computeRestarts(cond) [18:42:20.448] for (restart in restarts) { [18:42:20.448] name <- restart$name [18:42:20.448] if (is.null(name)) [18:42:20.448] next [18:42:20.448] if (!grepl(pattern, name)) [18:42:20.448] next [18:42:20.448] invokeRestart(restart) [18:42:20.448] muffled <- TRUE [18:42:20.448] break [18:42:20.448] } [18:42:20.448] } [18:42:20.448] } [18:42:20.448] invisible(muffled) [18:42:20.448] } [18:42:20.448] muffleCondition(cond) [18:42:20.448] }) [18:42:20.448] })) [18:42:20.448] future::FutureResult(value = ...future.value$value, [18:42:20.448] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:20.448] ...future.rng), globalenv = if (FALSE) [18:42:20.448] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:20.448] ...future.globalenv.names)) [18:42:20.448] else NULL, started = ...future.startTime, version = "1.8") [18:42:20.448] }, condition = base::local({ [18:42:20.448] c <- base::c [18:42:20.448] inherits <- base::inherits [18:42:20.448] invokeRestart <- base::invokeRestart [18:42:20.448] length <- base::length [18:42:20.448] list <- base::list [18:42:20.448] seq.int <- base::seq.int [18:42:20.448] signalCondition <- base::signalCondition [18:42:20.448] sys.calls <- base::sys.calls [18:42:20.448] `[[` <- base::`[[` [18:42:20.448] `+` <- base::`+` [18:42:20.448] `<<-` <- base::`<<-` [18:42:20.448] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:20.448] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:20.448] 3L)] [18:42:20.448] } [18:42:20.448] function(cond) { [18:42:20.448] is_error <- inherits(cond, "error") [18:42:20.448] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:20.448] NULL) [18:42:20.448] if (is_error) { [18:42:20.448] sessionInformation <- function() { [18:42:20.448] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:20.448] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:20.448] search = base::search(), system = base::Sys.info()) [18:42:20.448] } [18:42:20.448] ...future.conditions[[length(...future.conditions) + [18:42:20.448] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:20.448] cond$call), session = sessionInformation(), [18:42:20.448] timestamp = base::Sys.time(), signaled = 0L) [18:42:20.448] signalCondition(cond) [18:42:20.448] } [18:42:20.448] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:20.448] "immediateCondition"))) { [18:42:20.448] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:20.448] ...future.conditions[[length(...future.conditions) + [18:42:20.448] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:20.448] if (TRUE && !signal) { [18:42:20.448] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.448] { [18:42:20.448] inherits <- base::inherits [18:42:20.448] invokeRestart <- base::invokeRestart [18:42:20.448] is.null <- base::is.null [18:42:20.448] muffled <- FALSE [18:42:20.448] if (inherits(cond, "message")) { [18:42:20.448] muffled <- grepl(pattern, "muffleMessage") [18:42:20.448] if (muffled) [18:42:20.448] invokeRestart("muffleMessage") [18:42:20.448] } [18:42:20.448] else if (inherits(cond, "warning")) { [18:42:20.448] muffled <- grepl(pattern, "muffleWarning") [18:42:20.448] if (muffled) [18:42:20.448] invokeRestart("muffleWarning") [18:42:20.448] } [18:42:20.448] else if (inherits(cond, "condition")) { [18:42:20.448] if (!is.null(pattern)) { [18:42:20.448] computeRestarts <- base::computeRestarts [18:42:20.448] grepl <- base::grepl [18:42:20.448] restarts <- computeRestarts(cond) [18:42:20.448] for (restart in restarts) { [18:42:20.448] name <- restart$name [18:42:20.448] if (is.null(name)) [18:42:20.448] next [18:42:20.448] if (!grepl(pattern, name)) [18:42:20.448] next [18:42:20.448] invokeRestart(restart) [18:42:20.448] muffled <- TRUE [18:42:20.448] break [18:42:20.448] } [18:42:20.448] } [18:42:20.448] } [18:42:20.448] invisible(muffled) [18:42:20.448] } [18:42:20.448] muffleCondition(cond, pattern = "^muffle") [18:42:20.448] } [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] if (TRUE) { [18:42:20.448] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.448] { [18:42:20.448] inherits <- base::inherits [18:42:20.448] invokeRestart <- base::invokeRestart [18:42:20.448] is.null <- base::is.null [18:42:20.448] muffled <- FALSE [18:42:20.448] if (inherits(cond, "message")) { [18:42:20.448] muffled <- grepl(pattern, "muffleMessage") [18:42:20.448] if (muffled) [18:42:20.448] invokeRestart("muffleMessage") [18:42:20.448] } [18:42:20.448] else if (inherits(cond, "warning")) { [18:42:20.448] muffled <- grepl(pattern, "muffleWarning") [18:42:20.448] if (muffled) [18:42:20.448] invokeRestart("muffleWarning") [18:42:20.448] } [18:42:20.448] else if (inherits(cond, "condition")) { [18:42:20.448] if (!is.null(pattern)) { [18:42:20.448] computeRestarts <- base::computeRestarts [18:42:20.448] grepl <- base::grepl [18:42:20.448] restarts <- computeRestarts(cond) [18:42:20.448] for (restart in restarts) { [18:42:20.448] name <- restart$name [18:42:20.448] if (is.null(name)) [18:42:20.448] next [18:42:20.448] if (!grepl(pattern, name)) [18:42:20.448] next [18:42:20.448] invokeRestart(restart) [18:42:20.448] muffled <- TRUE [18:42:20.448] break [18:42:20.448] } [18:42:20.448] } [18:42:20.448] } [18:42:20.448] invisible(muffled) [18:42:20.448] } [18:42:20.448] muffleCondition(cond, pattern = "^muffle") [18:42:20.448] } [18:42:20.448] } [18:42:20.448] } [18:42:20.448] })) [18:42:20.448] }, error = function(ex) { [18:42:20.448] base::structure(base::list(value = NULL, visible = NULL, [18:42:20.448] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:20.448] ...future.rng), started = ...future.startTime, [18:42:20.448] finished = Sys.time(), session_uuid = NA_character_, [18:42:20.448] version = "1.8"), class = "FutureResult") [18:42:20.448] }, finally = { [18:42:20.448] if (!identical(...future.workdir, getwd())) [18:42:20.448] setwd(...future.workdir) [18:42:20.448] { [18:42:20.448] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:20.448] ...future.oldOptions$nwarnings <- NULL [18:42:20.448] } [18:42:20.448] base::options(...future.oldOptions) [18:42:20.448] if (.Platform$OS.type == "windows") { [18:42:20.448] old_names <- names(...future.oldEnvVars) [18:42:20.448] envs <- base::Sys.getenv() [18:42:20.448] names <- names(envs) [18:42:20.448] common <- intersect(names, old_names) [18:42:20.448] added <- setdiff(names, old_names) [18:42:20.448] removed <- setdiff(old_names, names) [18:42:20.448] changed <- common[...future.oldEnvVars[common] != [18:42:20.448] envs[common]] [18:42:20.448] NAMES <- toupper(changed) [18:42:20.448] args <- list() [18:42:20.448] for (kk in seq_along(NAMES)) { [18:42:20.448] name <- changed[[kk]] [18:42:20.448] NAME <- NAMES[[kk]] [18:42:20.448] if (name != NAME && is.element(NAME, old_names)) [18:42:20.448] next [18:42:20.448] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:20.448] } [18:42:20.448] NAMES <- toupper(added) [18:42:20.448] for (kk in seq_along(NAMES)) { [18:42:20.448] name <- added[[kk]] [18:42:20.448] NAME <- NAMES[[kk]] [18:42:20.448] if (name != NAME && is.element(NAME, old_names)) [18:42:20.448] next [18:42:20.448] args[[name]] <- "" [18:42:20.448] } [18:42:20.448] NAMES <- toupper(removed) [18:42:20.448] for (kk in seq_along(NAMES)) { [18:42:20.448] name <- removed[[kk]] [18:42:20.448] NAME <- NAMES[[kk]] [18:42:20.448] if (name != NAME && is.element(NAME, old_names)) [18:42:20.448] next [18:42:20.448] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:20.448] } [18:42:20.448] if (length(args) > 0) [18:42:20.448] base::do.call(base::Sys.setenv, args = args) [18:42:20.448] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:20.448] } [18:42:20.448] { [18:42:20.448] if (base::length(...future.futureOptionsAdded) > [18:42:20.448] 0L) { [18:42:20.448] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:20.448] base::names(opts) <- ...future.futureOptionsAdded [18:42:20.448] base::options(opts) [18:42:20.448] } [18:42:20.448] { [18:42:20.448] { [18:42:20.448] base::options(mc.cores = ...future.mc.cores.old) [18:42:20.448] NULL [18:42:20.448] } [18:42:20.448] options(future.plan = NULL) [18:42:20.448] if (is.na(NA_character_)) [18:42:20.448] Sys.unsetenv("R_FUTURE_PLAN") [18:42:20.448] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:20.448] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:20.448] .init = FALSE) [18:42:20.448] } [18:42:20.448] } [18:42:20.448] } [18:42:20.448] }) [18:42:20.448] if (FALSE) { [18:42:20.448] base::sink(type = "output", split = FALSE) [18:42:20.448] if (NA) { [18:42:20.448] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:20.448] } [18:42:20.448] else { [18:42:20.448] ...future.result["stdout"] <- base::list(NULL) [18:42:20.448] } [18:42:20.448] base::close(...future.stdout) [18:42:20.448] ...future.stdout <- NULL [18:42:20.448] } [18:42:20.448] ...future.result$conditions <- ...future.conditions [18:42:20.448] ...future.result$finished <- base::Sys.time() [18:42:20.448] ...future.result [18:42:20.448] } [18:42:20.453] Exporting 5 global objects (1.62 KiB) to cluster node #1 ... [18:42:20.453] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... [18:42:20.454] Exporting '...future.FUN' (1.04 KiB) to cluster node #1 ... DONE [18:42:20.454] Exporting 'MoreArgs' (27 bytes) to cluster node #1 ... [18:42:20.455] Exporting 'MoreArgs' (27 bytes) to cluster node #1 ... DONE [18:42:20.455] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:42:20.455] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:42:20.455] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:42:20.456] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:42:20.456] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:42:20.456] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:42:20.457] Exporting 5 global objects (1.62 KiB) to cluster node #1 ... DONE [18:42:20.457] MultisessionFuture started [18:42:20.458] - Launch lazy future ... done [18:42:20.458] run() for 'MultisessionFuture' ... done [18:42:20.458] Created future: [18:42:20.458] MultisessionFuture: [18:42:20.458] Label: 'future_mapply-1' [18:42:20.458] Expression: [18:42:20.458] { [18:42:20.458] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:20.458] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:20.458] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:20.458] on.exit(options(oopts), add = TRUE) [18:42:20.458] } [18:42:20.458] { [18:42:20.458] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:20.458] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:20.458] do.call(mapply, args = args) [18:42:20.458] } [18:42:20.458] } [18:42:20.458] Lazy evaluation: FALSE [18:42:20.458] Asynchronous evaluation: TRUE [18:42:20.458] Local evaluation: TRUE [18:42:20.458] Environment: R_GlobalEnv [18:42:20.458] Capture standard output: NA [18:42:20.458] Capture condition classes: 'condition' (excluding 'nothing') [18:42:20.458] Globals: 5 objects totaling 1.19 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:20.458] Packages: [18:42:20.458] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:20.458] Resolved: FALSE [18:42:20.458] Value: [18:42:20.458] Conditions captured: [18:42:20.458] Early signaling: FALSE [18:42:20.458] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:20.458] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.648] Chunk #1 of 2 ... DONE [18:42:20.648] Chunk #2 of 2 ... [18:42:20.648] - Finding globals in '...' for chunk #2 ... [18:42:20.648] getGlobalsAndPackages() ... [18:42:20.649] Searching for globals... [18:42:20.649] [18:42:20.649] Searching for globals ... DONE [18:42:20.649] - globals: [0] [18:42:20.649] getGlobalsAndPackages() ... DONE [18:42:20.650] + additional globals found: [n=0] [18:42:20.650] + additional namespaces needed: [n=0] [18:42:20.650] - Finding globals in '...' for chunk #2 ... DONE [18:42:20.650] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:42:20.650] - seeds: [18:42:20.651] - All globals exported: [n=5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.651] getGlobalsAndPackages() ... [18:42:20.651] - globals passed as-is: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.651] Resolving globals: FALSE [18:42:20.652] The total size of the 5 globals is 1.19 KiB (1218 bytes) [18:42:20.652] The total size of the 5 globals exported for future expression ('{; ...future.globals.maxSize.org <- getOption("future.globals.maxSize"); if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) {; oopts <- options(future.globals.maxSize = ...future.globals.maxSize); on.exit(options(oopts), add = TRUE); }; ...; do.call(mapply, args = args); }; }') is 1.19 KiB.. This exceeds the maximum allowed size of 0.98 GiB (option 'future.globals.maxSize'). The three largest globals are '...future.FUN' (1.04 KiB of class 'function'), '...future.elements_ii' (71 bytes of class 'list') and 'MoreArgs' (27 bytes of class 'NULL') [18:42:20.652] - globals: [5] '...future.FUN', 'MoreArgs', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:42:20.653] [18:42:20.653] getGlobalsAndPackages() ... DONE [18:42:20.653] run() for 'Future' ... [18:42:20.653] - state: 'created' [18:42:20.654] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:42:20.672] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.673] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:42:20.673] - Field: 'node' [18:42:20.673] - Field: 'label' [18:42:20.673] - Field: 'local' [18:42:20.673] - Field: 'owner' [18:42:20.674] - Field: 'envir' [18:42:20.674] - Field: 'workers' [18:42:20.674] - Field: 'packages' [18:42:20.674] - Field: 'gc' [18:42:20.674] - Field: 'conditions' [18:42:20.675] - Field: 'persistent' [18:42:20.675] - Field: 'expr' [18:42:20.675] - Field: 'uuid' [18:42:20.675] - Field: 'seed' [18:42:20.675] - Field: 'version' [18:42:20.676] - Field: 'result' [18:42:20.676] - Field: 'asynchronous' [18:42:20.676] - Field: 'calls' [18:42:20.676] - Field: 'globals' [18:42:20.676] - Field: 'stdout' [18:42:20.677] - Field: 'earlySignal' [18:42:20.677] - Field: 'lazy' [18:42:20.677] - Field: 'state' [18:42:20.677] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:42:20.677] - Launch lazy future ... [18:42:20.678] Packages needed by the future expression (n = 0): [18:42:20.678] Packages needed by future strategies (n = 0): [18:42:20.678] { [18:42:20.678] { [18:42:20.678] { [18:42:20.678] ...future.startTime <- base::Sys.time() [18:42:20.678] { [18:42:20.678] { [18:42:20.678] { [18:42:20.678] { [18:42:20.678] base::local({ [18:42:20.678] has_future <- base::requireNamespace("future", [18:42:20.678] quietly = TRUE) [18:42:20.678] if (has_future) { [18:42:20.678] ns <- base::getNamespace("future") [18:42:20.678] version <- ns[[".package"]][["version"]] [18:42:20.678] if (is.null(version)) [18:42:20.678] version <- utils::packageVersion("future") [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] version <- NULL [18:42:20.678] } [18:42:20.678] if (!has_future || version < "1.8.0") { [18:42:20.678] info <- base::c(r_version = base::gsub("R version ", [18:42:20.678] "", base::R.version$version.string), [18:42:20.678] platform = base::sprintf("%s (%s-bit)", [18:42:20.678] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:42:20.678] os = base::paste(base::Sys.info()[base::c("sysname", [18:42:20.678] "release", "version")], collapse = " "), [18:42:20.678] hostname = base::Sys.info()[["nodename"]]) [18:42:20.678] info <- base::sprintf("%s: %s", base::names(info), [18:42:20.678] info) [18:42:20.678] info <- base::paste(info, collapse = "; ") [18:42:20.678] if (!has_future) { [18:42:20.678] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:42:20.678] info) [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:42:20.678] info, version) [18:42:20.678] } [18:42:20.678] base::stop(msg) [18:42:20.678] } [18:42:20.678] }) [18:42:20.678] } [18:42:20.678] ...future.mc.cores.old <- base::getOption("mc.cores") [18:42:20.678] base::options(mc.cores = 1L) [18:42:20.678] } [18:42:20.678] ...future.strategy.old <- future::plan("list") [18:42:20.678] options(future.plan = NULL) [18:42:20.678] Sys.unsetenv("R_FUTURE_PLAN") [18:42:20.678] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:42:20.678] } [18:42:20.678] ...future.workdir <- getwd() [18:42:20.678] } [18:42:20.678] ...future.oldOptions <- base::as.list(base::.Options) [18:42:20.678] ...future.oldEnvVars <- base::Sys.getenv() [18:42:20.678] } [18:42:20.678] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:42:20.678] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:42:20.678] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:42:20.678] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:42:20.678] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:42:20.678] future.stdout.windows.reencode = NULL, width = 80L) [18:42:20.678] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:42:20.678] base::names(...future.oldOptions)) [18:42:20.678] } [18:42:20.678] if (TRUE) { [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] if (NA) { [18:42:20.678] ...future.stdout <- base::rawConnection(base::raw(0L), [18:42:20.678] open = "w") [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:42:20.678] windows = "NUL", "/dev/null"), open = "w") [18:42:20.678] } [18:42:20.678] base::sink(...future.stdout, type = "output", split = FALSE) [18:42:20.678] base::on.exit(if (!base::is.null(...future.stdout)) { [18:42:20.678] base::sink(type = "output", split = FALSE) [18:42:20.678] base::close(...future.stdout) [18:42:20.678] }, add = TRUE) [18:42:20.678] } [18:42:20.678] ...future.frame <- base::sys.nframe() [18:42:20.678] ...future.conditions <- base::list() [18:42:20.678] ...future.rng <- base::globalenv()$.Random.seed [18:42:20.678] if (FALSE) { [18:42:20.678] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:42:20.678] "...future.value", "...future.globalenv.names", ".Random.seed") [18:42:20.678] } [18:42:20.678] ...future.result <- base::tryCatch({ [18:42:20.678] base::withCallingHandlers({ [18:42:20.678] ...future.value <- base::withVisible(base::local({ [18:42:20.678] ...future.makeSendCondition <- base::local({ [18:42:20.678] sendCondition <- NULL [18:42:20.678] function(frame = 1L) { [18:42:20.678] if (is.function(sendCondition)) [18:42:20.678] return(sendCondition) [18:42:20.678] ns <- getNamespace("parallel") [18:42:20.678] if (exists("sendData", mode = "function", [18:42:20.678] envir = ns)) { [18:42:20.678] parallel_sendData <- get("sendData", mode = "function", [18:42:20.678] envir = ns) [18:42:20.678] envir <- sys.frame(frame) [18:42:20.678] master <- NULL [18:42:20.678] while (!identical(envir, .GlobalEnv) && [18:42:20.678] !identical(envir, emptyenv())) { [18:42:20.678] if (exists("master", mode = "list", envir = envir, [18:42:20.678] inherits = FALSE)) { [18:42:20.678] master <- get("master", mode = "list", [18:42:20.678] envir = envir, inherits = FALSE) [18:42:20.678] if (inherits(master, c("SOCKnode", [18:42:20.678] "SOCK0node"))) { [18:42:20.678] sendCondition <<- function(cond) { [18:42:20.678] data <- list(type = "VALUE", value = cond, [18:42:20.678] success = TRUE) [18:42:20.678] parallel_sendData(master, data) [18:42:20.678] } [18:42:20.678] return(sendCondition) [18:42:20.678] } [18:42:20.678] } [18:42:20.678] frame <- frame + 1L [18:42:20.678] envir <- sys.frame(frame) [18:42:20.678] } [18:42:20.678] } [18:42:20.678] sendCondition <<- function(cond) NULL [18:42:20.678] } [18:42:20.678] }) [18:42:20.678] withCallingHandlers({ [18:42:20.678] { [18:42:20.678] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:20.678] if (!identical(...future.globals.maxSize.org, [18:42:20.678] ...future.globals.maxSize)) { [18:42:20.678] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:20.678] on.exit(options(oopts), add = TRUE) [18:42:20.678] } [18:42:20.678] { [18:42:20.678] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:20.678] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, [18:42:20.678] USE.NAMES = FALSE) [18:42:20.678] do.call(mapply, args = args) [18:42:20.678] } [18:42:20.678] } [18:42:20.678] }, immediateCondition = function(cond) { [18:42:20.678] sendCondition <- ...future.makeSendCondition() [18:42:20.678] sendCondition(cond) [18:42:20.678] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.678] { [18:42:20.678] inherits <- base::inherits [18:42:20.678] invokeRestart <- base::invokeRestart [18:42:20.678] is.null <- base::is.null [18:42:20.678] muffled <- FALSE [18:42:20.678] if (inherits(cond, "message")) { [18:42:20.678] muffled <- grepl(pattern, "muffleMessage") [18:42:20.678] if (muffled) [18:42:20.678] invokeRestart("muffleMessage") [18:42:20.678] } [18:42:20.678] else if (inherits(cond, "warning")) { [18:42:20.678] muffled <- grepl(pattern, "muffleWarning") [18:42:20.678] if (muffled) [18:42:20.678] invokeRestart("muffleWarning") [18:42:20.678] } [18:42:20.678] else if (inherits(cond, "condition")) { [18:42:20.678] if (!is.null(pattern)) { [18:42:20.678] computeRestarts <- base::computeRestarts [18:42:20.678] grepl <- base::grepl [18:42:20.678] restarts <- computeRestarts(cond) [18:42:20.678] for (restart in restarts) { [18:42:20.678] name <- restart$name [18:42:20.678] if (is.null(name)) [18:42:20.678] next [18:42:20.678] if (!grepl(pattern, name)) [18:42:20.678] next [18:42:20.678] invokeRestart(restart) [18:42:20.678] muffled <- TRUE [18:42:20.678] break [18:42:20.678] } [18:42:20.678] } [18:42:20.678] } [18:42:20.678] invisible(muffled) [18:42:20.678] } [18:42:20.678] muffleCondition(cond) [18:42:20.678] }) [18:42:20.678] })) [18:42:20.678] future::FutureResult(value = ...future.value$value, [18:42:20.678] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:42:20.678] ...future.rng), globalenv = if (FALSE) [18:42:20.678] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:42:20.678] ...future.globalenv.names)) [18:42:20.678] else NULL, started = ...future.startTime, version = "1.8") [18:42:20.678] }, condition = base::local({ [18:42:20.678] c <- base::c [18:42:20.678] inherits <- base::inherits [18:42:20.678] invokeRestart <- base::invokeRestart [18:42:20.678] length <- base::length [18:42:20.678] list <- base::list [18:42:20.678] seq.int <- base::seq.int [18:42:20.678] signalCondition <- base::signalCondition [18:42:20.678] sys.calls <- base::sys.calls [18:42:20.678] `[[` <- base::`[[` [18:42:20.678] `+` <- base::`+` [18:42:20.678] `<<-` <- base::`<<-` [18:42:20.678] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:42:20.678] calls[seq.int(from = from + 12L, to = length(calls) - [18:42:20.678] 3L)] [18:42:20.678] } [18:42:20.678] function(cond) { [18:42:20.678] is_error <- inherits(cond, "error") [18:42:20.678] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:42:20.678] NULL) [18:42:20.678] if (is_error) { [18:42:20.678] sessionInformation <- function() { [18:42:20.678] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:42:20.678] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:42:20.678] search = base::search(), system = base::Sys.info()) [18:42:20.678] } [18:42:20.678] ...future.conditions[[length(...future.conditions) + [18:42:20.678] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:42:20.678] cond$call), session = sessionInformation(), [18:42:20.678] timestamp = base::Sys.time(), signaled = 0L) [18:42:20.678] signalCondition(cond) [18:42:20.678] } [18:42:20.678] else if (!ignore && TRUE && inherits(cond, c("condition", [18:42:20.678] "immediateCondition"))) { [18:42:20.678] signal <- TRUE && inherits(cond, "immediateCondition") [18:42:20.678] ...future.conditions[[length(...future.conditions) + [18:42:20.678] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:42:20.678] if (TRUE && !signal) { [18:42:20.678] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.678] { [18:42:20.678] inherits <- base::inherits [18:42:20.678] invokeRestart <- base::invokeRestart [18:42:20.678] is.null <- base::is.null [18:42:20.678] muffled <- FALSE [18:42:20.678] if (inherits(cond, "message")) { [18:42:20.678] muffled <- grepl(pattern, "muffleMessage") [18:42:20.678] if (muffled) [18:42:20.678] invokeRestart("muffleMessage") [18:42:20.678] } [18:42:20.678] else if (inherits(cond, "warning")) { [18:42:20.678] muffled <- grepl(pattern, "muffleWarning") [18:42:20.678] if (muffled) [18:42:20.678] invokeRestart("muffleWarning") [18:42:20.678] } [18:42:20.678] else if (inherits(cond, "condition")) { [18:42:20.678] if (!is.null(pattern)) { [18:42:20.678] computeRestarts <- base::computeRestarts [18:42:20.678] grepl <- base::grepl [18:42:20.678] restarts <- computeRestarts(cond) [18:42:20.678] for (restart in restarts) { [18:42:20.678] name <- restart$name [18:42:20.678] if (is.null(name)) [18:42:20.678] next [18:42:20.678] if (!grepl(pattern, name)) [18:42:20.678] next [18:42:20.678] invokeRestart(restart) [18:42:20.678] muffled <- TRUE [18:42:20.678] break [18:42:20.678] } [18:42:20.678] } [18:42:20.678] } [18:42:20.678] invisible(muffled) [18:42:20.678] } [18:42:20.678] muffleCondition(cond, pattern = "^muffle") [18:42:20.678] } [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] if (TRUE) { [18:42:20.678] muffleCondition <- function (cond, pattern = "^muffle") [18:42:20.678] { [18:42:20.678] inherits <- base::inherits [18:42:20.678] invokeRestart <- base::invokeRestart [18:42:20.678] is.null <- base::is.null [18:42:20.678] muffled <- FALSE [18:42:20.678] if (inherits(cond, "message")) { [18:42:20.678] muffled <- grepl(pattern, "muffleMessage") [18:42:20.678] if (muffled) [18:42:20.678] invokeRestart("muffleMessage") [18:42:20.678] } [18:42:20.678] else if (inherits(cond, "warning")) { [18:42:20.678] muffled <- grepl(pattern, "muffleWarning") [18:42:20.678] if (muffled) [18:42:20.678] invokeRestart("muffleWarning") [18:42:20.678] } [18:42:20.678] else if (inherits(cond, "condition")) { [18:42:20.678] if (!is.null(pattern)) { [18:42:20.678] computeRestarts <- base::computeRestarts [18:42:20.678] grepl <- base::grepl [18:42:20.678] restarts <- computeRestarts(cond) [18:42:20.678] for (restart in restarts) { [18:42:20.678] name <- restart$name [18:42:20.678] if (is.null(name)) [18:42:20.678] next [18:42:20.678] if (!grepl(pattern, name)) [18:42:20.678] next [18:42:20.678] invokeRestart(restart) [18:42:20.678] muffled <- TRUE [18:42:20.678] break [18:42:20.678] } [18:42:20.678] } [18:42:20.678] } [18:42:20.678] invisible(muffled) [18:42:20.678] } [18:42:20.678] muffleCondition(cond, pattern = "^muffle") [18:42:20.678] } [18:42:20.678] } [18:42:20.678] } [18:42:20.678] })) [18:42:20.678] }, error = function(ex) { [18:42:20.678] base::structure(base::list(value = NULL, visible = NULL, [18:42:20.678] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:42:20.678] ...future.rng), started = ...future.startTime, [18:42:20.678] finished = Sys.time(), session_uuid = NA_character_, [18:42:20.678] version = "1.8"), class = "FutureResult") [18:42:20.678] }, finally = { [18:42:20.678] if (!identical(...future.workdir, getwd())) [18:42:20.678] setwd(...future.workdir) [18:42:20.678] { [18:42:20.678] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:42:20.678] ...future.oldOptions$nwarnings <- NULL [18:42:20.678] } [18:42:20.678] base::options(...future.oldOptions) [18:42:20.678] if (.Platform$OS.type == "windows") { [18:42:20.678] old_names <- names(...future.oldEnvVars) [18:42:20.678] envs <- base::Sys.getenv() [18:42:20.678] names <- names(envs) [18:42:20.678] common <- intersect(names, old_names) [18:42:20.678] added <- setdiff(names, old_names) [18:42:20.678] removed <- setdiff(old_names, names) [18:42:20.678] changed <- common[...future.oldEnvVars[common] != [18:42:20.678] envs[common]] [18:42:20.678] NAMES <- toupper(changed) [18:42:20.678] args <- list() [18:42:20.678] for (kk in seq_along(NAMES)) { [18:42:20.678] name <- changed[[kk]] [18:42:20.678] NAME <- NAMES[[kk]] [18:42:20.678] if (name != NAME && is.element(NAME, old_names)) [18:42:20.678] next [18:42:20.678] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:20.678] } [18:42:20.678] NAMES <- toupper(added) [18:42:20.678] for (kk in seq_along(NAMES)) { [18:42:20.678] name <- added[[kk]] [18:42:20.678] NAME <- NAMES[[kk]] [18:42:20.678] if (name != NAME && is.element(NAME, old_names)) [18:42:20.678] next [18:42:20.678] args[[name]] <- "" [18:42:20.678] } [18:42:20.678] NAMES <- toupper(removed) [18:42:20.678] for (kk in seq_along(NAMES)) { [18:42:20.678] name <- removed[[kk]] [18:42:20.678] NAME <- NAMES[[kk]] [18:42:20.678] if (name != NAME && is.element(NAME, old_names)) [18:42:20.678] next [18:42:20.678] args[[name]] <- ...future.oldEnvVars[[name]] [18:42:20.678] } [18:42:20.678] if (length(args) > 0) [18:42:20.678] base::do.call(base::Sys.setenv, args = args) [18:42:20.678] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:42:20.678] } [18:42:20.678] { [18:42:20.678] if (base::length(...future.futureOptionsAdded) > [18:42:20.678] 0L) { [18:42:20.678] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:42:20.678] base::names(opts) <- ...future.futureOptionsAdded [18:42:20.678] base::options(opts) [18:42:20.678] } [18:42:20.678] { [18:42:20.678] { [18:42:20.678] base::options(mc.cores = ...future.mc.cores.old) [18:42:20.678] NULL [18:42:20.678] } [18:42:20.678] options(future.plan = NULL) [18:42:20.678] if (is.na(NA_character_)) [18:42:20.678] Sys.unsetenv("R_FUTURE_PLAN") [18:42:20.678] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:42:20.678] future::plan(...future.strategy.old, .cleanup = FALSE, [18:42:20.678] .init = FALSE) [18:42:20.678] } [18:42:20.678] } [18:42:20.678] } [18:42:20.678] }) [18:42:20.678] if (FALSE) { [18:42:20.678] base::sink(type = "output", split = FALSE) [18:42:20.678] if (NA) { [18:42:20.678] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:42:20.678] } [18:42:20.678] else { [18:42:20.678] ...future.result["stdout"] <- base::list(NULL) [18:42:20.678] } [18:42:20.678] base::close(...future.stdout) [18:42:20.678] ...future.stdout <- NULL [18:42:20.678] } [18:42:20.678] ...future.result$conditions <- ...future.conditions [18:42:20.678] ...future.result$finished <- base::Sys.time() [18:42:20.678] ...future.result [18:42:20.678] } [18:42:20.684] Exporting 5 global objects (1.62 KiB) to cluster node #2 ... [18:42:20.684] Exporting '...future.FUN' (1.04 KiB) to cluster node #2 ... [18:42:20.685] Exporting '...future.FUN' (1.04 KiB) to cluster node #2 ... DONE [18:42:20.685] Exporting 'MoreArgs' (27 bytes) to cluster node #2 ... [18:42:20.686] Exporting 'MoreArgs' (27 bytes) to cluster node #2 ... DONE [18:42:20.686] Exporting '...future.elements_ii' (71 bytes) to cluster node #2 ... [18:42:20.686] Exporting '...future.elements_ii' (71 bytes) to cluster node #2 ... DONE [18:42:20.686] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... [18:42:20.687] Exporting '...future.seeds_ii' (27 bytes) to cluster node #2 ... DONE [18:42:20.687] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... [18:42:20.687] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #2 ... DONE [18:42:20.688] Exporting 5 global objects (1.62 KiB) to cluster node #2 ... DONE [18:42:20.688] MultisessionFuture started [18:42:20.688] - Launch lazy future ... done [18:42:20.689] run() for 'MultisessionFuture' ... done [18:42:20.689] Created future: [18:42:20.705] receiveMessageFromWorker() for ClusterFuture ... [18:42:20.705] - Validating connection of MultisessionFuture [18:42:20.705] - received message: FutureResult [18:42:20.706] - Received FutureResult [18:42:20.706] - Erased future from FutureRegistry [18:42:20.706] result() for ClusterFuture ... [18:42:20.706] - result already collected: FutureResult [18:42:20.706] result() for ClusterFuture ... done [18:42:20.706] receiveMessageFromWorker() for ClusterFuture ... done [18:42:20.689] MultisessionFuture: [18:42:20.689] Label: 'future_mapply-2' [18:42:20.689] Expression: [18:42:20.689] { [18:42:20.689] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:42:20.689] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:42:20.689] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:42:20.689] on.exit(options(oopts), add = TRUE) [18:42:20.689] } [18:42:20.689] { [18:42:20.689] args <- c(list(FUN = ...future.FUN), ...future.elements_ii, [18:42:20.689] MoreArgs = list(MoreArgs), SIMPLIFY = FALSE, USE.NAMES = FALSE) [18:42:20.689] do.call(mapply, args = args) [18:42:20.689] } [18:42:20.689] } [18:42:20.689] Lazy evaluation: FALSE [18:42:20.689] Asynchronous evaluation: TRUE [18:42:20.689] Local evaluation: TRUE [18:42:20.689] Environment: R_GlobalEnv [18:42:20.689] Capture standard output: NA [18:42:20.689] Capture condition classes: 'condition' (excluding 'nothing') [18:42:20.689] Globals: 5 objects totaling 1.19 KiB (function '...future.FUN' of 1.04 KiB, NULL 'MoreArgs' of 27 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:42:20.689] Packages: [18:42:20.689] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:42:20.689] Resolved: TRUE [18:42:20.689] Value: [18:42:20.689] Conditions captured: [18:42:20.689] Early signaling: FALSE [18:42:20.689] Owner process: 793a4f03-4ea7-acb6-c167-7603774f4622 [18:42:20.689] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:42:20.707] Chunk #2 of 2 ... DONE [18:42:20.707] Launching 2 futures (chunks) ... DONE [18:42:20.707] Resolving 2 futures (chunks) ... [18:42:20.707] resolve() on list ... [18:42:20.707] recursive: 0 [18:42:20.708] length: 2 [18:42:20.708] [18:42:20.897] Future #2 [18:42:20.898] result() for ClusterFuture ... [18:42:20.898] - result already collected: FutureResult [18:42:20.899] result() for ClusterFuture ... done [18:42:20.899] result() for ClusterFuture ... [18:42:20.899] - result already collected: FutureResult [18:42:20.900] result() for ClusterFuture ... done [18:42:20.900] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:42:20.900] - nx: 2 [18:42:20.900] - relay: TRUE [18:42:20.901] - stdout: TRUE [18:42:20.901] - signal: TRUE [18:42:20.901] - resignal: FALSE [18:42:20.901] - force: TRUE [18:42:20.902] - relayed: [n=2] FALSE, FALSE [18:42:20.902] - queued futures: [n=2] FALSE, FALSE [18:42:20.902] - until=1 [18:42:20.902] - relaying element #1 [18:42:20.903] - relayed: [n=2] FALSE, FALSE [18:42:20.903] - queued futures: [n=2] FALSE, TRUE [18:42:20.903] signalConditionsASAP(NULL, pos=2) ... done [18:42:20.904] length: 1 (resolved future 2) [18:42:20.975] receiveMessageFromWorker() for ClusterFuture ... [18:42:20.976] - Validating connection of MultisessionFuture [18:42:20.976] - received message: FutureResult [18:42:20.976] - Received FutureResult [18:42:20.976] - Erased future from FutureRegistry [18:42:20.976] result() for ClusterFuture ... [18:42:20.977] - result already collected: FutureResult [18:42:20.977] result() for ClusterFuture ... done [18:42:20.977] receiveMessageFromWorker() for ClusterFuture ... done [18:42:20.977] Future #1 [18:42:20.977] result() for ClusterFuture ... [18:42:20.978] - result already collected: FutureResult [18:42:20.978] result() for ClusterFuture ... done [18:42:20.978] result() for ClusterFuture ... [18:42:20.978] - result already collected: FutureResult [18:42:20.978] result() for ClusterFuture ... done [18:42:20.978] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:42:20.978] - nx: 2 [18:42:20.979] - relay: TRUE [18:42:20.979] - stdout: TRUE [18:42:20.979] - signal: TRUE [18:42:20.979] - resignal: FALSE [18:42:20.979] - force: TRUE [18:42:20.979] - relayed: [n=2] FALSE, FALSE [18:42:20.980] - queued futures: [n=2] FALSE, TRUE [18:42:20.980] - until=1 [18:42:20.980] - relaying element #1 [18:42:20.980] result() for ClusterFuture ... [18:42:20.980] - result already collected: FutureResult [18:42:20.980] result() for ClusterFuture ... done [18:42:20.981] result() for ClusterFuture ... [18:42:20.981] - result already collected: FutureResult [18:42:20.981] result() for ClusterFuture ... done [18:42:20.981] result() for ClusterFuture ... [18:42:20.981] - result already collected: FutureResult [18:42:20.981] result() for ClusterFuture ... done [18:42:20.981] result() for ClusterFuture ... [18:42:20.982] - result already collected: FutureResult [18:42:20.982] result() for ClusterFuture ... done [18:42:20.982] - relayed: [n=2] TRUE, FALSE [18:42:20.982] - queued futures: [n=2] TRUE, TRUE [18:42:20.982] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:42:20.982] length: 0 (resolved future 1) [18:42:20.983] Relaying remaining futures [18:42:20.983] signalConditionsASAP(NULL, pos=0) ... [18:42:20.983] - nx: 2 [18:42:20.983] - relay: TRUE [18:42:20.983] - stdout: TRUE [18:42:20.983] - signal: TRUE [18:42:20.983] - resignal: FALSE [18:42:20.984] - force: TRUE [18:42:20.984] - relayed: [n=2] TRUE, FALSE [18:42:20.984] - queued futures: [n=2] TRUE, TRUE - flush all [18:42:20.984] - relaying element #2 [18:42:20.984] result() for ClusterFuture ... [18:42:20.985] - result already collected: FutureResult [18:42:20.985] result() for ClusterFuture ... done [18:42:20.985] result() for ClusterFuture ... [18:42:20.985] - result already collected: FutureResult [18:42:20.985] result() for ClusterFuture ... done [18:42:20.985] result() for ClusterFuture ... [18:42:20.985] - result already collected: FutureResult [18:42:20.986] result() for ClusterFuture ... done [18:42:20.986] result() for ClusterFuture ... [18:42:20.986] - result already collected: FutureResult [18:42:20.986] result() for ClusterFuture ... done [18:42:20.986] - relayed: [n=2] TRUE, TRUE [18:42:20.986] - queued futures: [n=2] TRUE, TRUE [18:42:20.987] signalConditionsASAP(MultisessionFuture, pos=0) ... done [18:42:20.987] resolve() on list ... DONE [18:42:20.987] result() for ClusterFuture ... [18:42:20.987] - result already collected: FutureResult [18:42:20.987] result() for ClusterFuture ... done [18:42:20.987] result() for ClusterFuture ... [18:42:20.988] - result already collected: FutureResult [18:42:20.988] result() for ClusterFuture ... done [18:42:20.988] result() for ClusterFuture ... [18:42:20.988] - result already collected: FutureResult [18:42:20.988] result() for ClusterFuture ... done [18:42:20.988] result() for ClusterFuture ... [18:42:20.988] - result already collected: FutureResult [18:42:20.989] result() for ClusterFuture ... done [18:42:20.989] - Number of value chunks collected: 2 [18:42:20.989] Resolving 2 futures (chunks) ... DONE [18:42:20.989] Reducing values from 2 chunks ... [18:42:20.989] - Number of values collected after concatenation: 2 [18:42:20.989] - Number of values expected: 2 [18:42:20.990] Reducing values from 2 chunks ... DONE [18:42:20.990] future_mapply() ... DONE * future_mapply(x, ..., future.stdout = NA) ... DONE * plan('multisession') ... DONE - Testing with 2 cores ... DONE > > message("*** future_*apply() and 'future.stdout' ... DONE") *** future_*apply() and 'future.stdout' ... DONE > > source("incl/end.R") [18:42:20.991] plan(): Setting new future strategy stack: [18:42:20.991] List of future strategies: [18:42:20.991] 1. FutureStrategy: [18:42:20.991] - args: function (..., envir = parent.frame(), workers = "") [18:42:20.991] - tweaked: FALSE [18:42:20.991] - call: future::plan(oplan) [18:42:21.000] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 2.28 0.15 12.31