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:41:40.296] plan(): Setting new future strategy stack: [18:41:40.297] List of future strategies: [18:41:40.297] 1. sequential: [18:41:40.297] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.297] - tweaked: FALSE [18:41:40.297] - call: future::plan("sequential") [18:41:40.312] plan(): nbrOfWorkers() = 1 > > message("*** future_sapply() ...") *** future_sapply() ... > > xs <- list( + A = c(a = 1, b = 2, c = 3), + B = c(a = 1:2, b = 2:3, c = 3:4), + C = letters[1:3], + D = structure(10 * 5:8, names = LETTERS[1:4]) + ) > > FUNS <- list( + a = identity, + b = as.matrix, + c = function(x, y = 2 * 1:5) outer(rep(x, length.out = 3L), y) + ) > > for (strategy in supportedStrategies()) { + message(sprintf("*** strategy = %s ...", sQuote(strategy))) + plan(strategy) + + for (x in xs) { + FUNS_x <- FUNS + if (!is.numeric(x)) FUNS_x[["c"]] <- NULL + + for (USE.NAMES in list(FALSE, TRUE)) { + for (simplify in list(FALSE, TRUE, "array")) { + for (FUN in FUNS_x) { + y0 <- sapply(x, FUN = FUN, + USE.NAMES = USE.NAMES, simplify = simplify) + y1 <- future_sapply(x, FUN = FUN, + USE.NAMES = USE.NAMES, simplify = simplify) + str(list(y0 = y0, y1 = y1)) + stopifnot(identical(y1, y0)) + if (identical(simplify, FALSE)) { + y2 <- lapply(x, FUN = FUN) + str(list(y0 = y0, y2 = y2)) + stopifnot(identical(unname(y2), unname(y0))) + } + } + } + } + } + + y0 <- sapply(1:3, FUN = "sqrt") + y1 <- future_sapply(1:3, FUN = "sqrt") + stopifnot(identical(y1, y0)) + + ## https://github.com/futureverse/future.apply/issues/61 + compute <- function(a, x_vec) a + x_vec + call_compute <- function(..., x_vec = 1:2){ + compute_with_dots <- function(x) compute(..., x_vec = x) + future_sapply(x_vec, FUN = compute_with_dots) + } + y <- call_compute(0L) + print(y) + stopifnot(identical(y, 1:2)) + + plan(sequential) + message(sprintf("*** strategy = %s ... done", sQuote(strategy))) + } ## for (strategy in ...) *** strategy = 'sequential' ... [18:41:40.344] plan(): Setting new future strategy stack: [18:41:40.344] List of future strategies: [18:41:40.344] 1. sequential: [18:41:40.344] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.344] - tweaked: FALSE [18:41:40.344] - call: plan(strategy) [18:41:40.358] plan(): nbrOfWorkers() = 1 [18:41:40.358] future_lapply() ... [18:41:40.362] Number of chunks: 1 [18:41:40.362] getGlobalsAndPackagesXApply() ... [18:41:40.362] - future.globals: TRUE [18:41:40.363] getGlobalsAndPackages() ... [18:41:40.363] Searching for globals... [18:41:40.366] - globals found: [1] 'FUN' [18:41:40.367] Searching for globals ... DONE [18:41:40.367] Resolving globals: FALSE [18:41:40.368] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:40.368] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:40.369] - globals: [1] 'FUN' [18:41:40.369] [18:41:40.369] getGlobalsAndPackages() ... DONE [18:41:40.369] - globals found/used: [n=1] 'FUN' [18:41:40.369] - needed namespaces: [n=0] [18:41:40.370] Finding globals ... DONE [18:41:40.370] - use_args: TRUE [18:41:40.370] - Getting '...' globals ... [18:41:40.371] resolve() on list ... [18:41:40.371] recursive: 0 [18:41:40.371] length: 1 [18:41:40.372] elements: '...' [18:41:40.372] length: 0 (resolved future 1) [18:41:40.372] resolve() on list ... DONE [18:41:40.372] - '...' content: [n=0] [18:41:40.372] List of 1 [18:41:40.372] $ ...: list() [18:41:40.372] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.372] - attr(*, "where")=List of 1 [18:41:40.372] ..$ ...: [18:41:40.372] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.372] - attr(*, "resolved")= logi TRUE [18:41:40.372] - attr(*, "total_size")= num NA [18:41:40.377] - Getting '...' globals ... DONE [18:41:40.378] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.378] List of 2 [18:41:40.378] $ ...future.FUN:function (x) [18:41:40.378] $ ... : list() [18:41:40.378] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.378] - attr(*, "where")=List of 2 [18:41:40.378] ..$ ...future.FUN: [18:41:40.378] ..$ ... : [18:41:40.378] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.378] - attr(*, "resolved")= logi FALSE [18:41:40.378] - attr(*, "total_size")= int 4876 [18:41:40.383] Packages to be attached in all futures: [n=0] [18:41:40.384] getGlobalsAndPackagesXApply() ... DONE [18:41:40.384] Number of futures (= number of chunks): 1 [18:41:40.384] Launching 1 futures (chunks) ... [18:41:40.384] Chunk #1 of 1 ... [18:41:40.385] - Finding globals in 'X' for chunk #1 ... [18:41:40.385] getGlobalsAndPackages() ... [18:41:40.385] Searching for globals... [18:41:40.385] [18:41:40.385] Searching for globals ... DONE [18:41:40.386] - globals: [0] [18:41:40.386] getGlobalsAndPackages() ... DONE [18:41:40.386] + additional globals found: [n=0] [18:41:40.386] + additional namespaces needed: [n=0] [18:41:40.386] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.386] - seeds: [18:41:40.387] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.387] getGlobalsAndPackages() ... [18:41:40.387] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.387] Resolving globals: FALSE [18:41:40.387] Tweak future expression to call with '...' arguments ... [18:41:40.388] { [18:41:40.388] do.call(function(...) { [18:41:40.388] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.388] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.388] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.388] on.exit(options(oopts), add = TRUE) [18:41:40.388] } [18:41:40.388] { [18:41:40.388] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.388] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.388] ...future.FUN(...future.X_jj, ...) [18:41:40.388] }) [18:41:40.388] } [18:41:40.388] }, args = future.call.arguments) [18:41:40.388] } [18:41:40.388] Tweak future expression to call with '...' arguments ... DONE [18:41:40.388] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.389] [18:41:40.389] getGlobalsAndPackages() ... DONE [18:41:40.390] run() for 'Future' ... [18:41:40.390] - state: 'created' [18:41:40.390] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.391] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.391] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.391] - Field: 'label' [18:41:40.391] - Field: 'local' [18:41:40.391] - Field: 'owner' [18:41:40.392] - Field: 'envir' [18:41:40.392] - Field: 'packages' [18:41:40.392] - Field: 'gc' [18:41:40.392] - Field: 'conditions' [18:41:40.392] - Field: 'expr' [18:41:40.392] - Field: 'uuid' [18:41:40.393] - Field: 'seed' [18:41:40.393] - Field: 'version' [18:41:40.393] - Field: 'result' [18:41:40.393] - Field: 'asynchronous' [18:41:40.393] - Field: 'calls' [18:41:40.393] - Field: 'globals' [18:41:40.394] - Field: 'stdout' [18:41:40.394] - Field: 'earlySignal' [18:41:40.394] - Field: 'lazy' [18:41:40.394] - Field: 'state' [18:41:40.394] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.395] - Launch lazy future ... [18:41:40.396] Packages needed by the future expression (n = 0): [18:41:40.396] Packages needed by future strategies (n = 0): [18:41:40.397] { [18:41:40.397] { [18:41:40.397] { [18:41:40.397] ...future.startTime <- base::Sys.time() [18:41:40.397] { [18:41:40.397] { [18:41:40.397] { [18:41:40.397] base::local({ [18:41:40.397] has_future <- base::requireNamespace("future", [18:41:40.397] quietly = TRUE) [18:41:40.397] if (has_future) { [18:41:40.397] ns <- base::getNamespace("future") [18:41:40.397] version <- ns[[".package"]][["version"]] [18:41:40.397] if (is.null(version)) [18:41:40.397] version <- utils::packageVersion("future") [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] version <- NULL [18:41:40.397] } [18:41:40.397] if (!has_future || version < "1.8.0") { [18:41:40.397] info <- base::c(r_version = base::gsub("R version ", [18:41:40.397] "", base::R.version$version.string), [18:41:40.397] platform = base::sprintf("%s (%s-bit)", [18:41:40.397] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.397] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.397] "release", "version")], collapse = " "), [18:41:40.397] hostname = base::Sys.info()[["nodename"]]) [18:41:40.397] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.397] info) [18:41:40.397] info <- base::paste(info, collapse = "; ") [18:41:40.397] if (!has_future) { [18:41:40.397] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.397] info) [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.397] info, version) [18:41:40.397] } [18:41:40.397] base::stop(msg) [18:41:40.397] } [18:41:40.397] }) [18:41:40.397] } [18:41:40.397] ...future.strategy.old <- future::plan("list") [18:41:40.397] options(future.plan = NULL) [18:41:40.397] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.397] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.397] } [18:41:40.397] ...future.workdir <- getwd() [18:41:40.397] } [18:41:40.397] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.397] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.397] } [18:41:40.397] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.397] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.397] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.397] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.397] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.397] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.397] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.397] base::names(...future.oldOptions)) [18:41:40.397] } [18:41:40.397] if (FALSE) { [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] if (TRUE) { [18:41:40.397] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.397] open = "w") [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.397] windows = "NUL", "/dev/null"), open = "w") [18:41:40.397] } [18:41:40.397] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.397] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.397] base::sink(type = "output", split = FALSE) [18:41:40.397] base::close(...future.stdout) [18:41:40.397] }, add = TRUE) [18:41:40.397] } [18:41:40.397] ...future.frame <- base::sys.nframe() [18:41:40.397] ...future.conditions <- base::list() [18:41:40.397] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.397] if (FALSE) { [18:41:40.397] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.397] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.397] } [18:41:40.397] ...future.result <- base::tryCatch({ [18:41:40.397] base::withCallingHandlers({ [18:41:40.397] ...future.value <- base::withVisible(base::local({ [18:41:40.397] do.call(function(...) { [18:41:40.397] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.397] if (!identical(...future.globals.maxSize.org, [18:41:40.397] ...future.globals.maxSize)) { [18:41:40.397] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.397] on.exit(options(oopts), add = TRUE) [18:41:40.397] } [18:41:40.397] { [18:41:40.397] lapply(seq_along(...future.elements_ii), [18:41:40.397] FUN = function(jj) { [18:41:40.397] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.397] ...future.FUN(...future.X_jj, ...) [18:41:40.397] }) [18:41:40.397] } [18:41:40.397] }, args = future.call.arguments) [18:41:40.397] })) [18:41:40.397] future::FutureResult(value = ...future.value$value, [18:41:40.397] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.397] ...future.rng), globalenv = if (FALSE) [18:41:40.397] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.397] ...future.globalenv.names)) [18:41:40.397] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.397] }, condition = base::local({ [18:41:40.397] c <- base::c [18:41:40.397] inherits <- base::inherits [18:41:40.397] invokeRestart <- base::invokeRestart [18:41:40.397] length <- base::length [18:41:40.397] list <- base::list [18:41:40.397] seq.int <- base::seq.int [18:41:40.397] signalCondition <- base::signalCondition [18:41:40.397] sys.calls <- base::sys.calls [18:41:40.397] `[[` <- base::`[[` [18:41:40.397] `+` <- base::`+` [18:41:40.397] `<<-` <- base::`<<-` [18:41:40.397] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.397] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.397] 3L)] [18:41:40.397] } [18:41:40.397] function(cond) { [18:41:40.397] is_error <- inherits(cond, "error") [18:41:40.397] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.397] NULL) [18:41:40.397] if (is_error) { [18:41:40.397] sessionInformation <- function() { [18:41:40.397] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.397] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.397] search = base::search(), system = base::Sys.info()) [18:41:40.397] } [18:41:40.397] ...future.conditions[[length(...future.conditions) + [18:41:40.397] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.397] cond$call), session = sessionInformation(), [18:41:40.397] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.397] signalCondition(cond) [18:41:40.397] } [18:41:40.397] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.397] "immediateCondition"))) { [18:41:40.397] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.397] ...future.conditions[[length(...future.conditions) + [18:41:40.397] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.397] if (TRUE && !signal) { [18:41:40.397] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.397] { [18:41:40.397] inherits <- base::inherits [18:41:40.397] invokeRestart <- base::invokeRestart [18:41:40.397] is.null <- base::is.null [18:41:40.397] muffled <- FALSE [18:41:40.397] if (inherits(cond, "message")) { [18:41:40.397] muffled <- grepl(pattern, "muffleMessage") [18:41:40.397] if (muffled) [18:41:40.397] invokeRestart("muffleMessage") [18:41:40.397] } [18:41:40.397] else if (inherits(cond, "warning")) { [18:41:40.397] muffled <- grepl(pattern, "muffleWarning") [18:41:40.397] if (muffled) [18:41:40.397] invokeRestart("muffleWarning") [18:41:40.397] } [18:41:40.397] else if (inherits(cond, "condition")) { [18:41:40.397] if (!is.null(pattern)) { [18:41:40.397] computeRestarts <- base::computeRestarts [18:41:40.397] grepl <- base::grepl [18:41:40.397] restarts <- computeRestarts(cond) [18:41:40.397] for (restart in restarts) { [18:41:40.397] name <- restart$name [18:41:40.397] if (is.null(name)) [18:41:40.397] next [18:41:40.397] if (!grepl(pattern, name)) [18:41:40.397] next [18:41:40.397] invokeRestart(restart) [18:41:40.397] muffled <- TRUE [18:41:40.397] break [18:41:40.397] } [18:41:40.397] } [18:41:40.397] } [18:41:40.397] invisible(muffled) [18:41:40.397] } [18:41:40.397] muffleCondition(cond, pattern = "^muffle") [18:41:40.397] } [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] if (TRUE) { [18:41:40.397] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.397] { [18:41:40.397] inherits <- base::inherits [18:41:40.397] invokeRestart <- base::invokeRestart [18:41:40.397] is.null <- base::is.null [18:41:40.397] muffled <- FALSE [18:41:40.397] if (inherits(cond, "message")) { [18:41:40.397] muffled <- grepl(pattern, "muffleMessage") [18:41:40.397] if (muffled) [18:41:40.397] invokeRestart("muffleMessage") [18:41:40.397] } [18:41:40.397] else if (inherits(cond, "warning")) { [18:41:40.397] muffled <- grepl(pattern, "muffleWarning") [18:41:40.397] if (muffled) [18:41:40.397] invokeRestart("muffleWarning") [18:41:40.397] } [18:41:40.397] else if (inherits(cond, "condition")) { [18:41:40.397] if (!is.null(pattern)) { [18:41:40.397] computeRestarts <- base::computeRestarts [18:41:40.397] grepl <- base::grepl [18:41:40.397] restarts <- computeRestarts(cond) [18:41:40.397] for (restart in restarts) { [18:41:40.397] name <- restart$name [18:41:40.397] if (is.null(name)) [18:41:40.397] next [18:41:40.397] if (!grepl(pattern, name)) [18:41:40.397] next [18:41:40.397] invokeRestart(restart) [18:41:40.397] muffled <- TRUE [18:41:40.397] break [18:41:40.397] } [18:41:40.397] } [18:41:40.397] } [18:41:40.397] invisible(muffled) [18:41:40.397] } [18:41:40.397] muffleCondition(cond, pattern = "^muffle") [18:41:40.397] } [18:41:40.397] } [18:41:40.397] } [18:41:40.397] })) [18:41:40.397] }, error = function(ex) { [18:41:40.397] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.397] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.397] ...future.rng), started = ...future.startTime, [18:41:40.397] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.397] version = "1.8"), class = "FutureResult") [18:41:40.397] }, finally = { [18:41:40.397] if (!identical(...future.workdir, getwd())) [18:41:40.397] setwd(...future.workdir) [18:41:40.397] { [18:41:40.397] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.397] ...future.oldOptions$nwarnings <- NULL [18:41:40.397] } [18:41:40.397] base::options(...future.oldOptions) [18:41:40.397] if (.Platform$OS.type == "windows") { [18:41:40.397] old_names <- names(...future.oldEnvVars) [18:41:40.397] envs <- base::Sys.getenv() [18:41:40.397] names <- names(envs) [18:41:40.397] common <- intersect(names, old_names) [18:41:40.397] added <- setdiff(names, old_names) [18:41:40.397] removed <- setdiff(old_names, names) [18:41:40.397] changed <- common[...future.oldEnvVars[common] != [18:41:40.397] envs[common]] [18:41:40.397] NAMES <- toupper(changed) [18:41:40.397] args <- list() [18:41:40.397] for (kk in seq_along(NAMES)) { [18:41:40.397] name <- changed[[kk]] [18:41:40.397] NAME <- NAMES[[kk]] [18:41:40.397] if (name != NAME && is.element(NAME, old_names)) [18:41:40.397] next [18:41:40.397] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.397] } [18:41:40.397] NAMES <- toupper(added) [18:41:40.397] for (kk in seq_along(NAMES)) { [18:41:40.397] name <- added[[kk]] [18:41:40.397] NAME <- NAMES[[kk]] [18:41:40.397] if (name != NAME && is.element(NAME, old_names)) [18:41:40.397] next [18:41:40.397] args[[name]] <- "" [18:41:40.397] } [18:41:40.397] NAMES <- toupper(removed) [18:41:40.397] for (kk in seq_along(NAMES)) { [18:41:40.397] name <- removed[[kk]] [18:41:40.397] NAME <- NAMES[[kk]] [18:41:40.397] if (name != NAME && is.element(NAME, old_names)) [18:41:40.397] next [18:41:40.397] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.397] } [18:41:40.397] if (length(args) > 0) [18:41:40.397] base::do.call(base::Sys.setenv, args = args) [18:41:40.397] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.397] } [18:41:40.397] { [18:41:40.397] if (base::length(...future.futureOptionsAdded) > [18:41:40.397] 0L) { [18:41:40.397] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.397] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.397] base::options(opts) [18:41:40.397] } [18:41:40.397] { [18:41:40.397] { [18:41:40.397] NULL [18:41:40.397] RNGkind("Mersenne-Twister") [18:41:40.397] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.397] inherits = FALSE) [18:41:40.397] } [18:41:40.397] options(future.plan = NULL) [18:41:40.397] if (is.na(NA_character_)) [18:41:40.397] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.397] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.397] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.397] .init = FALSE) [18:41:40.397] } [18:41:40.397] } [18:41:40.397] } [18:41:40.397] }) [18:41:40.397] if (TRUE) { [18:41:40.397] base::sink(type = "output", split = FALSE) [18:41:40.397] if (TRUE) { [18:41:40.397] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.397] } [18:41:40.397] else { [18:41:40.397] ...future.result["stdout"] <- base::list(NULL) [18:41:40.397] } [18:41:40.397] base::close(...future.stdout) [18:41:40.397] ...future.stdout <- NULL [18:41:40.397] } [18:41:40.397] ...future.result$conditions <- ...future.conditions [18:41:40.397] ...future.result$finished <- base::Sys.time() [18:41:40.397] ...future.result [18:41:40.397] } [18:41:40.401] assign_globals() ... [18:41:40.401] List of 5 [18:41:40.401] $ ...future.FUN :function (x) [18:41:40.401] $ future.call.arguments : list() [18:41:40.401] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.401] $ ...future.elements_ii :List of 3 [18:41:40.401] ..$ a: num 1 [18:41:40.401] ..$ b: num 2 [18:41:40.401] ..$ c: num 3 [18:41:40.401] $ ...future.seeds_ii : NULL [18:41:40.401] $ ...future.globals.maxSize: NULL [18:41:40.401] - attr(*, "where")=List of 5 [18:41:40.401] ..$ ...future.FUN : [18:41:40.401] ..$ future.call.arguments : [18:41:40.401] ..$ ...future.elements_ii : [18:41:40.401] ..$ ...future.seeds_ii : [18:41:40.401] ..$ ...future.globals.maxSize: [18:41:40.401] - attr(*, "resolved")= logi FALSE [18:41:40.401] - attr(*, "total_size")= num 4876 [18:41:40.401] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.401] - attr(*, "already-done")= logi TRUE [18:41:40.407] - copied '...future.FUN' to environment [18:41:40.408] - copied 'future.call.arguments' to environment [18:41:40.408] - copied '...future.elements_ii' to environment [18:41:40.408] - copied '...future.seeds_ii' to environment [18:41:40.408] - copied '...future.globals.maxSize' to environment [18:41:40.408] assign_globals() ... done [18:41:40.409] plan(): Setting new future strategy stack: [18:41:40.409] List of future strategies: [18:41:40.409] 1. sequential: [18:41:40.409] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.409] - tweaked: FALSE [18:41:40.409] - call: NULL [18:41:40.410] plan(): nbrOfWorkers() = 1 [18:41:40.412] plan(): Setting new future strategy stack: [18:41:40.412] List of future strategies: [18:41:40.412] 1. sequential: [18:41:40.412] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.412] - tweaked: FALSE [18:41:40.412] - call: plan(strategy) [18:41:40.413] plan(): nbrOfWorkers() = 1 [18:41:40.413] SequentialFuture started (and completed) [18:41:40.415] - Launch lazy future ... done [18:41:40.415] run() for 'SequentialFuture' ... done [18:41:40.415] Created future: [18:41:40.415] SequentialFuture: [18:41:40.415] Label: 'future_sapply-1' [18:41:40.415] Expression: [18:41:40.415] { [18:41:40.415] do.call(function(...) { [18:41:40.415] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.415] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.415] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.415] on.exit(options(oopts), add = TRUE) [18:41:40.415] } [18:41:40.415] { [18:41:40.415] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.415] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.415] ...future.FUN(...future.X_jj, ...) [18:41:40.415] }) [18:41:40.415] } [18:41:40.415] }, args = future.call.arguments) [18:41:40.415] } [18:41:40.415] Lazy evaluation: FALSE [18:41:40.415] Asynchronous evaluation: FALSE [18:41:40.415] Local evaluation: TRUE [18:41:40.415] Environment: R_GlobalEnv [18:41:40.415] Capture standard output: TRUE [18:41:40.415] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.415] Globals: 5 objects totaling 475 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.415] Packages: [18:41:40.415] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.415] Resolved: TRUE [18:41:40.415] Value: 79 bytes of class 'list' [18:41:40.415] Early signaling: FALSE [18:41:40.415] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.415] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.417] Chunk #1 of 1 ... DONE [18:41:40.417] Launching 1 futures (chunks) ... DONE [18:41:40.417] Resolving 1 futures (chunks) ... [18:41:40.417] resolve() on list ... [18:41:40.418] recursive: 0 [18:41:40.418] length: 1 [18:41:40.418] [18:41:40.418] resolved() for 'SequentialFuture' ... [18:41:40.418] - state: 'finished' [18:41:40.419] - run: TRUE [18:41:40.419] - result: 'FutureResult' [18:41:40.419] resolved() for 'SequentialFuture' ... done [18:41:40.419] Future #1 [18:41:40.420] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.420] - nx: 1 [18:41:40.420] - relay: TRUE [18:41:40.420] - stdout: TRUE [18:41:40.420] - signal: TRUE [18:41:40.420] - resignal: FALSE [18:41:40.420] - force: TRUE [18:41:40.421] - relayed: [n=1] FALSE [18:41:40.421] - queued futures: [n=1] FALSE [18:41:40.421] - until=1 [18:41:40.421] - relaying element #1 [18:41:40.421] - relayed: [n=1] TRUE [18:41:40.421] - queued futures: [n=1] TRUE [18:41:40.422] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.422] length: 0 (resolved future 1) [18:41:40.422] Relaying remaining futures [18:41:40.422] signalConditionsASAP(NULL, pos=0) ... [18:41:40.422] - nx: 1 [18:41:40.423] - relay: TRUE [18:41:40.423] - stdout: TRUE [18:41:40.423] - signal: TRUE [18:41:40.423] - resignal: FALSE [18:41:40.423] - force: TRUE [18:41:40.423] - relayed: [n=1] TRUE [18:41:40.423] - queued futures: [n=1] TRUE - flush all [18:41:40.424] - relayed: [n=1] TRUE [18:41:40.424] - queued futures: [n=1] TRUE [18:41:40.424] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.424] resolve() on list ... DONE [18:41:40.424] - Number of value chunks collected: 1 [18:41:40.425] Resolving 1 futures (chunks) ... DONE [18:41:40.425] Reducing values from 1 chunks ... [18:41:40.425] - Number of values collected after concatenation: 3 [18:41:40.425] - Number of values expected: 3 [18:41:40.425] Reducing values from 1 chunks ... DONE [18:41:40.425] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y1:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y2:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 [18:41:40.432] future_lapply() ... [18:41:40.432] Number of chunks: 1 [18:41:40.433] getGlobalsAndPackagesXApply() ... [18:41:40.433] - future.globals: TRUE [18:41:40.433] getGlobalsAndPackages() ... [18:41:40.433] Searching for globals... [18:41:40.434] - globals found: [2] 'FUN', 'UseMethod' [18:41:40.435] Searching for globals ... DONE [18:41:40.435] Resolving globals: FALSE [18:41:40.435] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:40.436] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:40.436] - globals: [1] 'FUN' [18:41:40.436] [18:41:40.436] getGlobalsAndPackages() ... DONE [18:41:40.436] - globals found/used: [n=1] 'FUN' [18:41:40.436] - needed namespaces: [n=0] [18:41:40.437] Finding globals ... DONE [18:41:40.437] - use_args: TRUE [18:41:40.437] - Getting '...' globals ... [18:41:40.437] resolve() on list ... [18:41:40.438] recursive: 0 [18:41:40.438] length: 1 [18:41:40.438] elements: '...' [18:41:40.438] length: 0 (resolved future 1) [18:41:40.438] resolve() on list ... DONE [18:41:40.438] - '...' content: [n=0] [18:41:40.439] List of 1 [18:41:40.439] $ ...: list() [18:41:40.439] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.439] - attr(*, "where")=List of 1 [18:41:40.439] ..$ ...: [18:41:40.439] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.439] - attr(*, "resolved")= logi TRUE [18:41:40.439] - attr(*, "total_size")= num NA [18:41:40.443] - Getting '...' globals ... DONE [18:41:40.443] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.443] List of 2 [18:41:40.443] $ ...future.FUN:function (x, ...) [18:41:40.443] $ ... : list() [18:41:40.443] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.443] - attr(*, "where")=List of 2 [18:41:40.443] ..$ ...future.FUN: [18:41:40.443] ..$ ... : [18:41:40.443] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.443] - attr(*, "resolved")= logi FALSE [18:41:40.443] - attr(*, "total_size")= int 5116 [18:41:40.446] Packages to be attached in all futures: [n=0] [18:41:40.446] getGlobalsAndPackagesXApply() ... DONE [18:41:40.447] Number of futures (= number of chunks): 1 [18:41:40.447] Launching 1 futures (chunks) ... [18:41:40.447] Chunk #1 of 1 ... [18:41:40.447] - Finding globals in 'X' for chunk #1 ... [18:41:40.447] getGlobalsAndPackages() ... [18:41:40.447] Searching for globals... [18:41:40.448] [18:41:40.448] Searching for globals ... DONE [18:41:40.448] - globals: [0] [18:41:40.448] getGlobalsAndPackages() ... DONE [18:41:40.448] + additional globals found: [n=0] [18:41:40.449] + additional namespaces needed: [n=0] [18:41:40.449] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.449] - seeds: [18:41:40.449] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.449] getGlobalsAndPackages() ... [18:41:40.449] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.450] Resolving globals: FALSE [18:41:40.450] Tweak future expression to call with '...' arguments ... [18:41:40.450] { [18:41:40.450] do.call(function(...) { [18:41:40.450] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.450] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.450] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.450] on.exit(options(oopts), add = TRUE) [18:41:40.450] } [18:41:40.450] { [18:41:40.450] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.450] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.450] ...future.FUN(...future.X_jj, ...) [18:41:40.450] }) [18:41:40.450] } [18:41:40.450] }, args = future.call.arguments) [18:41:40.450] } [18:41:40.450] Tweak future expression to call with '...' arguments ... DONE [18:41:40.451] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.451] [18:41:40.451] getGlobalsAndPackages() ... DONE [18:41:40.451] run() for 'Future' ... [18:41:40.452] - state: 'created' [18:41:40.452] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.452] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.452] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.453] - Field: 'label' [18:41:40.453] - Field: 'local' [18:41:40.453] - Field: 'owner' [18:41:40.453] - Field: 'envir' [18:41:40.453] - Field: 'packages' [18:41:40.454] - Field: 'gc' [18:41:40.454] - Field: 'conditions' [18:41:40.454] - Field: 'expr' [18:41:40.454] - Field: 'uuid' [18:41:40.454] - Field: 'seed' [18:41:40.454] - Field: 'version' [18:41:40.455] - Field: 'result' [18:41:40.455] - Field: 'asynchronous' [18:41:40.455] - Field: 'calls' [18:41:40.455] - Field: 'globals' [18:41:40.455] - Field: 'stdout' [18:41:40.455] - Field: 'earlySignal' [18:41:40.456] - Field: 'lazy' [18:41:40.456] - Field: 'state' [18:41:40.456] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.456] - Launch lazy future ... [18:41:40.456] Packages needed by the future expression (n = 0): [18:41:40.457] Packages needed by future strategies (n = 0): [18:41:40.457] { [18:41:40.457] { [18:41:40.457] { [18:41:40.457] ...future.startTime <- base::Sys.time() [18:41:40.457] { [18:41:40.457] { [18:41:40.457] { [18:41:40.457] base::local({ [18:41:40.457] has_future <- base::requireNamespace("future", [18:41:40.457] quietly = TRUE) [18:41:40.457] if (has_future) { [18:41:40.457] ns <- base::getNamespace("future") [18:41:40.457] version <- ns[[".package"]][["version"]] [18:41:40.457] if (is.null(version)) [18:41:40.457] version <- utils::packageVersion("future") [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] version <- NULL [18:41:40.457] } [18:41:40.457] if (!has_future || version < "1.8.0") { [18:41:40.457] info <- base::c(r_version = base::gsub("R version ", [18:41:40.457] "", base::R.version$version.string), [18:41:40.457] platform = base::sprintf("%s (%s-bit)", [18:41:40.457] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.457] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.457] "release", "version")], collapse = " "), [18:41:40.457] hostname = base::Sys.info()[["nodename"]]) [18:41:40.457] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.457] info) [18:41:40.457] info <- base::paste(info, collapse = "; ") [18:41:40.457] if (!has_future) { [18:41:40.457] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.457] info) [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.457] info, version) [18:41:40.457] } [18:41:40.457] base::stop(msg) [18:41:40.457] } [18:41:40.457] }) [18:41:40.457] } [18:41:40.457] ...future.strategy.old <- future::plan("list") [18:41:40.457] options(future.plan = NULL) [18:41:40.457] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.457] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.457] } [18:41:40.457] ...future.workdir <- getwd() [18:41:40.457] } [18:41:40.457] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.457] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.457] } [18:41:40.457] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.457] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.457] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.457] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.457] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.457] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.457] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.457] base::names(...future.oldOptions)) [18:41:40.457] } [18:41:40.457] if (FALSE) { [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] if (TRUE) { [18:41:40.457] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.457] open = "w") [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.457] windows = "NUL", "/dev/null"), open = "w") [18:41:40.457] } [18:41:40.457] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.457] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.457] base::sink(type = "output", split = FALSE) [18:41:40.457] base::close(...future.stdout) [18:41:40.457] }, add = TRUE) [18:41:40.457] } [18:41:40.457] ...future.frame <- base::sys.nframe() [18:41:40.457] ...future.conditions <- base::list() [18:41:40.457] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.457] if (FALSE) { [18:41:40.457] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.457] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.457] } [18:41:40.457] ...future.result <- base::tryCatch({ [18:41:40.457] base::withCallingHandlers({ [18:41:40.457] ...future.value <- base::withVisible(base::local({ [18:41:40.457] do.call(function(...) { [18:41:40.457] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.457] if (!identical(...future.globals.maxSize.org, [18:41:40.457] ...future.globals.maxSize)) { [18:41:40.457] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.457] on.exit(options(oopts), add = TRUE) [18:41:40.457] } [18:41:40.457] { [18:41:40.457] lapply(seq_along(...future.elements_ii), [18:41:40.457] FUN = function(jj) { [18:41:40.457] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.457] ...future.FUN(...future.X_jj, ...) [18:41:40.457] }) [18:41:40.457] } [18:41:40.457] }, args = future.call.arguments) [18:41:40.457] })) [18:41:40.457] future::FutureResult(value = ...future.value$value, [18:41:40.457] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.457] ...future.rng), globalenv = if (FALSE) [18:41:40.457] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.457] ...future.globalenv.names)) [18:41:40.457] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.457] }, condition = base::local({ [18:41:40.457] c <- base::c [18:41:40.457] inherits <- base::inherits [18:41:40.457] invokeRestart <- base::invokeRestart [18:41:40.457] length <- base::length [18:41:40.457] list <- base::list [18:41:40.457] seq.int <- base::seq.int [18:41:40.457] signalCondition <- base::signalCondition [18:41:40.457] sys.calls <- base::sys.calls [18:41:40.457] `[[` <- base::`[[` [18:41:40.457] `+` <- base::`+` [18:41:40.457] `<<-` <- base::`<<-` [18:41:40.457] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.457] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.457] 3L)] [18:41:40.457] } [18:41:40.457] function(cond) { [18:41:40.457] is_error <- inherits(cond, "error") [18:41:40.457] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.457] NULL) [18:41:40.457] if (is_error) { [18:41:40.457] sessionInformation <- function() { [18:41:40.457] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.457] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.457] search = base::search(), system = base::Sys.info()) [18:41:40.457] } [18:41:40.457] ...future.conditions[[length(...future.conditions) + [18:41:40.457] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.457] cond$call), session = sessionInformation(), [18:41:40.457] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.457] signalCondition(cond) [18:41:40.457] } [18:41:40.457] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.457] "immediateCondition"))) { [18:41:40.457] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.457] ...future.conditions[[length(...future.conditions) + [18:41:40.457] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.457] if (TRUE && !signal) { [18:41:40.457] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.457] { [18:41:40.457] inherits <- base::inherits [18:41:40.457] invokeRestart <- base::invokeRestart [18:41:40.457] is.null <- base::is.null [18:41:40.457] muffled <- FALSE [18:41:40.457] if (inherits(cond, "message")) { [18:41:40.457] muffled <- grepl(pattern, "muffleMessage") [18:41:40.457] if (muffled) [18:41:40.457] invokeRestart("muffleMessage") [18:41:40.457] } [18:41:40.457] else if (inherits(cond, "warning")) { [18:41:40.457] muffled <- grepl(pattern, "muffleWarning") [18:41:40.457] if (muffled) [18:41:40.457] invokeRestart("muffleWarning") [18:41:40.457] } [18:41:40.457] else if (inherits(cond, "condition")) { [18:41:40.457] if (!is.null(pattern)) { [18:41:40.457] computeRestarts <- base::computeRestarts [18:41:40.457] grepl <- base::grepl [18:41:40.457] restarts <- computeRestarts(cond) [18:41:40.457] for (restart in restarts) { [18:41:40.457] name <- restart$name [18:41:40.457] if (is.null(name)) [18:41:40.457] next [18:41:40.457] if (!grepl(pattern, name)) [18:41:40.457] next [18:41:40.457] invokeRestart(restart) [18:41:40.457] muffled <- TRUE [18:41:40.457] break [18:41:40.457] } [18:41:40.457] } [18:41:40.457] } [18:41:40.457] invisible(muffled) [18:41:40.457] } [18:41:40.457] muffleCondition(cond, pattern = "^muffle") [18:41:40.457] } [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] if (TRUE) { [18:41:40.457] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.457] { [18:41:40.457] inherits <- base::inherits [18:41:40.457] invokeRestart <- base::invokeRestart [18:41:40.457] is.null <- base::is.null [18:41:40.457] muffled <- FALSE [18:41:40.457] if (inherits(cond, "message")) { [18:41:40.457] muffled <- grepl(pattern, "muffleMessage") [18:41:40.457] if (muffled) [18:41:40.457] invokeRestart("muffleMessage") [18:41:40.457] } [18:41:40.457] else if (inherits(cond, "warning")) { [18:41:40.457] muffled <- grepl(pattern, "muffleWarning") [18:41:40.457] if (muffled) [18:41:40.457] invokeRestart("muffleWarning") [18:41:40.457] } [18:41:40.457] else if (inherits(cond, "condition")) { [18:41:40.457] if (!is.null(pattern)) { [18:41:40.457] computeRestarts <- base::computeRestarts [18:41:40.457] grepl <- base::grepl [18:41:40.457] restarts <- computeRestarts(cond) [18:41:40.457] for (restart in restarts) { [18:41:40.457] name <- restart$name [18:41:40.457] if (is.null(name)) [18:41:40.457] next [18:41:40.457] if (!grepl(pattern, name)) [18:41:40.457] next [18:41:40.457] invokeRestart(restart) [18:41:40.457] muffled <- TRUE [18:41:40.457] break [18:41:40.457] } [18:41:40.457] } [18:41:40.457] } [18:41:40.457] invisible(muffled) [18:41:40.457] } [18:41:40.457] muffleCondition(cond, pattern = "^muffle") [18:41:40.457] } [18:41:40.457] } [18:41:40.457] } [18:41:40.457] })) [18:41:40.457] }, error = function(ex) { [18:41:40.457] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.457] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.457] ...future.rng), started = ...future.startTime, [18:41:40.457] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.457] version = "1.8"), class = "FutureResult") [18:41:40.457] }, finally = { [18:41:40.457] if (!identical(...future.workdir, getwd())) [18:41:40.457] setwd(...future.workdir) [18:41:40.457] { [18:41:40.457] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.457] ...future.oldOptions$nwarnings <- NULL [18:41:40.457] } [18:41:40.457] base::options(...future.oldOptions) [18:41:40.457] if (.Platform$OS.type == "windows") { [18:41:40.457] old_names <- names(...future.oldEnvVars) [18:41:40.457] envs <- base::Sys.getenv() [18:41:40.457] names <- names(envs) [18:41:40.457] common <- intersect(names, old_names) [18:41:40.457] added <- setdiff(names, old_names) [18:41:40.457] removed <- setdiff(old_names, names) [18:41:40.457] changed <- common[...future.oldEnvVars[common] != [18:41:40.457] envs[common]] [18:41:40.457] NAMES <- toupper(changed) [18:41:40.457] args <- list() [18:41:40.457] for (kk in seq_along(NAMES)) { [18:41:40.457] name <- changed[[kk]] [18:41:40.457] NAME <- NAMES[[kk]] [18:41:40.457] if (name != NAME && is.element(NAME, old_names)) [18:41:40.457] next [18:41:40.457] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.457] } [18:41:40.457] NAMES <- toupper(added) [18:41:40.457] for (kk in seq_along(NAMES)) { [18:41:40.457] name <- added[[kk]] [18:41:40.457] NAME <- NAMES[[kk]] [18:41:40.457] if (name != NAME && is.element(NAME, old_names)) [18:41:40.457] next [18:41:40.457] args[[name]] <- "" [18:41:40.457] } [18:41:40.457] NAMES <- toupper(removed) [18:41:40.457] for (kk in seq_along(NAMES)) { [18:41:40.457] name <- removed[[kk]] [18:41:40.457] NAME <- NAMES[[kk]] [18:41:40.457] if (name != NAME && is.element(NAME, old_names)) [18:41:40.457] next [18:41:40.457] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.457] } [18:41:40.457] if (length(args) > 0) [18:41:40.457] base::do.call(base::Sys.setenv, args = args) [18:41:40.457] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.457] } [18:41:40.457] { [18:41:40.457] if (base::length(...future.futureOptionsAdded) > [18:41:40.457] 0L) { [18:41:40.457] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.457] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.457] base::options(opts) [18:41:40.457] } [18:41:40.457] { [18:41:40.457] { [18:41:40.457] NULL [18:41:40.457] RNGkind("Mersenne-Twister") [18:41:40.457] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.457] inherits = FALSE) [18:41:40.457] } [18:41:40.457] options(future.plan = NULL) [18:41:40.457] if (is.na(NA_character_)) [18:41:40.457] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.457] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.457] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.457] .init = FALSE) [18:41:40.457] } [18:41:40.457] } [18:41:40.457] } [18:41:40.457] }) [18:41:40.457] if (TRUE) { [18:41:40.457] base::sink(type = "output", split = FALSE) [18:41:40.457] if (TRUE) { [18:41:40.457] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.457] } [18:41:40.457] else { [18:41:40.457] ...future.result["stdout"] <- base::list(NULL) [18:41:40.457] } [18:41:40.457] base::close(...future.stdout) [18:41:40.457] ...future.stdout <- NULL [18:41:40.457] } [18:41:40.457] ...future.result$conditions <- ...future.conditions [18:41:40.457] ...future.result$finished <- base::Sys.time() [18:41:40.457] ...future.result [18:41:40.457] } [18:41:40.461] assign_globals() ... [18:41:40.461] List of 5 [18:41:40.461] $ ...future.FUN :function (x, ...) [18:41:40.461] $ future.call.arguments : list() [18:41:40.461] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.461] $ ...future.elements_ii :List of 3 [18:41:40.461] ..$ a: num 1 [18:41:40.461] ..$ b: num 2 [18:41:40.461] ..$ c: num 3 [18:41:40.461] $ ...future.seeds_ii : NULL [18:41:40.461] $ ...future.globals.maxSize: NULL [18:41:40.461] - attr(*, "where")=List of 5 [18:41:40.461] ..$ ...future.FUN : [18:41:40.461] ..$ future.call.arguments : [18:41:40.461] ..$ ...future.elements_ii : [18:41:40.461] ..$ ...future.seeds_ii : [18:41:40.461] ..$ ...future.globals.maxSize: [18:41:40.461] - attr(*, "resolved")= logi FALSE [18:41:40.461] - attr(*, "total_size")= num 5116 [18:41:40.461] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.461] - attr(*, "already-done")= logi TRUE [18:41:40.468] - copied '...future.FUN' to environment [18:41:40.469] - copied 'future.call.arguments' to environment [18:41:40.469] - copied '...future.elements_ii' to environment [18:41:40.469] - copied '...future.seeds_ii' to environment [18:41:40.469] - copied '...future.globals.maxSize' to environment [18:41:40.469] assign_globals() ... done [18:41:40.470] plan(): Setting new future strategy stack: [18:41:40.470] List of future strategies: [18:41:40.470] 1. sequential: [18:41:40.470] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.470] - tweaked: FALSE [18:41:40.470] - call: NULL [18:41:40.470] plan(): nbrOfWorkers() = 1 [18:41:40.472] plan(): Setting new future strategy stack: [18:41:40.472] List of future strategies: [18:41:40.472] 1. sequential: [18:41:40.472] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.472] - tweaked: FALSE [18:41:40.472] - call: plan(strategy) [18:41:40.473] plan(): nbrOfWorkers() = 1 [18:41:40.473] SequentialFuture started (and completed) [18:41:40.473] - Launch lazy future ... done [18:41:40.473] run() for 'SequentialFuture' ... done [18:41:40.473] Created future: [18:41:40.474] SequentialFuture: [18:41:40.474] Label: 'future_sapply-1' [18:41:40.474] Expression: [18:41:40.474] { [18:41:40.474] do.call(function(...) { [18:41:40.474] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.474] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.474] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.474] on.exit(options(oopts), add = TRUE) [18:41:40.474] } [18:41:40.474] { [18:41:40.474] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.474] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.474] ...future.FUN(...future.X_jj, ...) [18:41:40.474] }) [18:41:40.474] } [18:41:40.474] }, args = future.call.arguments) [18:41:40.474] } [18:41:40.474] Lazy evaluation: FALSE [18:41:40.474] Asynchronous evaluation: FALSE [18:41:40.474] Local evaluation: TRUE [18:41:40.474] Environment: R_GlobalEnv [18:41:40.474] Capture standard output: TRUE [18:41:40.474] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.474] Globals: 5 objects totaling 568 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.474] Packages: [18:41:40.474] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.474] Resolved: TRUE [18:41:40.474] Value: 174 bytes of class 'list' [18:41:40.474] Early signaling: FALSE [18:41:40.474] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.474] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.475] Chunk #1 of 1 ... DONE [18:41:40.475] Launching 1 futures (chunks) ... DONE [18:41:40.475] Resolving 1 futures (chunks) ... [18:41:40.475] resolve() on list ... [18:41:40.475] recursive: 0 [18:41:40.475] length: 1 [18:41:40.476] [18:41:40.476] resolved() for 'SequentialFuture' ... [18:41:40.476] - state: 'finished' [18:41:40.476] - run: TRUE [18:41:40.476] - result: 'FutureResult' [18:41:40.477] resolved() for 'SequentialFuture' ... done [18:41:40.477] Future #1 [18:41:40.477] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.477] - nx: 1 [18:41:40.477] - relay: TRUE [18:41:40.477] - stdout: TRUE [18:41:40.478] - signal: TRUE [18:41:40.478] - resignal: FALSE [18:41:40.478] - force: TRUE [18:41:40.478] - relayed: [n=1] FALSE [18:41:40.478] - queued futures: [n=1] FALSE [18:41:40.478] - until=1 [18:41:40.478] - relaying element #1 [18:41:40.479] - relayed: [n=1] TRUE [18:41:40.479] - queued futures: [n=1] TRUE [18:41:40.479] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.479] length: 0 (resolved future 1) [18:41:40.479] Relaying remaining futures [18:41:40.480] signalConditionsASAP(NULL, pos=0) ... [18:41:40.480] - nx: 1 [18:41:40.480] - relay: TRUE [18:41:40.480] - stdout: TRUE [18:41:40.480] - signal: TRUE [18:41:40.480] - resignal: FALSE [18:41:40.480] - force: TRUE [18:41:40.481] - relayed: [n=1] TRUE [18:41:40.481] - queued futures: [n=1] TRUE - flush all [18:41:40.481] - relayed: [n=1] TRUE [18:41:40.481] - queued futures: [n=1] TRUE [18:41:40.481] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.481] resolve() on list ... DONE [18:41:40.482] - Number of value chunks collected: 1 [18:41:40.482] Resolving 1 futures (chunks) ... DONE [18:41:40.482] Reducing values from 1 chunks ... [18:41:40.482] - Number of values collected after concatenation: 3 [18:41:40.482] - Number of values expected: 3 [18:41:40.482] Reducing values from 1 chunks ... DONE [18:41:40.483] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y1:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y2:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 [18:41:40.492] future_lapply() ... [18:41:40.495] Number of chunks: 1 [18:41:40.496] getGlobalsAndPackagesXApply() ... [18:41:40.496] - future.globals: TRUE [18:41:40.496] getGlobalsAndPackages() ... [18:41:40.496] Searching for globals... [18:41:40.498] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:40.498] Searching for globals ... DONE [18:41:40.498] Resolving globals: FALSE [18:41:40.499] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:40.499] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:40.499] - globals: [1] 'FUN' [18:41:40.500] [18:41:40.500] getGlobalsAndPackages() ... DONE [18:41:40.500] - globals found/used: [n=1] 'FUN' [18:41:40.500] - needed namespaces: [n=0] [18:41:40.500] Finding globals ... DONE [18:41:40.500] - use_args: TRUE [18:41:40.501] - Getting '...' globals ... [18:41:40.501] resolve() on list ... [18:41:40.501] recursive: 0 [18:41:40.501] length: 1 [18:41:40.501] elements: '...' [18:41:40.502] length: 0 (resolved future 1) [18:41:40.502] resolve() on list ... DONE [18:41:40.502] - '...' content: [n=0] [18:41:40.502] List of 1 [18:41:40.502] $ ...: list() [18:41:40.502] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.502] - attr(*, "where")=List of 1 [18:41:40.502] ..$ ...: [18:41:40.502] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.502] - attr(*, "resolved")= logi TRUE [18:41:40.502] - attr(*, "total_size")= num NA [18:41:40.505] - Getting '...' globals ... DONE [18:41:40.505] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.505] List of 2 [18:41:40.505] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:40.505] $ ... : list() [18:41:40.505] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.505] - attr(*, "where")=List of 2 [18:41:40.505] ..$ ...future.FUN: [18:41:40.505] ..$ ... : [18:41:40.505] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.505] - attr(*, "resolved")= logi FALSE [18:41:40.505] - attr(*, "total_size")= int 6598 [18:41:40.509] Packages to be attached in all futures: [n=0] [18:41:40.509] getGlobalsAndPackagesXApply() ... DONE [18:41:40.509] Number of futures (= number of chunks): 1 [18:41:40.509] Launching 1 futures (chunks) ... [18:41:40.509] Chunk #1 of 1 ... [18:41:40.510] - Finding globals in 'X' for chunk #1 ... [18:41:40.510] getGlobalsAndPackages() ... [18:41:40.510] Searching for globals... [18:41:40.511] [18:41:40.512] Searching for globals ... DONE [18:41:40.512] - globals: [0] [18:41:40.512] getGlobalsAndPackages() ... DONE [18:41:40.512] + additional globals found: [n=0] [18:41:40.512] + additional namespaces needed: [n=0] [18:41:40.512] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.512] - seeds: [18:41:40.513] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.513] getGlobalsAndPackages() ... [18:41:40.513] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.513] Resolving globals: FALSE [18:41:40.513] Tweak future expression to call with '...' arguments ... [18:41:40.514] { [18:41:40.514] do.call(function(...) { [18:41:40.514] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.514] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.514] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.514] on.exit(options(oopts), add = TRUE) [18:41:40.514] } [18:41:40.514] { [18:41:40.514] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.514] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.514] ...future.FUN(...future.X_jj, ...) [18:41:40.514] }) [18:41:40.514] } [18:41:40.514] }, args = future.call.arguments) [18:41:40.514] } [18:41:40.514] Tweak future expression to call with '...' arguments ... DONE [18:41:40.514] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.515] [18:41:40.515] getGlobalsAndPackages() ... DONE [18:41:40.515] run() for 'Future' ... [18:41:40.515] - state: 'created' [18:41:40.516] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.516] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.516] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.516] - Field: 'label' [18:41:40.516] - Field: 'local' [18:41:40.517] - Field: 'owner' [18:41:40.517] - Field: 'envir' [18:41:40.517] - Field: 'packages' [18:41:40.517] - Field: 'gc' [18:41:40.517] - Field: 'conditions' [18:41:40.518] - Field: 'expr' [18:41:40.518] - Field: 'uuid' [18:41:40.518] - Field: 'seed' [18:41:40.518] - Field: 'version' [18:41:40.518] - Field: 'result' [18:41:40.518] - Field: 'asynchronous' [18:41:40.519] - Field: 'calls' [18:41:40.519] - Field: 'globals' [18:41:40.519] - Field: 'stdout' [18:41:40.519] - Field: 'earlySignal' [18:41:40.519] - Field: 'lazy' [18:41:40.519] - Field: 'state' [18:41:40.520] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.520] - Launch lazy future ... [18:41:40.520] Packages needed by the future expression (n = 0): [18:41:40.520] Packages needed by future strategies (n = 0): [18:41:40.521] { [18:41:40.521] { [18:41:40.521] { [18:41:40.521] ...future.startTime <- base::Sys.time() [18:41:40.521] { [18:41:40.521] { [18:41:40.521] { [18:41:40.521] base::local({ [18:41:40.521] has_future <- base::requireNamespace("future", [18:41:40.521] quietly = TRUE) [18:41:40.521] if (has_future) { [18:41:40.521] ns <- base::getNamespace("future") [18:41:40.521] version <- ns[[".package"]][["version"]] [18:41:40.521] if (is.null(version)) [18:41:40.521] version <- utils::packageVersion("future") [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] version <- NULL [18:41:40.521] } [18:41:40.521] if (!has_future || version < "1.8.0") { [18:41:40.521] info <- base::c(r_version = base::gsub("R version ", [18:41:40.521] "", base::R.version$version.string), [18:41:40.521] platform = base::sprintf("%s (%s-bit)", [18:41:40.521] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.521] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.521] "release", "version")], collapse = " "), [18:41:40.521] hostname = base::Sys.info()[["nodename"]]) [18:41:40.521] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.521] info) [18:41:40.521] info <- base::paste(info, collapse = "; ") [18:41:40.521] if (!has_future) { [18:41:40.521] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.521] info) [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.521] info, version) [18:41:40.521] } [18:41:40.521] base::stop(msg) [18:41:40.521] } [18:41:40.521] }) [18:41:40.521] } [18:41:40.521] ...future.strategy.old <- future::plan("list") [18:41:40.521] options(future.plan = NULL) [18:41:40.521] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.521] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.521] } [18:41:40.521] ...future.workdir <- getwd() [18:41:40.521] } [18:41:40.521] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.521] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.521] } [18:41:40.521] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.521] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.521] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.521] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.521] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.521] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.521] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.521] base::names(...future.oldOptions)) [18:41:40.521] } [18:41:40.521] if (FALSE) { [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] if (TRUE) { [18:41:40.521] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.521] open = "w") [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.521] windows = "NUL", "/dev/null"), open = "w") [18:41:40.521] } [18:41:40.521] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.521] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.521] base::sink(type = "output", split = FALSE) [18:41:40.521] base::close(...future.stdout) [18:41:40.521] }, add = TRUE) [18:41:40.521] } [18:41:40.521] ...future.frame <- base::sys.nframe() [18:41:40.521] ...future.conditions <- base::list() [18:41:40.521] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.521] if (FALSE) { [18:41:40.521] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.521] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.521] } [18:41:40.521] ...future.result <- base::tryCatch({ [18:41:40.521] base::withCallingHandlers({ [18:41:40.521] ...future.value <- base::withVisible(base::local({ [18:41:40.521] do.call(function(...) { [18:41:40.521] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.521] if (!identical(...future.globals.maxSize.org, [18:41:40.521] ...future.globals.maxSize)) { [18:41:40.521] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.521] on.exit(options(oopts), add = TRUE) [18:41:40.521] } [18:41:40.521] { [18:41:40.521] lapply(seq_along(...future.elements_ii), [18:41:40.521] FUN = function(jj) { [18:41:40.521] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.521] ...future.FUN(...future.X_jj, ...) [18:41:40.521] }) [18:41:40.521] } [18:41:40.521] }, args = future.call.arguments) [18:41:40.521] })) [18:41:40.521] future::FutureResult(value = ...future.value$value, [18:41:40.521] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.521] ...future.rng), globalenv = if (FALSE) [18:41:40.521] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.521] ...future.globalenv.names)) [18:41:40.521] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.521] }, condition = base::local({ [18:41:40.521] c <- base::c [18:41:40.521] inherits <- base::inherits [18:41:40.521] invokeRestart <- base::invokeRestart [18:41:40.521] length <- base::length [18:41:40.521] list <- base::list [18:41:40.521] seq.int <- base::seq.int [18:41:40.521] signalCondition <- base::signalCondition [18:41:40.521] sys.calls <- base::sys.calls [18:41:40.521] `[[` <- base::`[[` [18:41:40.521] `+` <- base::`+` [18:41:40.521] `<<-` <- base::`<<-` [18:41:40.521] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.521] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.521] 3L)] [18:41:40.521] } [18:41:40.521] function(cond) { [18:41:40.521] is_error <- inherits(cond, "error") [18:41:40.521] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.521] NULL) [18:41:40.521] if (is_error) { [18:41:40.521] sessionInformation <- function() { [18:41:40.521] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.521] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.521] search = base::search(), system = base::Sys.info()) [18:41:40.521] } [18:41:40.521] ...future.conditions[[length(...future.conditions) + [18:41:40.521] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.521] cond$call), session = sessionInformation(), [18:41:40.521] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.521] signalCondition(cond) [18:41:40.521] } [18:41:40.521] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.521] "immediateCondition"))) { [18:41:40.521] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.521] ...future.conditions[[length(...future.conditions) + [18:41:40.521] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.521] if (TRUE && !signal) { [18:41:40.521] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.521] { [18:41:40.521] inherits <- base::inherits [18:41:40.521] invokeRestart <- base::invokeRestart [18:41:40.521] is.null <- base::is.null [18:41:40.521] muffled <- FALSE [18:41:40.521] if (inherits(cond, "message")) { [18:41:40.521] muffled <- grepl(pattern, "muffleMessage") [18:41:40.521] if (muffled) [18:41:40.521] invokeRestart("muffleMessage") [18:41:40.521] } [18:41:40.521] else if (inherits(cond, "warning")) { [18:41:40.521] muffled <- grepl(pattern, "muffleWarning") [18:41:40.521] if (muffled) [18:41:40.521] invokeRestart("muffleWarning") [18:41:40.521] } [18:41:40.521] else if (inherits(cond, "condition")) { [18:41:40.521] if (!is.null(pattern)) { [18:41:40.521] computeRestarts <- base::computeRestarts [18:41:40.521] grepl <- base::grepl [18:41:40.521] restarts <- computeRestarts(cond) [18:41:40.521] for (restart in restarts) { [18:41:40.521] name <- restart$name [18:41:40.521] if (is.null(name)) [18:41:40.521] next [18:41:40.521] if (!grepl(pattern, name)) [18:41:40.521] next [18:41:40.521] invokeRestart(restart) [18:41:40.521] muffled <- TRUE [18:41:40.521] break [18:41:40.521] } [18:41:40.521] } [18:41:40.521] } [18:41:40.521] invisible(muffled) [18:41:40.521] } [18:41:40.521] muffleCondition(cond, pattern = "^muffle") [18:41:40.521] } [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] if (TRUE) { [18:41:40.521] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.521] { [18:41:40.521] inherits <- base::inherits [18:41:40.521] invokeRestart <- base::invokeRestart [18:41:40.521] is.null <- base::is.null [18:41:40.521] muffled <- FALSE [18:41:40.521] if (inherits(cond, "message")) { [18:41:40.521] muffled <- grepl(pattern, "muffleMessage") [18:41:40.521] if (muffled) [18:41:40.521] invokeRestart("muffleMessage") [18:41:40.521] } [18:41:40.521] else if (inherits(cond, "warning")) { [18:41:40.521] muffled <- grepl(pattern, "muffleWarning") [18:41:40.521] if (muffled) [18:41:40.521] invokeRestart("muffleWarning") [18:41:40.521] } [18:41:40.521] else if (inherits(cond, "condition")) { [18:41:40.521] if (!is.null(pattern)) { [18:41:40.521] computeRestarts <- base::computeRestarts [18:41:40.521] grepl <- base::grepl [18:41:40.521] restarts <- computeRestarts(cond) [18:41:40.521] for (restart in restarts) { [18:41:40.521] name <- restart$name [18:41:40.521] if (is.null(name)) [18:41:40.521] next [18:41:40.521] if (!grepl(pattern, name)) [18:41:40.521] next [18:41:40.521] invokeRestart(restart) [18:41:40.521] muffled <- TRUE [18:41:40.521] break [18:41:40.521] } [18:41:40.521] } [18:41:40.521] } [18:41:40.521] invisible(muffled) [18:41:40.521] } [18:41:40.521] muffleCondition(cond, pattern = "^muffle") [18:41:40.521] } [18:41:40.521] } [18:41:40.521] } [18:41:40.521] })) [18:41:40.521] }, error = function(ex) { [18:41:40.521] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.521] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.521] ...future.rng), started = ...future.startTime, [18:41:40.521] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.521] version = "1.8"), class = "FutureResult") [18:41:40.521] }, finally = { [18:41:40.521] if (!identical(...future.workdir, getwd())) [18:41:40.521] setwd(...future.workdir) [18:41:40.521] { [18:41:40.521] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.521] ...future.oldOptions$nwarnings <- NULL [18:41:40.521] } [18:41:40.521] base::options(...future.oldOptions) [18:41:40.521] if (.Platform$OS.type == "windows") { [18:41:40.521] old_names <- names(...future.oldEnvVars) [18:41:40.521] envs <- base::Sys.getenv() [18:41:40.521] names <- names(envs) [18:41:40.521] common <- intersect(names, old_names) [18:41:40.521] added <- setdiff(names, old_names) [18:41:40.521] removed <- setdiff(old_names, names) [18:41:40.521] changed <- common[...future.oldEnvVars[common] != [18:41:40.521] envs[common]] [18:41:40.521] NAMES <- toupper(changed) [18:41:40.521] args <- list() [18:41:40.521] for (kk in seq_along(NAMES)) { [18:41:40.521] name <- changed[[kk]] [18:41:40.521] NAME <- NAMES[[kk]] [18:41:40.521] if (name != NAME && is.element(NAME, old_names)) [18:41:40.521] next [18:41:40.521] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.521] } [18:41:40.521] NAMES <- toupper(added) [18:41:40.521] for (kk in seq_along(NAMES)) { [18:41:40.521] name <- added[[kk]] [18:41:40.521] NAME <- NAMES[[kk]] [18:41:40.521] if (name != NAME && is.element(NAME, old_names)) [18:41:40.521] next [18:41:40.521] args[[name]] <- "" [18:41:40.521] } [18:41:40.521] NAMES <- toupper(removed) [18:41:40.521] for (kk in seq_along(NAMES)) { [18:41:40.521] name <- removed[[kk]] [18:41:40.521] NAME <- NAMES[[kk]] [18:41:40.521] if (name != NAME && is.element(NAME, old_names)) [18:41:40.521] next [18:41:40.521] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.521] } [18:41:40.521] if (length(args) > 0) [18:41:40.521] base::do.call(base::Sys.setenv, args = args) [18:41:40.521] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.521] } [18:41:40.521] { [18:41:40.521] if (base::length(...future.futureOptionsAdded) > [18:41:40.521] 0L) { [18:41:40.521] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.521] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.521] base::options(opts) [18:41:40.521] } [18:41:40.521] { [18:41:40.521] { [18:41:40.521] NULL [18:41:40.521] RNGkind("Mersenne-Twister") [18:41:40.521] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.521] inherits = FALSE) [18:41:40.521] } [18:41:40.521] options(future.plan = NULL) [18:41:40.521] if (is.na(NA_character_)) [18:41:40.521] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.521] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.521] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.521] .init = FALSE) [18:41:40.521] } [18:41:40.521] } [18:41:40.521] } [18:41:40.521] }) [18:41:40.521] if (TRUE) { [18:41:40.521] base::sink(type = "output", split = FALSE) [18:41:40.521] if (TRUE) { [18:41:40.521] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.521] } [18:41:40.521] else { [18:41:40.521] ...future.result["stdout"] <- base::list(NULL) [18:41:40.521] } [18:41:40.521] base::close(...future.stdout) [18:41:40.521] ...future.stdout <- NULL [18:41:40.521] } [18:41:40.521] ...future.result$conditions <- ...future.conditions [18:41:40.521] ...future.result$finished <- base::Sys.time() [18:41:40.521] ...future.result [18:41:40.521] } [18:41:40.525] assign_globals() ... [18:41:40.525] List of 5 [18:41:40.525] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:40.525] $ future.call.arguments : list() [18:41:40.525] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.525] $ ...future.elements_ii :List of 3 [18:41:40.525] ..$ a: num 1 [18:41:40.525] ..$ b: num 2 [18:41:40.525] ..$ c: num 3 [18:41:40.525] $ ...future.seeds_ii : NULL [18:41:40.525] $ ...future.globals.maxSize: NULL [18:41:40.525] - attr(*, "where")=List of 5 [18:41:40.525] ..$ ...future.FUN : [18:41:40.525] ..$ future.call.arguments : [18:41:40.525] ..$ ...future.elements_ii : [18:41:40.525] ..$ ...future.seeds_ii : [18:41:40.525] ..$ ...future.globals.maxSize: [18:41:40.525] - attr(*, "resolved")= logi FALSE [18:41:40.525] - attr(*, "total_size")= num 6598 [18:41:40.525] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.525] - attr(*, "already-done")= logi TRUE [18:41:40.531] - reassign environment for '...future.FUN' [18:41:40.531] - copied '...future.FUN' to environment [18:41:40.532] - copied 'future.call.arguments' to environment [18:41:40.532] - copied '...future.elements_ii' to environment [18:41:40.532] - copied '...future.seeds_ii' to environment [18:41:40.532] - copied '...future.globals.maxSize' to environment [18:41:40.532] assign_globals() ... done [18:41:40.533] plan(): Setting new future strategy stack: [18:41:40.533] List of future strategies: [18:41:40.533] 1. sequential: [18:41:40.533] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.533] - tweaked: FALSE [18:41:40.533] - call: NULL [18:41:40.533] plan(): nbrOfWorkers() = 1 [18:41:40.535] plan(): Setting new future strategy stack: [18:41:40.535] List of future strategies: [18:41:40.535] 1. sequential: [18:41:40.535] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.535] - tweaked: FALSE [18:41:40.535] - call: plan(strategy) [18:41:40.536] plan(): nbrOfWorkers() = 1 [18:41:40.536] SequentialFuture started (and completed) [18:41:40.536] - Launch lazy future ... done [18:41:40.536] run() for 'SequentialFuture' ... done [18:41:40.537] Created future: [18:41:40.537] SequentialFuture: [18:41:40.537] Label: 'future_sapply-1' [18:41:40.537] Expression: [18:41:40.537] { [18:41:40.537] do.call(function(...) { [18:41:40.537] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.537] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.537] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.537] on.exit(options(oopts), add = TRUE) [18:41:40.537] } [18:41:40.537] { [18:41:40.537] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.537] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.537] ...future.FUN(...future.X_jj, ...) [18:41:40.537] }) [18:41:40.537] } [18:41:40.537] }, args = future.call.arguments) [18:41:40.537] } [18:41:40.537] Lazy evaluation: FALSE [18:41:40.537] Asynchronous evaluation: FALSE [18:41:40.537] Local evaluation: TRUE [18:41:40.537] Environment: R_GlobalEnv [18:41:40.537] Capture standard output: TRUE [18:41:40.537] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.537] Globals: 5 objects totaling 1.05 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.537] Packages: [18:41:40.537] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.537] Resolved: TRUE [18:41:40.537] Value: 510 bytes of class 'list' [18:41:40.537] Early signaling: FALSE [18:41:40.537] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.537] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.538] Chunk #1 of 1 ... DONE [18:41:40.539] Launching 1 futures (chunks) ... DONE [18:41:40.539] Resolving 1 futures (chunks) ... [18:41:40.539] resolve() on list ... [18:41:40.539] recursive: 0 [18:41:40.540] length: 1 [18:41:40.540] [18:41:40.540] resolved() for 'SequentialFuture' ... [18:41:40.540] - state: 'finished' [18:41:40.540] - run: TRUE [18:41:40.540] - result: 'FutureResult' [18:41:40.541] resolved() for 'SequentialFuture' ... done [18:41:40.541] Future #1 [18:41:40.541] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.541] - nx: 1 [18:41:40.541] - relay: TRUE [18:41:40.541] - stdout: TRUE [18:41:40.542] - signal: TRUE [18:41:40.542] - resignal: FALSE [18:41:40.542] - force: TRUE [18:41:40.542] - relayed: [n=1] FALSE [18:41:40.542] - queued futures: [n=1] FALSE [18:41:40.542] - until=1 [18:41:40.542] - relaying element #1 [18:41:40.543] - relayed: [n=1] TRUE [18:41:40.543] - queued futures: [n=1] TRUE [18:41:40.543] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.543] length: 0 (resolved future 1) [18:41:40.543] Relaying remaining futures [18:41:40.544] signalConditionsASAP(NULL, pos=0) ... [18:41:40.544] - nx: 1 [18:41:40.544] - relay: TRUE [18:41:40.544] - stdout: TRUE [18:41:40.544] - signal: TRUE [18:41:40.544] - resignal: FALSE [18:41:40.544] - force: TRUE [18:41:40.545] - relayed: [n=1] TRUE [18:41:40.545] - queued futures: [n=1] TRUE - flush all [18:41:40.545] - relayed: [n=1] TRUE [18:41:40.545] - queued futures: [n=1] TRUE [18:41:40.545] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.545] resolve() on list ... DONE [18:41:40.546] - Number of value chunks collected: 1 [18:41:40.546] Resolving 1 futures (chunks) ... DONE [18:41:40.546] Reducing values from 1 chunks ... [18:41:40.546] - Number of values collected after concatenation: 3 [18:41:40.546] - Number of values expected: 3 [18:41:40.546] Reducing values from 1 chunks ... DONE [18:41:40.547] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y1:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y2:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... [18:41:40.554] future_lapply() ... [18:41:40.555] Number of chunks: 1 [18:41:40.555] getGlobalsAndPackagesXApply() ... [18:41:40.555] - future.globals: TRUE [18:41:40.555] getGlobalsAndPackages() ... [18:41:40.555] Searching for globals... [18:41:40.556] - globals found: [1] 'FUN' [18:41:40.557] Searching for globals ... DONE [18:41:40.557] Resolving globals: FALSE [18:41:40.557] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:40.557] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:40.558] - globals: [1] 'FUN' [18:41:40.558] [18:41:40.558] getGlobalsAndPackages() ... DONE [18:41:40.558] - globals found/used: [n=1] 'FUN' [18:41:40.558] - needed namespaces: [n=0] [18:41:40.559] Finding globals ... DONE [18:41:40.559] - use_args: TRUE [18:41:40.559] - Getting '...' globals ... [18:41:40.559] resolve() on list ... [18:41:40.559] recursive: 0 [18:41:40.560] length: 1 [18:41:40.560] elements: '...' [18:41:40.560] length: 0 (resolved future 1) [18:41:40.560] resolve() on list ... DONE [18:41:40.560] - '...' content: [n=0] [18:41:40.560] List of 1 [18:41:40.560] $ ...: list() [18:41:40.560] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.560] - attr(*, "where")=List of 1 [18:41:40.560] ..$ ...: [18:41:40.560] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.560] - attr(*, "resolved")= logi TRUE [18:41:40.560] - attr(*, "total_size")= num NA [18:41:40.564] - Getting '...' globals ... DONE [18:41:40.564] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.565] List of 2 [18:41:40.565] $ ...future.FUN:function (x) [18:41:40.565] $ ... : list() [18:41:40.565] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.565] - attr(*, "where")=List of 2 [18:41:40.565] ..$ ...future.FUN: [18:41:40.565] ..$ ... : [18:41:40.565] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.565] - attr(*, "resolved")= logi FALSE [18:41:40.565] - attr(*, "total_size")= int 4876 [18:41:40.568] Packages to be attached in all futures: [n=0] [18:41:40.568] getGlobalsAndPackagesXApply() ... DONE [18:41:40.568] Number of futures (= number of chunks): 1 [18:41:40.568] Launching 1 futures (chunks) ... [18:41:40.568] Chunk #1 of 1 ... [18:41:40.569] - Finding globals in 'X' for chunk #1 ... [18:41:40.569] getGlobalsAndPackages() ... [18:41:40.569] Searching for globals... [18:41:40.569] [18:41:40.569] Searching for globals ... DONE [18:41:40.570] - globals: [0] [18:41:40.570] getGlobalsAndPackages() ... DONE [18:41:40.570] + additional globals found: [n=0] [18:41:40.570] + additional namespaces needed: [n=0] [18:41:40.570] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.570] - seeds: [18:41:40.571] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.571] getGlobalsAndPackages() ... [18:41:40.571] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.571] Resolving globals: FALSE [18:41:40.571] Tweak future expression to call with '...' arguments ... [18:41:40.571] { [18:41:40.571] do.call(function(...) { [18:41:40.571] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.571] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.571] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.571] on.exit(options(oopts), add = TRUE) [18:41:40.571] } [18:41:40.571] { [18:41:40.571] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.571] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.571] ...future.FUN(...future.X_jj, ...) [18:41:40.571] }) [18:41:40.571] } [18:41:40.571] }, args = future.call.arguments) [18:41:40.571] } [18:41:40.572] Tweak future expression to call with '...' arguments ... DONE [18:41:40.572] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.572] [18:41:40.573] getGlobalsAndPackages() ... DONE [18:41:40.573] run() for 'Future' ... [18:41:40.573] - state: 'created' [18:41:40.573] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.574] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.574] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.574] - Field: 'label' [18:41:40.574] - Field: 'local' [18:41:40.574] - Field: 'owner' [18:41:40.575] - Field: 'envir' [18:41:40.575] - Field: 'packages' [18:41:40.575] - Field: 'gc' [18:41:40.575] - Field: 'conditions' [18:41:40.575] - Field: 'expr' [18:41:40.575] - Field: 'uuid' [18:41:40.576] - Field: 'seed' [18:41:40.576] - Field: 'version' [18:41:40.576] - Field: 'result' [18:41:40.576] - Field: 'asynchronous' [18:41:40.576] - Field: 'calls' [18:41:40.576] - Field: 'globals' [18:41:40.577] - Field: 'stdout' [18:41:40.577] - Field: 'earlySignal' [18:41:40.577] - Field: 'lazy' [18:41:40.577] - Field: 'state' [18:41:40.577] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.578] - Launch lazy future ... [18:41:40.578] Packages needed by the future expression (n = 0): [18:41:40.578] Packages needed by future strategies (n = 0): [18:41:40.578] { [18:41:40.578] { [18:41:40.578] { [18:41:40.578] ...future.startTime <- base::Sys.time() [18:41:40.578] { [18:41:40.578] { [18:41:40.578] { [18:41:40.578] base::local({ [18:41:40.578] has_future <- base::requireNamespace("future", [18:41:40.578] quietly = TRUE) [18:41:40.578] if (has_future) { [18:41:40.578] ns <- base::getNamespace("future") [18:41:40.578] version <- ns[[".package"]][["version"]] [18:41:40.578] if (is.null(version)) [18:41:40.578] version <- utils::packageVersion("future") [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] version <- NULL [18:41:40.578] } [18:41:40.578] if (!has_future || version < "1.8.0") { [18:41:40.578] info <- base::c(r_version = base::gsub("R version ", [18:41:40.578] "", base::R.version$version.string), [18:41:40.578] platform = base::sprintf("%s (%s-bit)", [18:41:40.578] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.578] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.578] "release", "version")], collapse = " "), [18:41:40.578] hostname = base::Sys.info()[["nodename"]]) [18:41:40.578] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.578] info) [18:41:40.578] info <- base::paste(info, collapse = "; ") [18:41:40.578] if (!has_future) { [18:41:40.578] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.578] info) [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.578] info, version) [18:41:40.578] } [18:41:40.578] base::stop(msg) [18:41:40.578] } [18:41:40.578] }) [18:41:40.578] } [18:41:40.578] ...future.strategy.old <- future::plan("list") [18:41:40.578] options(future.plan = NULL) [18:41:40.578] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.578] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.578] } [18:41:40.578] ...future.workdir <- getwd() [18:41:40.578] } [18:41:40.578] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.578] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.578] } [18:41:40.578] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.578] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.578] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.578] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.578] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.578] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.578] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.578] base::names(...future.oldOptions)) [18:41:40.578] } [18:41:40.578] if (FALSE) { [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] if (TRUE) { [18:41:40.578] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.578] open = "w") [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.578] windows = "NUL", "/dev/null"), open = "w") [18:41:40.578] } [18:41:40.578] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.578] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.578] base::sink(type = "output", split = FALSE) [18:41:40.578] base::close(...future.stdout) [18:41:40.578] }, add = TRUE) [18:41:40.578] } [18:41:40.578] ...future.frame <- base::sys.nframe() [18:41:40.578] ...future.conditions <- base::list() [18:41:40.578] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.578] if (FALSE) { [18:41:40.578] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.578] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.578] } [18:41:40.578] ...future.result <- base::tryCatch({ [18:41:40.578] base::withCallingHandlers({ [18:41:40.578] ...future.value <- base::withVisible(base::local({ [18:41:40.578] do.call(function(...) { [18:41:40.578] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.578] if (!identical(...future.globals.maxSize.org, [18:41:40.578] ...future.globals.maxSize)) { [18:41:40.578] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.578] on.exit(options(oopts), add = TRUE) [18:41:40.578] } [18:41:40.578] { [18:41:40.578] lapply(seq_along(...future.elements_ii), [18:41:40.578] FUN = function(jj) { [18:41:40.578] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.578] ...future.FUN(...future.X_jj, ...) [18:41:40.578] }) [18:41:40.578] } [18:41:40.578] }, args = future.call.arguments) [18:41:40.578] })) [18:41:40.578] future::FutureResult(value = ...future.value$value, [18:41:40.578] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.578] ...future.rng), globalenv = if (FALSE) [18:41:40.578] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.578] ...future.globalenv.names)) [18:41:40.578] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.578] }, condition = base::local({ [18:41:40.578] c <- base::c [18:41:40.578] inherits <- base::inherits [18:41:40.578] invokeRestart <- base::invokeRestart [18:41:40.578] length <- base::length [18:41:40.578] list <- base::list [18:41:40.578] seq.int <- base::seq.int [18:41:40.578] signalCondition <- base::signalCondition [18:41:40.578] sys.calls <- base::sys.calls [18:41:40.578] `[[` <- base::`[[` [18:41:40.578] `+` <- base::`+` [18:41:40.578] `<<-` <- base::`<<-` [18:41:40.578] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.578] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.578] 3L)] [18:41:40.578] } [18:41:40.578] function(cond) { [18:41:40.578] is_error <- inherits(cond, "error") [18:41:40.578] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.578] NULL) [18:41:40.578] if (is_error) { [18:41:40.578] sessionInformation <- function() { [18:41:40.578] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.578] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.578] search = base::search(), system = base::Sys.info()) [18:41:40.578] } [18:41:40.578] ...future.conditions[[length(...future.conditions) + [18:41:40.578] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.578] cond$call), session = sessionInformation(), [18:41:40.578] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.578] signalCondition(cond) [18:41:40.578] } [18:41:40.578] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.578] "immediateCondition"))) { [18:41:40.578] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.578] ...future.conditions[[length(...future.conditions) + [18:41:40.578] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.578] if (TRUE && !signal) { [18:41:40.578] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.578] { [18:41:40.578] inherits <- base::inherits [18:41:40.578] invokeRestart <- base::invokeRestart [18:41:40.578] is.null <- base::is.null [18:41:40.578] muffled <- FALSE [18:41:40.578] if (inherits(cond, "message")) { [18:41:40.578] muffled <- grepl(pattern, "muffleMessage") [18:41:40.578] if (muffled) [18:41:40.578] invokeRestart("muffleMessage") [18:41:40.578] } [18:41:40.578] else if (inherits(cond, "warning")) { [18:41:40.578] muffled <- grepl(pattern, "muffleWarning") [18:41:40.578] if (muffled) [18:41:40.578] invokeRestart("muffleWarning") [18:41:40.578] } [18:41:40.578] else if (inherits(cond, "condition")) { [18:41:40.578] if (!is.null(pattern)) { [18:41:40.578] computeRestarts <- base::computeRestarts [18:41:40.578] grepl <- base::grepl [18:41:40.578] restarts <- computeRestarts(cond) [18:41:40.578] for (restart in restarts) { [18:41:40.578] name <- restart$name [18:41:40.578] if (is.null(name)) [18:41:40.578] next [18:41:40.578] if (!grepl(pattern, name)) [18:41:40.578] next [18:41:40.578] invokeRestart(restart) [18:41:40.578] muffled <- TRUE [18:41:40.578] break [18:41:40.578] } [18:41:40.578] } [18:41:40.578] } [18:41:40.578] invisible(muffled) [18:41:40.578] } [18:41:40.578] muffleCondition(cond, pattern = "^muffle") [18:41:40.578] } [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] if (TRUE) { [18:41:40.578] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.578] { [18:41:40.578] inherits <- base::inherits [18:41:40.578] invokeRestart <- base::invokeRestart [18:41:40.578] is.null <- base::is.null [18:41:40.578] muffled <- FALSE [18:41:40.578] if (inherits(cond, "message")) { [18:41:40.578] muffled <- grepl(pattern, "muffleMessage") [18:41:40.578] if (muffled) [18:41:40.578] invokeRestart("muffleMessage") [18:41:40.578] } [18:41:40.578] else if (inherits(cond, "warning")) { [18:41:40.578] muffled <- grepl(pattern, "muffleWarning") [18:41:40.578] if (muffled) [18:41:40.578] invokeRestart("muffleWarning") [18:41:40.578] } [18:41:40.578] else if (inherits(cond, "condition")) { [18:41:40.578] if (!is.null(pattern)) { [18:41:40.578] computeRestarts <- base::computeRestarts [18:41:40.578] grepl <- base::grepl [18:41:40.578] restarts <- computeRestarts(cond) [18:41:40.578] for (restart in restarts) { [18:41:40.578] name <- restart$name [18:41:40.578] if (is.null(name)) [18:41:40.578] next [18:41:40.578] if (!grepl(pattern, name)) [18:41:40.578] next [18:41:40.578] invokeRestart(restart) [18:41:40.578] muffled <- TRUE [18:41:40.578] break [18:41:40.578] } [18:41:40.578] } [18:41:40.578] } [18:41:40.578] invisible(muffled) [18:41:40.578] } [18:41:40.578] muffleCondition(cond, pattern = "^muffle") [18:41:40.578] } [18:41:40.578] } [18:41:40.578] } [18:41:40.578] })) [18:41:40.578] }, error = function(ex) { [18:41:40.578] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.578] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.578] ...future.rng), started = ...future.startTime, [18:41:40.578] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.578] version = "1.8"), class = "FutureResult") [18:41:40.578] }, finally = { [18:41:40.578] if (!identical(...future.workdir, getwd())) [18:41:40.578] setwd(...future.workdir) [18:41:40.578] { [18:41:40.578] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.578] ...future.oldOptions$nwarnings <- NULL [18:41:40.578] } [18:41:40.578] base::options(...future.oldOptions) [18:41:40.578] if (.Platform$OS.type == "windows") { [18:41:40.578] old_names <- names(...future.oldEnvVars) [18:41:40.578] envs <- base::Sys.getenv() [18:41:40.578] names <- names(envs) [18:41:40.578] common <- intersect(names, old_names) [18:41:40.578] added <- setdiff(names, old_names) [18:41:40.578] removed <- setdiff(old_names, names) [18:41:40.578] changed <- common[...future.oldEnvVars[common] != [18:41:40.578] envs[common]] [18:41:40.578] NAMES <- toupper(changed) [18:41:40.578] args <- list() [18:41:40.578] for (kk in seq_along(NAMES)) { [18:41:40.578] name <- changed[[kk]] [18:41:40.578] NAME <- NAMES[[kk]] [18:41:40.578] if (name != NAME && is.element(NAME, old_names)) [18:41:40.578] next [18:41:40.578] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.578] } [18:41:40.578] NAMES <- toupper(added) [18:41:40.578] for (kk in seq_along(NAMES)) { [18:41:40.578] name <- added[[kk]] [18:41:40.578] NAME <- NAMES[[kk]] [18:41:40.578] if (name != NAME && is.element(NAME, old_names)) [18:41:40.578] next [18:41:40.578] args[[name]] <- "" [18:41:40.578] } [18:41:40.578] NAMES <- toupper(removed) [18:41:40.578] for (kk in seq_along(NAMES)) { [18:41:40.578] name <- removed[[kk]] [18:41:40.578] NAME <- NAMES[[kk]] [18:41:40.578] if (name != NAME && is.element(NAME, old_names)) [18:41:40.578] next [18:41:40.578] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.578] } [18:41:40.578] if (length(args) > 0) [18:41:40.578] base::do.call(base::Sys.setenv, args = args) [18:41:40.578] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.578] } [18:41:40.578] { [18:41:40.578] if (base::length(...future.futureOptionsAdded) > [18:41:40.578] 0L) { [18:41:40.578] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.578] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.578] base::options(opts) [18:41:40.578] } [18:41:40.578] { [18:41:40.578] { [18:41:40.578] NULL [18:41:40.578] RNGkind("Mersenne-Twister") [18:41:40.578] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.578] inherits = FALSE) [18:41:40.578] } [18:41:40.578] options(future.plan = NULL) [18:41:40.578] if (is.na(NA_character_)) [18:41:40.578] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.578] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.578] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.578] .init = FALSE) [18:41:40.578] } [18:41:40.578] } [18:41:40.578] } [18:41:40.578] }) [18:41:40.578] if (TRUE) { [18:41:40.578] base::sink(type = "output", split = FALSE) [18:41:40.578] if (TRUE) { [18:41:40.578] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.578] } [18:41:40.578] else { [18:41:40.578] ...future.result["stdout"] <- base::list(NULL) [18:41:40.578] } [18:41:40.578] base::close(...future.stdout) [18:41:40.578] ...future.stdout <- NULL [18:41:40.578] } [18:41:40.578] ...future.result$conditions <- ...future.conditions [18:41:40.578] ...future.result$finished <- base::Sys.time() [18:41:40.578] ...future.result [18:41:40.578] } [18:41:40.582] assign_globals() ... [18:41:40.582] List of 5 [18:41:40.582] $ ...future.FUN :function (x) [18:41:40.582] $ future.call.arguments : list() [18:41:40.582] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.582] $ ...future.elements_ii :List of 3 [18:41:40.582] ..$ a: num 1 [18:41:40.582] ..$ b: num 2 [18:41:40.582] ..$ c: num 3 [18:41:40.582] $ ...future.seeds_ii : NULL [18:41:40.582] $ ...future.globals.maxSize: NULL [18:41:40.582] - attr(*, "where")=List of 5 [18:41:40.582] ..$ ...future.FUN : [18:41:40.582] ..$ future.call.arguments : [18:41:40.582] ..$ ...future.elements_ii : [18:41:40.582] ..$ ...future.seeds_ii : [18:41:40.582] ..$ ...future.globals.maxSize: [18:41:40.582] - attr(*, "resolved")= logi FALSE [18:41:40.582] - attr(*, "total_size")= num 4876 [18:41:40.582] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.582] - attr(*, "already-done")= logi TRUE [18:41:40.590] - copied '...future.FUN' to environment [18:41:40.590] - copied 'future.call.arguments' to environment [18:41:40.590] - copied '...future.elements_ii' to environment [18:41:40.590] - copied '...future.seeds_ii' to environment [18:41:40.590] - copied '...future.globals.maxSize' to environment [18:41:40.591] assign_globals() ... done [18:41:40.591] plan(): Setting new future strategy stack: [18:41:40.591] List of future strategies: [18:41:40.591] 1. sequential: [18:41:40.591] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.591] - tweaked: FALSE [18:41:40.591] - call: NULL [18:41:40.592] plan(): nbrOfWorkers() = 1 [18:41:40.593] plan(): Setting new future strategy stack: [18:41:40.593] List of future strategies: [18:41:40.593] 1. sequential: [18:41:40.593] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.593] - tweaked: FALSE [18:41:40.593] - call: plan(strategy) [18:41:40.594] plan(): nbrOfWorkers() = 1 [18:41:40.594] SequentialFuture started (and completed) [18:41:40.594] - Launch lazy future ... done [18:41:40.594] run() for 'SequentialFuture' ... done [18:41:40.595] Created future: [18:41:40.595] SequentialFuture: [18:41:40.595] Label: 'future_sapply-1' [18:41:40.595] Expression: [18:41:40.595] { [18:41:40.595] do.call(function(...) { [18:41:40.595] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.595] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.595] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.595] on.exit(options(oopts), add = TRUE) [18:41:40.595] } [18:41:40.595] { [18:41:40.595] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.595] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.595] ...future.FUN(...future.X_jj, ...) [18:41:40.595] }) [18:41:40.595] } [18:41:40.595] }, args = future.call.arguments) [18:41:40.595] } [18:41:40.595] Lazy evaluation: FALSE [18:41:40.595] Asynchronous evaluation: FALSE [18:41:40.595] Local evaluation: TRUE [18:41:40.595] Environment: R_GlobalEnv [18:41:40.595] Capture standard output: TRUE [18:41:40.595] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.595] Globals: 5 objects totaling 475 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.595] Packages: [18:41:40.595] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.595] Resolved: TRUE [18:41:40.595] Value: 79 bytes of class 'list' [18:41:40.595] Early signaling: FALSE [18:41:40.595] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.595] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.596] Chunk #1 of 1 ... DONE [18:41:40.596] Launching 1 futures (chunks) ... DONE [18:41:40.596] Resolving 1 futures (chunks) ... [18:41:40.596] resolve() on list ... [18:41:40.596] recursive: 0 [18:41:40.597] length: 1 [18:41:40.597] [18:41:40.597] resolved() for 'SequentialFuture' ... [18:41:40.597] - state: 'finished' [18:41:40.598] - run: TRUE [18:41:40.598] - result: 'FutureResult' [18:41:40.598] resolved() for 'SequentialFuture' ... done [18:41:40.599] Future #1 [18:41:40.599] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.599] - nx: 1 [18:41:40.600] - relay: TRUE [18:41:40.600] - stdout: TRUE [18:41:40.600] - signal: TRUE [18:41:40.600] - resignal: FALSE [18:41:40.601] - force: TRUE [18:41:40.601] - relayed: [n=1] FALSE [18:41:40.601] - queued futures: [n=1] FALSE [18:41:40.601] - until=1 [18:41:40.601] - relaying element #1 [18:41:40.602] - relayed: [n=1] TRUE [18:41:40.602] - queued futures: [n=1] TRUE [18:41:40.602] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.602] length: 0 (resolved future 1) [18:41:40.602] Relaying remaining futures [18:41:40.603] signalConditionsASAP(NULL, pos=0) ... [18:41:40.603] - nx: 1 [18:41:40.603] - relay: TRUE [18:41:40.603] - stdout: TRUE [18:41:40.603] - signal: TRUE [18:41:40.603] - resignal: FALSE [18:41:40.603] - force: TRUE [18:41:40.604] - relayed: [n=1] TRUE [18:41:40.604] - queued futures: [n=1] TRUE - flush all [18:41:40.604] - relayed: [n=1] TRUE [18:41:40.604] - queued futures: [n=1] TRUE [18:41:40.604] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.604] resolve() on list ... DONE [18:41:40.605] - Number of value chunks collected: 1 [18:41:40.605] Resolving 1 futures (chunks) ... DONE [18:41:40.605] Reducing values from 1 chunks ... [18:41:40.605] - Number of values collected after concatenation: 3 [18:41:40.605] - Number of values expected: 3 [18:41:40.605] Reducing values from 1 chunks ... DONE [18:41:40.606] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:40.608] future_lapply() ... [18:41:40.608] Number of chunks: 1 [18:41:40.608] getGlobalsAndPackagesXApply() ... [18:41:40.608] - future.globals: TRUE [18:41:40.609] getGlobalsAndPackages() ... [18:41:40.609] Searching for globals... [18:41:40.610] - globals found: [2] 'FUN', 'UseMethod' [18:41:40.610] Searching for globals ... DONE [18:41:40.610] Resolving globals: FALSE [18:41:40.611] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:40.611] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:40.611] - globals: [1] 'FUN' [18:41:40.612] [18:41:40.613] getGlobalsAndPackages() ... DONE [18:41:40.613] - globals found/used: [n=1] 'FUN' [18:41:40.613] - needed namespaces: [n=0] [18:41:40.613] Finding globals ... DONE [18:41:40.614] - use_args: TRUE [18:41:40.614] - Getting '...' globals ... [18:41:40.615] resolve() on list ... [18:41:40.615] recursive: 0 [18:41:40.615] length: 1 [18:41:40.616] elements: '...' [18:41:40.616] length: 0 (resolved future 1) [18:41:40.616] resolve() on list ... DONE [18:41:40.617] - '...' content: [n=0] [18:41:40.617] List of 1 [18:41:40.617] $ ...: list() [18:41:40.617] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.617] - attr(*, "where")=List of 1 [18:41:40.617] ..$ ...: [18:41:40.617] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.617] - attr(*, "resolved")= logi TRUE [18:41:40.617] - attr(*, "total_size")= num NA [18:41:40.619] - Getting '...' globals ... DONE [18:41:40.620] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.620] List of 2 [18:41:40.620] $ ...future.FUN:function (x, ...) [18:41:40.620] $ ... : list() [18:41:40.620] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.620] - attr(*, "where")=List of 2 [18:41:40.620] ..$ ...future.FUN: [18:41:40.620] ..$ ... : [18:41:40.620] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.620] - attr(*, "resolved")= logi FALSE [18:41:40.620] - attr(*, "total_size")= int 5116 [18:41:40.623] Packages to be attached in all futures: [n=0] [18:41:40.623] getGlobalsAndPackagesXApply() ... DONE [18:41:40.624] Number of futures (= number of chunks): 1 [18:41:40.624] Launching 1 futures (chunks) ... [18:41:40.624] Chunk #1 of 1 ... [18:41:40.624] - Finding globals in 'X' for chunk #1 ... [18:41:40.624] getGlobalsAndPackages() ... [18:41:40.625] Searching for globals... [18:41:40.625] [18:41:40.625] Searching for globals ... DONE [18:41:40.625] - globals: [0] [18:41:40.625] getGlobalsAndPackages() ... DONE [18:41:40.626] + additional globals found: [n=0] [18:41:40.626] + additional namespaces needed: [n=0] [18:41:40.626] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.626] - seeds: [18:41:40.626] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.626] getGlobalsAndPackages() ... [18:41:40.627] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.627] Resolving globals: FALSE [18:41:40.627] Tweak future expression to call with '...' arguments ... [18:41:40.627] { [18:41:40.627] do.call(function(...) { [18:41:40.627] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.627] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.627] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.627] on.exit(options(oopts), add = TRUE) [18:41:40.627] } [18:41:40.627] { [18:41:40.627] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.627] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.627] ...future.FUN(...future.X_jj, ...) [18:41:40.627] }) [18:41:40.627] } [18:41:40.627] }, args = future.call.arguments) [18:41:40.627] } [18:41:40.627] Tweak future expression to call with '...' arguments ... DONE [18:41:40.628] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.628] [18:41:40.628] getGlobalsAndPackages() ... DONE [18:41:40.629] run() for 'Future' ... [18:41:40.629] - state: 'created' [18:41:40.630] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.630] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.631] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.631] - Field: 'label' [18:41:40.631] - Field: 'local' [18:41:40.632] - Field: 'owner' [18:41:40.632] - Field: 'envir' [18:41:40.632] - Field: 'packages' [18:41:40.632] - Field: 'gc' [18:41:40.632] - Field: 'conditions' [18:41:40.633] - Field: 'expr' [18:41:40.633] - Field: 'uuid' [18:41:40.633] - Field: 'seed' [18:41:40.633] - Field: 'version' [18:41:40.633] - Field: 'result' [18:41:40.633] - Field: 'asynchronous' [18:41:40.634] - Field: 'calls' [18:41:40.634] - Field: 'globals' [18:41:40.634] - Field: 'stdout' [18:41:40.634] - Field: 'earlySignal' [18:41:40.634] - Field: 'lazy' [18:41:40.634] - Field: 'state' [18:41:40.635] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.635] - Launch lazy future ... [18:41:40.635] Packages needed by the future expression (n = 0): [18:41:40.635] Packages needed by future strategies (n = 0): [18:41:40.636] { [18:41:40.636] { [18:41:40.636] { [18:41:40.636] ...future.startTime <- base::Sys.time() [18:41:40.636] { [18:41:40.636] { [18:41:40.636] { [18:41:40.636] base::local({ [18:41:40.636] has_future <- base::requireNamespace("future", [18:41:40.636] quietly = TRUE) [18:41:40.636] if (has_future) { [18:41:40.636] ns <- base::getNamespace("future") [18:41:40.636] version <- ns[[".package"]][["version"]] [18:41:40.636] if (is.null(version)) [18:41:40.636] version <- utils::packageVersion("future") [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] version <- NULL [18:41:40.636] } [18:41:40.636] if (!has_future || version < "1.8.0") { [18:41:40.636] info <- base::c(r_version = base::gsub("R version ", [18:41:40.636] "", base::R.version$version.string), [18:41:40.636] platform = base::sprintf("%s (%s-bit)", [18:41:40.636] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.636] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.636] "release", "version")], collapse = " "), [18:41:40.636] hostname = base::Sys.info()[["nodename"]]) [18:41:40.636] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.636] info) [18:41:40.636] info <- base::paste(info, collapse = "; ") [18:41:40.636] if (!has_future) { [18:41:40.636] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.636] info) [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.636] info, version) [18:41:40.636] } [18:41:40.636] base::stop(msg) [18:41:40.636] } [18:41:40.636] }) [18:41:40.636] } [18:41:40.636] ...future.strategy.old <- future::plan("list") [18:41:40.636] options(future.plan = NULL) [18:41:40.636] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.636] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.636] } [18:41:40.636] ...future.workdir <- getwd() [18:41:40.636] } [18:41:40.636] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.636] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.636] } [18:41:40.636] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.636] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.636] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.636] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.636] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.636] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.636] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.636] base::names(...future.oldOptions)) [18:41:40.636] } [18:41:40.636] if (FALSE) { [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] if (TRUE) { [18:41:40.636] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.636] open = "w") [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.636] windows = "NUL", "/dev/null"), open = "w") [18:41:40.636] } [18:41:40.636] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.636] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.636] base::sink(type = "output", split = FALSE) [18:41:40.636] base::close(...future.stdout) [18:41:40.636] }, add = TRUE) [18:41:40.636] } [18:41:40.636] ...future.frame <- base::sys.nframe() [18:41:40.636] ...future.conditions <- base::list() [18:41:40.636] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.636] if (FALSE) { [18:41:40.636] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.636] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.636] } [18:41:40.636] ...future.result <- base::tryCatch({ [18:41:40.636] base::withCallingHandlers({ [18:41:40.636] ...future.value <- base::withVisible(base::local({ [18:41:40.636] do.call(function(...) { [18:41:40.636] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.636] if (!identical(...future.globals.maxSize.org, [18:41:40.636] ...future.globals.maxSize)) { [18:41:40.636] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.636] on.exit(options(oopts), add = TRUE) [18:41:40.636] } [18:41:40.636] { [18:41:40.636] lapply(seq_along(...future.elements_ii), [18:41:40.636] FUN = function(jj) { [18:41:40.636] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.636] ...future.FUN(...future.X_jj, ...) [18:41:40.636] }) [18:41:40.636] } [18:41:40.636] }, args = future.call.arguments) [18:41:40.636] })) [18:41:40.636] future::FutureResult(value = ...future.value$value, [18:41:40.636] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.636] ...future.rng), globalenv = if (FALSE) [18:41:40.636] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.636] ...future.globalenv.names)) [18:41:40.636] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.636] }, condition = base::local({ [18:41:40.636] c <- base::c [18:41:40.636] inherits <- base::inherits [18:41:40.636] invokeRestart <- base::invokeRestart [18:41:40.636] length <- base::length [18:41:40.636] list <- base::list [18:41:40.636] seq.int <- base::seq.int [18:41:40.636] signalCondition <- base::signalCondition [18:41:40.636] sys.calls <- base::sys.calls [18:41:40.636] `[[` <- base::`[[` [18:41:40.636] `+` <- base::`+` [18:41:40.636] `<<-` <- base::`<<-` [18:41:40.636] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.636] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.636] 3L)] [18:41:40.636] } [18:41:40.636] function(cond) { [18:41:40.636] is_error <- inherits(cond, "error") [18:41:40.636] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.636] NULL) [18:41:40.636] if (is_error) { [18:41:40.636] sessionInformation <- function() { [18:41:40.636] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.636] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.636] search = base::search(), system = base::Sys.info()) [18:41:40.636] } [18:41:40.636] ...future.conditions[[length(...future.conditions) + [18:41:40.636] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.636] cond$call), session = sessionInformation(), [18:41:40.636] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.636] signalCondition(cond) [18:41:40.636] } [18:41:40.636] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.636] "immediateCondition"))) { [18:41:40.636] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.636] ...future.conditions[[length(...future.conditions) + [18:41:40.636] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.636] if (TRUE && !signal) { [18:41:40.636] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.636] { [18:41:40.636] inherits <- base::inherits [18:41:40.636] invokeRestart <- base::invokeRestart [18:41:40.636] is.null <- base::is.null [18:41:40.636] muffled <- FALSE [18:41:40.636] if (inherits(cond, "message")) { [18:41:40.636] muffled <- grepl(pattern, "muffleMessage") [18:41:40.636] if (muffled) [18:41:40.636] invokeRestart("muffleMessage") [18:41:40.636] } [18:41:40.636] else if (inherits(cond, "warning")) { [18:41:40.636] muffled <- grepl(pattern, "muffleWarning") [18:41:40.636] if (muffled) [18:41:40.636] invokeRestart("muffleWarning") [18:41:40.636] } [18:41:40.636] else if (inherits(cond, "condition")) { [18:41:40.636] if (!is.null(pattern)) { [18:41:40.636] computeRestarts <- base::computeRestarts [18:41:40.636] grepl <- base::grepl [18:41:40.636] restarts <- computeRestarts(cond) [18:41:40.636] for (restart in restarts) { [18:41:40.636] name <- restart$name [18:41:40.636] if (is.null(name)) [18:41:40.636] next [18:41:40.636] if (!grepl(pattern, name)) [18:41:40.636] next [18:41:40.636] invokeRestart(restart) [18:41:40.636] muffled <- TRUE [18:41:40.636] break [18:41:40.636] } [18:41:40.636] } [18:41:40.636] } [18:41:40.636] invisible(muffled) [18:41:40.636] } [18:41:40.636] muffleCondition(cond, pattern = "^muffle") [18:41:40.636] } [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] if (TRUE) { [18:41:40.636] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.636] { [18:41:40.636] inherits <- base::inherits [18:41:40.636] invokeRestart <- base::invokeRestart [18:41:40.636] is.null <- base::is.null [18:41:40.636] muffled <- FALSE [18:41:40.636] if (inherits(cond, "message")) { [18:41:40.636] muffled <- grepl(pattern, "muffleMessage") [18:41:40.636] if (muffled) [18:41:40.636] invokeRestart("muffleMessage") [18:41:40.636] } [18:41:40.636] else if (inherits(cond, "warning")) { [18:41:40.636] muffled <- grepl(pattern, "muffleWarning") [18:41:40.636] if (muffled) [18:41:40.636] invokeRestart("muffleWarning") [18:41:40.636] } [18:41:40.636] else if (inherits(cond, "condition")) { [18:41:40.636] if (!is.null(pattern)) { [18:41:40.636] computeRestarts <- base::computeRestarts [18:41:40.636] grepl <- base::grepl [18:41:40.636] restarts <- computeRestarts(cond) [18:41:40.636] for (restart in restarts) { [18:41:40.636] name <- restart$name [18:41:40.636] if (is.null(name)) [18:41:40.636] next [18:41:40.636] if (!grepl(pattern, name)) [18:41:40.636] next [18:41:40.636] invokeRestart(restart) [18:41:40.636] muffled <- TRUE [18:41:40.636] break [18:41:40.636] } [18:41:40.636] } [18:41:40.636] } [18:41:40.636] invisible(muffled) [18:41:40.636] } [18:41:40.636] muffleCondition(cond, pattern = "^muffle") [18:41:40.636] } [18:41:40.636] } [18:41:40.636] } [18:41:40.636] })) [18:41:40.636] }, error = function(ex) { [18:41:40.636] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.636] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.636] ...future.rng), started = ...future.startTime, [18:41:40.636] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.636] version = "1.8"), class = "FutureResult") [18:41:40.636] }, finally = { [18:41:40.636] if (!identical(...future.workdir, getwd())) [18:41:40.636] setwd(...future.workdir) [18:41:40.636] { [18:41:40.636] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.636] ...future.oldOptions$nwarnings <- NULL [18:41:40.636] } [18:41:40.636] base::options(...future.oldOptions) [18:41:40.636] if (.Platform$OS.type == "windows") { [18:41:40.636] old_names <- names(...future.oldEnvVars) [18:41:40.636] envs <- base::Sys.getenv() [18:41:40.636] names <- names(envs) [18:41:40.636] common <- intersect(names, old_names) [18:41:40.636] added <- setdiff(names, old_names) [18:41:40.636] removed <- setdiff(old_names, names) [18:41:40.636] changed <- common[...future.oldEnvVars[common] != [18:41:40.636] envs[common]] [18:41:40.636] NAMES <- toupper(changed) [18:41:40.636] args <- list() [18:41:40.636] for (kk in seq_along(NAMES)) { [18:41:40.636] name <- changed[[kk]] [18:41:40.636] NAME <- NAMES[[kk]] [18:41:40.636] if (name != NAME && is.element(NAME, old_names)) [18:41:40.636] next [18:41:40.636] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.636] } [18:41:40.636] NAMES <- toupper(added) [18:41:40.636] for (kk in seq_along(NAMES)) { [18:41:40.636] name <- added[[kk]] [18:41:40.636] NAME <- NAMES[[kk]] [18:41:40.636] if (name != NAME && is.element(NAME, old_names)) [18:41:40.636] next [18:41:40.636] args[[name]] <- "" [18:41:40.636] } [18:41:40.636] NAMES <- toupper(removed) [18:41:40.636] for (kk in seq_along(NAMES)) { [18:41:40.636] name <- removed[[kk]] [18:41:40.636] NAME <- NAMES[[kk]] [18:41:40.636] if (name != NAME && is.element(NAME, old_names)) [18:41:40.636] next [18:41:40.636] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.636] } [18:41:40.636] if (length(args) > 0) [18:41:40.636] base::do.call(base::Sys.setenv, args = args) [18:41:40.636] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.636] } [18:41:40.636] { [18:41:40.636] if (base::length(...future.futureOptionsAdded) > [18:41:40.636] 0L) { [18:41:40.636] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.636] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.636] base::options(opts) [18:41:40.636] } [18:41:40.636] { [18:41:40.636] { [18:41:40.636] NULL [18:41:40.636] RNGkind("Mersenne-Twister") [18:41:40.636] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.636] inherits = FALSE) [18:41:40.636] } [18:41:40.636] options(future.plan = NULL) [18:41:40.636] if (is.na(NA_character_)) [18:41:40.636] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.636] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.636] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.636] .init = FALSE) [18:41:40.636] } [18:41:40.636] } [18:41:40.636] } [18:41:40.636] }) [18:41:40.636] if (TRUE) { [18:41:40.636] base::sink(type = "output", split = FALSE) [18:41:40.636] if (TRUE) { [18:41:40.636] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.636] } [18:41:40.636] else { [18:41:40.636] ...future.result["stdout"] <- base::list(NULL) [18:41:40.636] } [18:41:40.636] base::close(...future.stdout) [18:41:40.636] ...future.stdout <- NULL [18:41:40.636] } [18:41:40.636] ...future.result$conditions <- ...future.conditions [18:41:40.636] ...future.result$finished <- base::Sys.time() [18:41:40.636] ...future.result [18:41:40.636] } [18:41:40.640] assign_globals() ... [18:41:40.640] List of 5 [18:41:40.640] $ ...future.FUN :function (x, ...) [18:41:40.640] $ future.call.arguments : list() [18:41:40.640] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.640] $ ...future.elements_ii :List of 3 [18:41:40.640] ..$ a: num 1 [18:41:40.640] ..$ b: num 2 [18:41:40.640] ..$ c: num 3 [18:41:40.640] $ ...future.seeds_ii : NULL [18:41:40.640] $ ...future.globals.maxSize: NULL [18:41:40.640] - attr(*, "where")=List of 5 [18:41:40.640] ..$ ...future.FUN : [18:41:40.640] ..$ future.call.arguments : [18:41:40.640] ..$ ...future.elements_ii : [18:41:40.640] ..$ ...future.seeds_ii : [18:41:40.640] ..$ ...future.globals.maxSize: [18:41:40.640] - attr(*, "resolved")= logi FALSE [18:41:40.640] - attr(*, "total_size")= num 5116 [18:41:40.640] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.640] - attr(*, "already-done")= logi TRUE [18:41:40.678] - copied '...future.FUN' to environment [18:41:40.678] - copied 'future.call.arguments' to environment [18:41:40.678] - copied '...future.elements_ii' to environment [18:41:40.678] - copied '...future.seeds_ii' to environment [18:41:40.678] - copied '...future.globals.maxSize' to environment [18:41:40.679] assign_globals() ... done [18:41:40.679] plan(): Setting new future strategy stack: [18:41:40.679] List of future strategies: [18:41:40.679] 1. sequential: [18:41:40.679] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.679] - tweaked: FALSE [18:41:40.679] - call: NULL [18:41:40.680] plan(): nbrOfWorkers() = 1 [18:41:40.681] plan(): Setting new future strategy stack: [18:41:40.682] List of future strategies: [18:41:40.682] 1. sequential: [18:41:40.682] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.682] - tweaked: FALSE [18:41:40.682] - call: plan(strategy) [18:41:40.682] plan(): nbrOfWorkers() = 1 [18:41:40.682] SequentialFuture started (and completed) [18:41:40.683] - Launch lazy future ... done [18:41:40.683] run() for 'SequentialFuture' ... done [18:41:40.683] Created future: [18:41:40.683] SequentialFuture: [18:41:40.683] Label: 'future_sapply-1' [18:41:40.683] Expression: [18:41:40.683] { [18:41:40.683] do.call(function(...) { [18:41:40.683] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.683] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.683] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.683] on.exit(options(oopts), add = TRUE) [18:41:40.683] } [18:41:40.683] { [18:41:40.683] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.683] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.683] ...future.FUN(...future.X_jj, ...) [18:41:40.683] }) [18:41:40.683] } [18:41:40.683] }, args = future.call.arguments) [18:41:40.683] } [18:41:40.683] Lazy evaluation: FALSE [18:41:40.683] Asynchronous evaluation: FALSE [18:41:40.683] Local evaluation: TRUE [18:41:40.683] Environment: R_GlobalEnv [18:41:40.683] Capture standard output: TRUE [18:41:40.683] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.683] Globals: 5 objects totaling 568 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.683] Packages: [18:41:40.683] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.683] Resolved: TRUE [18:41:40.683] Value: 174 bytes of class 'list' [18:41:40.683] Early signaling: FALSE [18:41:40.683] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.683] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.684] Chunk #1 of 1 ... DONE [18:41:40.685] Launching 1 futures (chunks) ... DONE [18:41:40.685] Resolving 1 futures (chunks) ... [18:41:40.685] resolve() on list ... [18:41:40.685] recursive: 0 [18:41:40.685] length: 1 [18:41:40.686] [18:41:40.686] resolved() for 'SequentialFuture' ... [18:41:40.686] - state: 'finished' [18:41:40.686] - run: TRUE [18:41:40.686] - result: 'FutureResult' [18:41:40.686] resolved() for 'SequentialFuture' ... done [18:41:40.687] Future #1 [18:41:40.687] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.687] - nx: 1 [18:41:40.687] - relay: TRUE [18:41:40.687] - stdout: TRUE [18:41:40.688] - signal: TRUE [18:41:40.688] - resignal: FALSE [18:41:40.688] - force: TRUE [18:41:40.688] - relayed: [n=1] FALSE [18:41:40.688] - queued futures: [n=1] FALSE [18:41:40.688] - until=1 [18:41:40.689] - relaying element #1 [18:41:40.689] - relayed: [n=1] TRUE [18:41:40.689] - queued futures: [n=1] TRUE [18:41:40.689] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.689] length: 0 (resolved future 1) [18:41:40.690] Relaying remaining futures [18:41:40.690] signalConditionsASAP(NULL, pos=0) ... [18:41:40.690] - nx: 1 [18:41:40.690] - relay: TRUE [18:41:40.690] - stdout: TRUE [18:41:40.690] - signal: TRUE [18:41:40.691] - resignal: FALSE [18:41:40.691] - force: TRUE [18:41:40.691] - relayed: [n=1] TRUE [18:41:40.691] - queued futures: [n=1] TRUE - flush all [18:41:40.691] - relayed: [n=1] TRUE [18:41:40.692] - queued futures: [n=1] TRUE [18:41:40.692] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.692] resolve() on list ... DONE [18:41:40.692] - Number of value chunks collected: 1 [18:41:40.692] Resolving 1 futures (chunks) ... DONE [18:41:40.692] Reducing values from 1 chunks ... [18:41:40.693] - Number of values collected after concatenation: 3 [18:41:40.693] - Number of values expected: 3 [18:41:40.693] Reducing values from 1 chunks ... DONE [18:41:40.693] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:40.695] future_lapply() ... [18:41:40.696] Number of chunks: 1 [18:41:40.696] getGlobalsAndPackagesXApply() ... [18:41:40.696] - future.globals: TRUE [18:41:40.697] getGlobalsAndPackages() ... [18:41:40.697] Searching for globals... [18:41:40.699] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:40.699] Searching for globals ... DONE [18:41:40.700] Resolving globals: FALSE [18:41:40.700] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:40.701] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:40.701] - globals: [1] 'FUN' [18:41:40.701] [18:41:40.701] getGlobalsAndPackages() ... DONE [18:41:40.701] - globals found/used: [n=1] 'FUN' [18:41:40.701] - needed namespaces: [n=0] [18:41:40.702] Finding globals ... DONE [18:41:40.702] - use_args: TRUE [18:41:40.702] - Getting '...' globals ... [18:41:40.702] resolve() on list ... [18:41:40.702] recursive: 0 [18:41:40.703] length: 1 [18:41:40.703] elements: '...' [18:41:40.703] length: 0 (resolved future 1) [18:41:40.703] resolve() on list ... DONE [18:41:40.703] - '...' content: [n=0] [18:41:40.703] List of 1 [18:41:40.703] $ ...: list() [18:41:40.703] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.703] - attr(*, "where")=List of 1 [18:41:40.703] ..$ ...: [18:41:40.703] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.703] - attr(*, "resolved")= logi TRUE [18:41:40.703] - attr(*, "total_size")= num NA [18:41:40.706] - Getting '...' globals ... DONE [18:41:40.706] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.707] List of 2 [18:41:40.707] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:40.707] $ ... : list() [18:41:40.707] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.707] - attr(*, "where")=List of 2 [18:41:40.707] ..$ ...future.FUN: [18:41:40.707] ..$ ... : [18:41:40.707] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.707] - attr(*, "resolved")= logi FALSE [18:41:40.707] - attr(*, "total_size")= int 6598 [18:41:40.710] Packages to be attached in all futures: [n=0] [18:41:40.710] getGlobalsAndPackagesXApply() ... DONE [18:41:40.710] Number of futures (= number of chunks): 1 [18:41:40.711] Launching 1 futures (chunks) ... [18:41:40.711] Chunk #1 of 1 ... [18:41:40.711] - Finding globals in 'X' for chunk #1 ... [18:41:40.711] getGlobalsAndPackages() ... [18:41:40.711] Searching for globals... [18:41:40.712] [18:41:40.712] Searching for globals ... DONE [18:41:40.712] - globals: [0] [18:41:40.712] getGlobalsAndPackages() ... DONE [18:41:40.712] + additional globals found: [n=0] [18:41:40.712] + additional namespaces needed: [n=0] [18:41:40.713] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.713] - seeds: [18:41:40.713] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.713] getGlobalsAndPackages() ... [18:41:40.713] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.713] Resolving globals: FALSE [18:41:40.713] Tweak future expression to call with '...' arguments ... [18:41:40.714] { [18:41:40.714] do.call(function(...) { [18:41:40.714] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.714] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.714] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.714] on.exit(options(oopts), add = TRUE) [18:41:40.714] } [18:41:40.714] { [18:41:40.714] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.714] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.714] ...future.FUN(...future.X_jj, ...) [18:41:40.714] }) [18:41:40.714] } [18:41:40.714] }, args = future.call.arguments) [18:41:40.714] } [18:41:40.714] Tweak future expression to call with '...' arguments ... DONE [18:41:40.715] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.715] [18:41:40.715] getGlobalsAndPackages() ... DONE [18:41:40.715] run() for 'Future' ... [18:41:40.715] - state: 'created' [18:41:40.716] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.716] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.716] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.716] - Field: 'label' [18:41:40.717] - Field: 'local' [18:41:40.717] - Field: 'owner' [18:41:40.717] - Field: 'envir' [18:41:40.717] - Field: 'packages' [18:41:40.717] - Field: 'gc' [18:41:40.717] - Field: 'conditions' [18:41:40.718] - Field: 'expr' [18:41:40.718] - Field: 'uuid' [18:41:40.718] - Field: 'seed' [18:41:40.718] - Field: 'version' [18:41:40.718] - Field: 'result' [18:41:40.718] - Field: 'asynchronous' [18:41:40.719] - Field: 'calls' [18:41:40.719] - Field: 'globals' [18:41:40.719] - Field: 'stdout' [18:41:40.719] - Field: 'earlySignal' [18:41:40.719] - Field: 'lazy' [18:41:40.720] - Field: 'state' [18:41:40.720] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.720] - Launch lazy future ... [18:41:40.720] Packages needed by the future expression (n = 0): [18:41:40.720] Packages needed by future strategies (n = 0): [18:41:40.721] { [18:41:40.721] { [18:41:40.721] { [18:41:40.721] ...future.startTime <- base::Sys.time() [18:41:40.721] { [18:41:40.721] { [18:41:40.721] { [18:41:40.721] base::local({ [18:41:40.721] has_future <- base::requireNamespace("future", [18:41:40.721] quietly = TRUE) [18:41:40.721] if (has_future) { [18:41:40.721] ns <- base::getNamespace("future") [18:41:40.721] version <- ns[[".package"]][["version"]] [18:41:40.721] if (is.null(version)) [18:41:40.721] version <- utils::packageVersion("future") [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] version <- NULL [18:41:40.721] } [18:41:40.721] if (!has_future || version < "1.8.0") { [18:41:40.721] info <- base::c(r_version = base::gsub("R version ", [18:41:40.721] "", base::R.version$version.string), [18:41:40.721] platform = base::sprintf("%s (%s-bit)", [18:41:40.721] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.721] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.721] "release", "version")], collapse = " "), [18:41:40.721] hostname = base::Sys.info()[["nodename"]]) [18:41:40.721] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.721] info) [18:41:40.721] info <- base::paste(info, collapse = "; ") [18:41:40.721] if (!has_future) { [18:41:40.721] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.721] info) [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.721] info, version) [18:41:40.721] } [18:41:40.721] base::stop(msg) [18:41:40.721] } [18:41:40.721] }) [18:41:40.721] } [18:41:40.721] ...future.strategy.old <- future::plan("list") [18:41:40.721] options(future.plan = NULL) [18:41:40.721] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.721] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.721] } [18:41:40.721] ...future.workdir <- getwd() [18:41:40.721] } [18:41:40.721] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.721] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.721] } [18:41:40.721] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.721] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.721] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.721] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.721] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.721] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.721] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.721] base::names(...future.oldOptions)) [18:41:40.721] } [18:41:40.721] if (FALSE) { [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] if (TRUE) { [18:41:40.721] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.721] open = "w") [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.721] windows = "NUL", "/dev/null"), open = "w") [18:41:40.721] } [18:41:40.721] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.721] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.721] base::sink(type = "output", split = FALSE) [18:41:40.721] base::close(...future.stdout) [18:41:40.721] }, add = TRUE) [18:41:40.721] } [18:41:40.721] ...future.frame <- base::sys.nframe() [18:41:40.721] ...future.conditions <- base::list() [18:41:40.721] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.721] if (FALSE) { [18:41:40.721] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.721] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.721] } [18:41:40.721] ...future.result <- base::tryCatch({ [18:41:40.721] base::withCallingHandlers({ [18:41:40.721] ...future.value <- base::withVisible(base::local({ [18:41:40.721] do.call(function(...) { [18:41:40.721] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.721] if (!identical(...future.globals.maxSize.org, [18:41:40.721] ...future.globals.maxSize)) { [18:41:40.721] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.721] on.exit(options(oopts), add = TRUE) [18:41:40.721] } [18:41:40.721] { [18:41:40.721] lapply(seq_along(...future.elements_ii), [18:41:40.721] FUN = function(jj) { [18:41:40.721] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.721] ...future.FUN(...future.X_jj, ...) [18:41:40.721] }) [18:41:40.721] } [18:41:40.721] }, args = future.call.arguments) [18:41:40.721] })) [18:41:40.721] future::FutureResult(value = ...future.value$value, [18:41:40.721] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.721] ...future.rng), globalenv = if (FALSE) [18:41:40.721] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.721] ...future.globalenv.names)) [18:41:40.721] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.721] }, condition = base::local({ [18:41:40.721] c <- base::c [18:41:40.721] inherits <- base::inherits [18:41:40.721] invokeRestart <- base::invokeRestart [18:41:40.721] length <- base::length [18:41:40.721] list <- base::list [18:41:40.721] seq.int <- base::seq.int [18:41:40.721] signalCondition <- base::signalCondition [18:41:40.721] sys.calls <- base::sys.calls [18:41:40.721] `[[` <- base::`[[` [18:41:40.721] `+` <- base::`+` [18:41:40.721] `<<-` <- base::`<<-` [18:41:40.721] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.721] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.721] 3L)] [18:41:40.721] } [18:41:40.721] function(cond) { [18:41:40.721] is_error <- inherits(cond, "error") [18:41:40.721] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.721] NULL) [18:41:40.721] if (is_error) { [18:41:40.721] sessionInformation <- function() { [18:41:40.721] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.721] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.721] search = base::search(), system = base::Sys.info()) [18:41:40.721] } [18:41:40.721] ...future.conditions[[length(...future.conditions) + [18:41:40.721] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.721] cond$call), session = sessionInformation(), [18:41:40.721] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.721] signalCondition(cond) [18:41:40.721] } [18:41:40.721] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.721] "immediateCondition"))) { [18:41:40.721] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.721] ...future.conditions[[length(...future.conditions) + [18:41:40.721] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.721] if (TRUE && !signal) { [18:41:40.721] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.721] { [18:41:40.721] inherits <- base::inherits [18:41:40.721] invokeRestart <- base::invokeRestart [18:41:40.721] is.null <- base::is.null [18:41:40.721] muffled <- FALSE [18:41:40.721] if (inherits(cond, "message")) { [18:41:40.721] muffled <- grepl(pattern, "muffleMessage") [18:41:40.721] if (muffled) [18:41:40.721] invokeRestart("muffleMessage") [18:41:40.721] } [18:41:40.721] else if (inherits(cond, "warning")) { [18:41:40.721] muffled <- grepl(pattern, "muffleWarning") [18:41:40.721] if (muffled) [18:41:40.721] invokeRestart("muffleWarning") [18:41:40.721] } [18:41:40.721] else if (inherits(cond, "condition")) { [18:41:40.721] if (!is.null(pattern)) { [18:41:40.721] computeRestarts <- base::computeRestarts [18:41:40.721] grepl <- base::grepl [18:41:40.721] restarts <- computeRestarts(cond) [18:41:40.721] for (restart in restarts) { [18:41:40.721] name <- restart$name [18:41:40.721] if (is.null(name)) [18:41:40.721] next [18:41:40.721] if (!grepl(pattern, name)) [18:41:40.721] next [18:41:40.721] invokeRestart(restart) [18:41:40.721] muffled <- TRUE [18:41:40.721] break [18:41:40.721] } [18:41:40.721] } [18:41:40.721] } [18:41:40.721] invisible(muffled) [18:41:40.721] } [18:41:40.721] muffleCondition(cond, pattern = "^muffle") [18:41:40.721] } [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] if (TRUE) { [18:41:40.721] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.721] { [18:41:40.721] inherits <- base::inherits [18:41:40.721] invokeRestart <- base::invokeRestart [18:41:40.721] is.null <- base::is.null [18:41:40.721] muffled <- FALSE [18:41:40.721] if (inherits(cond, "message")) { [18:41:40.721] muffled <- grepl(pattern, "muffleMessage") [18:41:40.721] if (muffled) [18:41:40.721] invokeRestart("muffleMessage") [18:41:40.721] } [18:41:40.721] else if (inherits(cond, "warning")) { [18:41:40.721] muffled <- grepl(pattern, "muffleWarning") [18:41:40.721] if (muffled) [18:41:40.721] invokeRestart("muffleWarning") [18:41:40.721] } [18:41:40.721] else if (inherits(cond, "condition")) { [18:41:40.721] if (!is.null(pattern)) { [18:41:40.721] computeRestarts <- base::computeRestarts [18:41:40.721] grepl <- base::grepl [18:41:40.721] restarts <- computeRestarts(cond) [18:41:40.721] for (restart in restarts) { [18:41:40.721] name <- restart$name [18:41:40.721] if (is.null(name)) [18:41:40.721] next [18:41:40.721] if (!grepl(pattern, name)) [18:41:40.721] next [18:41:40.721] invokeRestart(restart) [18:41:40.721] muffled <- TRUE [18:41:40.721] break [18:41:40.721] } [18:41:40.721] } [18:41:40.721] } [18:41:40.721] invisible(muffled) [18:41:40.721] } [18:41:40.721] muffleCondition(cond, pattern = "^muffle") [18:41:40.721] } [18:41:40.721] } [18:41:40.721] } [18:41:40.721] })) [18:41:40.721] }, error = function(ex) { [18:41:40.721] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.721] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.721] ...future.rng), started = ...future.startTime, [18:41:40.721] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.721] version = "1.8"), class = "FutureResult") [18:41:40.721] }, finally = { [18:41:40.721] if (!identical(...future.workdir, getwd())) [18:41:40.721] setwd(...future.workdir) [18:41:40.721] { [18:41:40.721] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.721] ...future.oldOptions$nwarnings <- NULL [18:41:40.721] } [18:41:40.721] base::options(...future.oldOptions) [18:41:40.721] if (.Platform$OS.type == "windows") { [18:41:40.721] old_names <- names(...future.oldEnvVars) [18:41:40.721] envs <- base::Sys.getenv() [18:41:40.721] names <- names(envs) [18:41:40.721] common <- intersect(names, old_names) [18:41:40.721] added <- setdiff(names, old_names) [18:41:40.721] removed <- setdiff(old_names, names) [18:41:40.721] changed <- common[...future.oldEnvVars[common] != [18:41:40.721] envs[common]] [18:41:40.721] NAMES <- toupper(changed) [18:41:40.721] args <- list() [18:41:40.721] for (kk in seq_along(NAMES)) { [18:41:40.721] name <- changed[[kk]] [18:41:40.721] NAME <- NAMES[[kk]] [18:41:40.721] if (name != NAME && is.element(NAME, old_names)) [18:41:40.721] next [18:41:40.721] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.721] } [18:41:40.721] NAMES <- toupper(added) [18:41:40.721] for (kk in seq_along(NAMES)) { [18:41:40.721] name <- added[[kk]] [18:41:40.721] NAME <- NAMES[[kk]] [18:41:40.721] if (name != NAME && is.element(NAME, old_names)) [18:41:40.721] next [18:41:40.721] args[[name]] <- "" [18:41:40.721] } [18:41:40.721] NAMES <- toupper(removed) [18:41:40.721] for (kk in seq_along(NAMES)) { [18:41:40.721] name <- removed[[kk]] [18:41:40.721] NAME <- NAMES[[kk]] [18:41:40.721] if (name != NAME && is.element(NAME, old_names)) [18:41:40.721] next [18:41:40.721] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.721] } [18:41:40.721] if (length(args) > 0) [18:41:40.721] base::do.call(base::Sys.setenv, args = args) [18:41:40.721] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.721] } [18:41:40.721] { [18:41:40.721] if (base::length(...future.futureOptionsAdded) > [18:41:40.721] 0L) { [18:41:40.721] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.721] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.721] base::options(opts) [18:41:40.721] } [18:41:40.721] { [18:41:40.721] { [18:41:40.721] NULL [18:41:40.721] RNGkind("Mersenne-Twister") [18:41:40.721] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.721] inherits = FALSE) [18:41:40.721] } [18:41:40.721] options(future.plan = NULL) [18:41:40.721] if (is.na(NA_character_)) [18:41:40.721] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.721] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.721] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.721] .init = FALSE) [18:41:40.721] } [18:41:40.721] } [18:41:40.721] } [18:41:40.721] }) [18:41:40.721] if (TRUE) { [18:41:40.721] base::sink(type = "output", split = FALSE) [18:41:40.721] if (TRUE) { [18:41:40.721] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.721] } [18:41:40.721] else { [18:41:40.721] ...future.result["stdout"] <- base::list(NULL) [18:41:40.721] } [18:41:40.721] base::close(...future.stdout) [18:41:40.721] ...future.stdout <- NULL [18:41:40.721] } [18:41:40.721] ...future.result$conditions <- ...future.conditions [18:41:40.721] ...future.result$finished <- base::Sys.time() [18:41:40.721] ...future.result [18:41:40.721] } [18:41:40.725] assign_globals() ... [18:41:40.725] List of 5 [18:41:40.725] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:40.725] $ future.call.arguments : list() [18:41:40.725] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.725] $ ...future.elements_ii :List of 3 [18:41:40.725] ..$ a: num 1 [18:41:40.725] ..$ b: num 2 [18:41:40.725] ..$ c: num 3 [18:41:40.725] $ ...future.seeds_ii : NULL [18:41:40.725] $ ...future.globals.maxSize: NULL [18:41:40.725] - attr(*, "where")=List of 5 [18:41:40.725] ..$ ...future.FUN : [18:41:40.725] ..$ future.call.arguments : [18:41:40.725] ..$ ...future.elements_ii : [18:41:40.725] ..$ ...future.seeds_ii : [18:41:40.725] ..$ ...future.globals.maxSize: [18:41:40.725] - attr(*, "resolved")= logi FALSE [18:41:40.725] - attr(*, "total_size")= num 6598 [18:41:40.725] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.725] - attr(*, "already-done")= logi TRUE [18:41:40.732] - reassign environment for '...future.FUN' [18:41:40.733] - copied '...future.FUN' to environment [18:41:40.733] - copied 'future.call.arguments' to environment [18:41:40.733] - copied '...future.elements_ii' to environment [18:41:40.733] - copied '...future.seeds_ii' to environment [18:41:40.733] - copied '...future.globals.maxSize' to environment [18:41:40.733] assign_globals() ... done [18:41:40.734] plan(): Setting new future strategy stack: [18:41:40.734] List of future strategies: [18:41:40.734] 1. sequential: [18:41:40.734] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.734] - tweaked: FALSE [18:41:40.734] - call: NULL [18:41:40.735] plan(): nbrOfWorkers() = 1 [18:41:40.736] plan(): Setting new future strategy stack: [18:41:40.736] List of future strategies: [18:41:40.736] 1. sequential: [18:41:40.736] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.736] - tweaked: FALSE [18:41:40.736] - call: plan(strategy) [18:41:40.737] plan(): nbrOfWorkers() = 1 [18:41:40.737] SequentialFuture started (and completed) [18:41:40.737] - Launch lazy future ... done [18:41:40.738] run() for 'SequentialFuture' ... done [18:41:40.738] Created future: [18:41:40.738] SequentialFuture: [18:41:40.738] Label: 'future_sapply-1' [18:41:40.738] Expression: [18:41:40.738] { [18:41:40.738] do.call(function(...) { [18:41:40.738] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.738] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.738] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.738] on.exit(options(oopts), add = TRUE) [18:41:40.738] } [18:41:40.738] { [18:41:40.738] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.738] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.738] ...future.FUN(...future.X_jj, ...) [18:41:40.738] }) [18:41:40.738] } [18:41:40.738] }, args = future.call.arguments) [18:41:40.738] } [18:41:40.738] Lazy evaluation: FALSE [18:41:40.738] Asynchronous evaluation: FALSE [18:41:40.738] Local evaluation: TRUE [18:41:40.738] Environment: R_GlobalEnv [18:41:40.738] Capture standard output: TRUE [18:41:40.738] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.738] Globals: 5 objects totaling 1.05 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.738] Packages: [18:41:40.738] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.738] Resolved: TRUE [18:41:40.738] Value: 510 bytes of class 'list' [18:41:40.738] Early signaling: FALSE [18:41:40.738] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.738] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.739] Chunk #1 of 1 ... DONE [18:41:40.739] Launching 1 futures (chunks) ... DONE [18:41:40.739] Resolving 1 futures (chunks) ... [18:41:40.740] resolve() on list ... [18:41:40.740] recursive: 0 [18:41:40.740] length: 1 [18:41:40.740] [18:41:40.740] resolved() for 'SequentialFuture' ... [18:41:40.740] - state: 'finished' [18:41:40.741] - run: TRUE [18:41:40.741] - result: 'FutureResult' [18:41:40.741] resolved() for 'SequentialFuture' ... done [18:41:40.741] Future #1 [18:41:40.741] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.742] - nx: 1 [18:41:40.742] - relay: TRUE [18:41:40.742] - stdout: TRUE [18:41:40.742] - signal: TRUE [18:41:40.742] - resignal: FALSE [18:41:40.742] - force: TRUE [18:41:40.743] - relayed: [n=1] FALSE [18:41:40.743] - queued futures: [n=1] FALSE [18:41:40.743] - until=1 [18:41:40.743] - relaying element #1 [18:41:40.743] - relayed: [n=1] TRUE [18:41:40.743] - queued futures: [n=1] TRUE [18:41:40.744] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.744] length: 0 (resolved future 1) [18:41:40.744] Relaying remaining futures [18:41:40.744] signalConditionsASAP(NULL, pos=0) ... [18:41:40.744] - nx: 1 [18:41:40.744] - relay: TRUE [18:41:40.745] - stdout: TRUE [18:41:40.745] - signal: TRUE [18:41:40.745] - resignal: FALSE [18:41:40.745] - force: TRUE [18:41:40.745] - relayed: [n=1] TRUE [18:41:40.745] - queued futures: [n=1] TRUE - flush all [18:41:40.746] - relayed: [n=1] TRUE [18:41:40.746] - queued futures: [n=1] TRUE [18:41:40.746] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.746] resolve() on list ... DONE [18:41:40.746] - Number of value chunks collected: 1 [18:41:40.747] Resolving 1 futures (chunks) ... DONE [18:41:40.747] Reducing values from 1 chunks ... [18:41:40.747] - Number of values collected after concatenation: 3 [18:41:40.747] - Number of values expected: 3 [18:41:40.747] Reducing values from 1 chunks ... DONE [18:41:40.747] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:40.751] future_lapply() ... [18:41:40.751] Number of chunks: 1 [18:41:40.751] getGlobalsAndPackagesXApply() ... [18:41:40.752] - future.globals: TRUE [18:41:40.752] getGlobalsAndPackages() ... [18:41:40.752] Searching for globals... [18:41:40.754] - globals found: [1] 'FUN' [18:41:40.754] Searching for globals ... DONE [18:41:40.754] Resolving globals: FALSE [18:41:40.755] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:40.755] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:40.755] - globals: [1] 'FUN' [18:41:40.756] [18:41:40.756] getGlobalsAndPackages() ... DONE [18:41:40.756] - globals found/used: [n=1] 'FUN' [18:41:40.756] - needed namespaces: [n=0] [18:41:40.756] Finding globals ... DONE [18:41:40.756] - use_args: TRUE [18:41:40.757] - Getting '...' globals ... [18:41:40.757] resolve() on list ... [18:41:40.757] recursive: 0 [18:41:40.757] length: 1 [18:41:40.757] elements: '...' [18:41:40.758] length: 0 (resolved future 1) [18:41:40.758] resolve() on list ... DONE [18:41:40.758] - '...' content: [n=0] [18:41:40.758] List of 1 [18:41:40.758] $ ...: list() [18:41:40.758] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.758] - attr(*, "where")=List of 1 [18:41:40.758] ..$ ...: [18:41:40.758] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.758] - attr(*, "resolved")= logi TRUE [18:41:40.758] - attr(*, "total_size")= num NA [18:41:40.761] - Getting '...' globals ... DONE [18:41:40.761] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.761] List of 2 [18:41:40.761] $ ...future.FUN:function (x) [18:41:40.761] $ ... : list() [18:41:40.761] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.761] - attr(*, "where")=List of 2 [18:41:40.761] ..$ ...future.FUN: [18:41:40.761] ..$ ... : [18:41:40.761] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.761] - attr(*, "resolved")= logi FALSE [18:41:40.761] - attr(*, "total_size")= int 4876 [18:41:40.765] Packages to be attached in all futures: [n=0] [18:41:40.765] getGlobalsAndPackagesXApply() ... DONE [18:41:40.766] Number of futures (= number of chunks): 1 [18:41:40.766] Launching 1 futures (chunks) ... [18:41:40.766] Chunk #1 of 1 ... [18:41:40.766] - Finding globals in 'X' for chunk #1 ... [18:41:40.766] getGlobalsAndPackages() ... [18:41:40.766] Searching for globals... [18:41:40.767] [18:41:40.767] Searching for globals ... DONE [18:41:40.767] - globals: [0] [18:41:40.767] getGlobalsAndPackages() ... DONE [18:41:40.767] + additional globals found: [n=0] [18:41:40.768] + additional namespaces needed: [n=0] [18:41:40.768] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.768] - seeds: [18:41:40.768] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.768] getGlobalsAndPackages() ... [18:41:40.768] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.769] Resolving globals: FALSE [18:41:40.769] Tweak future expression to call with '...' arguments ... [18:41:40.769] { [18:41:40.769] do.call(function(...) { [18:41:40.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.769] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.769] on.exit(options(oopts), add = TRUE) [18:41:40.769] } [18:41:40.769] { [18:41:40.769] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.769] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.769] ...future.FUN(...future.X_jj, ...) [18:41:40.769] }) [18:41:40.769] } [18:41:40.769] }, args = future.call.arguments) [18:41:40.769] } [18:41:40.770] Tweak future expression to call with '...' arguments ... DONE [18:41:40.771] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.771] [18:41:40.771] getGlobalsAndPackages() ... DONE [18:41:40.772] run() for 'Future' ... [18:41:40.772] - state: 'created' [18:41:40.773] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.773] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.773] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.774] - Field: 'label' [18:41:40.774] - Field: 'local' [18:41:40.774] - Field: 'owner' [18:41:40.775] - Field: 'envir' [18:41:40.775] - Field: 'packages' [18:41:40.775] - Field: 'gc' [18:41:40.776] - Field: 'conditions' [18:41:40.776] - Field: 'expr' [18:41:40.776] - Field: 'uuid' [18:41:40.776] - Field: 'seed' [18:41:40.777] - Field: 'version' [18:41:40.777] - Field: 'result' [18:41:40.777] - Field: 'asynchronous' [18:41:40.778] - Field: 'calls' [18:41:40.778] - Field: 'globals' [18:41:40.778] - Field: 'stdout' [18:41:40.778] - Field: 'earlySignal' [18:41:40.779] - Field: 'lazy' [18:41:40.779] - Field: 'state' [18:41:40.779] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.780] - Launch lazy future ... [18:41:40.780] Packages needed by the future expression (n = 0): [18:41:40.780] Packages needed by future strategies (n = 0): [18:41:40.781] { [18:41:40.781] { [18:41:40.781] { [18:41:40.781] ...future.startTime <- base::Sys.time() [18:41:40.781] { [18:41:40.781] { [18:41:40.781] { [18:41:40.781] base::local({ [18:41:40.781] has_future <- base::requireNamespace("future", [18:41:40.781] quietly = TRUE) [18:41:40.781] if (has_future) { [18:41:40.781] ns <- base::getNamespace("future") [18:41:40.781] version <- ns[[".package"]][["version"]] [18:41:40.781] if (is.null(version)) [18:41:40.781] version <- utils::packageVersion("future") [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] version <- NULL [18:41:40.781] } [18:41:40.781] if (!has_future || version < "1.8.0") { [18:41:40.781] info <- base::c(r_version = base::gsub("R version ", [18:41:40.781] "", base::R.version$version.string), [18:41:40.781] platform = base::sprintf("%s (%s-bit)", [18:41:40.781] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.781] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.781] "release", "version")], collapse = " "), [18:41:40.781] hostname = base::Sys.info()[["nodename"]]) [18:41:40.781] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.781] info) [18:41:40.781] info <- base::paste(info, collapse = "; ") [18:41:40.781] if (!has_future) { [18:41:40.781] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.781] info) [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.781] info, version) [18:41:40.781] } [18:41:40.781] base::stop(msg) [18:41:40.781] } [18:41:40.781] }) [18:41:40.781] } [18:41:40.781] ...future.strategy.old <- future::plan("list") [18:41:40.781] options(future.plan = NULL) [18:41:40.781] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.781] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.781] } [18:41:40.781] ...future.workdir <- getwd() [18:41:40.781] } [18:41:40.781] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.781] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.781] } [18:41:40.781] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.781] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.781] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.781] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.781] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.781] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.781] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.781] base::names(...future.oldOptions)) [18:41:40.781] } [18:41:40.781] if (FALSE) { [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] if (TRUE) { [18:41:40.781] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.781] open = "w") [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.781] windows = "NUL", "/dev/null"), open = "w") [18:41:40.781] } [18:41:40.781] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.781] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.781] base::sink(type = "output", split = FALSE) [18:41:40.781] base::close(...future.stdout) [18:41:40.781] }, add = TRUE) [18:41:40.781] } [18:41:40.781] ...future.frame <- base::sys.nframe() [18:41:40.781] ...future.conditions <- base::list() [18:41:40.781] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.781] if (FALSE) { [18:41:40.781] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.781] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.781] } [18:41:40.781] ...future.result <- base::tryCatch({ [18:41:40.781] base::withCallingHandlers({ [18:41:40.781] ...future.value <- base::withVisible(base::local({ [18:41:40.781] do.call(function(...) { [18:41:40.781] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.781] if (!identical(...future.globals.maxSize.org, [18:41:40.781] ...future.globals.maxSize)) { [18:41:40.781] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.781] on.exit(options(oopts), add = TRUE) [18:41:40.781] } [18:41:40.781] { [18:41:40.781] lapply(seq_along(...future.elements_ii), [18:41:40.781] FUN = function(jj) { [18:41:40.781] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.781] ...future.FUN(...future.X_jj, ...) [18:41:40.781] }) [18:41:40.781] } [18:41:40.781] }, args = future.call.arguments) [18:41:40.781] })) [18:41:40.781] future::FutureResult(value = ...future.value$value, [18:41:40.781] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.781] ...future.rng), globalenv = if (FALSE) [18:41:40.781] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.781] ...future.globalenv.names)) [18:41:40.781] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.781] }, condition = base::local({ [18:41:40.781] c <- base::c [18:41:40.781] inherits <- base::inherits [18:41:40.781] invokeRestart <- base::invokeRestart [18:41:40.781] length <- base::length [18:41:40.781] list <- base::list [18:41:40.781] seq.int <- base::seq.int [18:41:40.781] signalCondition <- base::signalCondition [18:41:40.781] sys.calls <- base::sys.calls [18:41:40.781] `[[` <- base::`[[` [18:41:40.781] `+` <- base::`+` [18:41:40.781] `<<-` <- base::`<<-` [18:41:40.781] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.781] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.781] 3L)] [18:41:40.781] } [18:41:40.781] function(cond) { [18:41:40.781] is_error <- inherits(cond, "error") [18:41:40.781] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.781] NULL) [18:41:40.781] if (is_error) { [18:41:40.781] sessionInformation <- function() { [18:41:40.781] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.781] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.781] search = base::search(), system = base::Sys.info()) [18:41:40.781] } [18:41:40.781] ...future.conditions[[length(...future.conditions) + [18:41:40.781] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.781] cond$call), session = sessionInformation(), [18:41:40.781] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.781] signalCondition(cond) [18:41:40.781] } [18:41:40.781] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.781] "immediateCondition"))) { [18:41:40.781] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.781] ...future.conditions[[length(...future.conditions) + [18:41:40.781] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.781] if (TRUE && !signal) { [18:41:40.781] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.781] { [18:41:40.781] inherits <- base::inherits [18:41:40.781] invokeRestart <- base::invokeRestart [18:41:40.781] is.null <- base::is.null [18:41:40.781] muffled <- FALSE [18:41:40.781] if (inherits(cond, "message")) { [18:41:40.781] muffled <- grepl(pattern, "muffleMessage") [18:41:40.781] if (muffled) [18:41:40.781] invokeRestart("muffleMessage") [18:41:40.781] } [18:41:40.781] else if (inherits(cond, "warning")) { [18:41:40.781] muffled <- grepl(pattern, "muffleWarning") [18:41:40.781] if (muffled) [18:41:40.781] invokeRestart("muffleWarning") [18:41:40.781] } [18:41:40.781] else if (inherits(cond, "condition")) { [18:41:40.781] if (!is.null(pattern)) { [18:41:40.781] computeRestarts <- base::computeRestarts [18:41:40.781] grepl <- base::grepl [18:41:40.781] restarts <- computeRestarts(cond) [18:41:40.781] for (restart in restarts) { [18:41:40.781] name <- restart$name [18:41:40.781] if (is.null(name)) [18:41:40.781] next [18:41:40.781] if (!grepl(pattern, name)) [18:41:40.781] next [18:41:40.781] invokeRestart(restart) [18:41:40.781] muffled <- TRUE [18:41:40.781] break [18:41:40.781] } [18:41:40.781] } [18:41:40.781] } [18:41:40.781] invisible(muffled) [18:41:40.781] } [18:41:40.781] muffleCondition(cond, pattern = "^muffle") [18:41:40.781] } [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] if (TRUE) { [18:41:40.781] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.781] { [18:41:40.781] inherits <- base::inherits [18:41:40.781] invokeRestart <- base::invokeRestart [18:41:40.781] is.null <- base::is.null [18:41:40.781] muffled <- FALSE [18:41:40.781] if (inherits(cond, "message")) { [18:41:40.781] muffled <- grepl(pattern, "muffleMessage") [18:41:40.781] if (muffled) [18:41:40.781] invokeRestart("muffleMessage") [18:41:40.781] } [18:41:40.781] else if (inherits(cond, "warning")) { [18:41:40.781] muffled <- grepl(pattern, "muffleWarning") [18:41:40.781] if (muffled) [18:41:40.781] invokeRestart("muffleWarning") [18:41:40.781] } [18:41:40.781] else if (inherits(cond, "condition")) { [18:41:40.781] if (!is.null(pattern)) { [18:41:40.781] computeRestarts <- base::computeRestarts [18:41:40.781] grepl <- base::grepl [18:41:40.781] restarts <- computeRestarts(cond) [18:41:40.781] for (restart in restarts) { [18:41:40.781] name <- restart$name [18:41:40.781] if (is.null(name)) [18:41:40.781] next [18:41:40.781] if (!grepl(pattern, name)) [18:41:40.781] next [18:41:40.781] invokeRestart(restart) [18:41:40.781] muffled <- TRUE [18:41:40.781] break [18:41:40.781] } [18:41:40.781] } [18:41:40.781] } [18:41:40.781] invisible(muffled) [18:41:40.781] } [18:41:40.781] muffleCondition(cond, pattern = "^muffle") [18:41:40.781] } [18:41:40.781] } [18:41:40.781] } [18:41:40.781] })) [18:41:40.781] }, error = function(ex) { [18:41:40.781] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.781] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.781] ...future.rng), started = ...future.startTime, [18:41:40.781] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.781] version = "1.8"), class = "FutureResult") [18:41:40.781] }, finally = { [18:41:40.781] if (!identical(...future.workdir, getwd())) [18:41:40.781] setwd(...future.workdir) [18:41:40.781] { [18:41:40.781] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.781] ...future.oldOptions$nwarnings <- NULL [18:41:40.781] } [18:41:40.781] base::options(...future.oldOptions) [18:41:40.781] if (.Platform$OS.type == "windows") { [18:41:40.781] old_names <- names(...future.oldEnvVars) [18:41:40.781] envs <- base::Sys.getenv() [18:41:40.781] names <- names(envs) [18:41:40.781] common <- intersect(names, old_names) [18:41:40.781] added <- setdiff(names, old_names) [18:41:40.781] removed <- setdiff(old_names, names) [18:41:40.781] changed <- common[...future.oldEnvVars[common] != [18:41:40.781] envs[common]] [18:41:40.781] NAMES <- toupper(changed) [18:41:40.781] args <- list() [18:41:40.781] for (kk in seq_along(NAMES)) { [18:41:40.781] name <- changed[[kk]] [18:41:40.781] NAME <- NAMES[[kk]] [18:41:40.781] if (name != NAME && is.element(NAME, old_names)) [18:41:40.781] next [18:41:40.781] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.781] } [18:41:40.781] NAMES <- toupper(added) [18:41:40.781] for (kk in seq_along(NAMES)) { [18:41:40.781] name <- added[[kk]] [18:41:40.781] NAME <- NAMES[[kk]] [18:41:40.781] if (name != NAME && is.element(NAME, old_names)) [18:41:40.781] next [18:41:40.781] args[[name]] <- "" [18:41:40.781] } [18:41:40.781] NAMES <- toupper(removed) [18:41:40.781] for (kk in seq_along(NAMES)) { [18:41:40.781] name <- removed[[kk]] [18:41:40.781] NAME <- NAMES[[kk]] [18:41:40.781] if (name != NAME && is.element(NAME, old_names)) [18:41:40.781] next [18:41:40.781] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.781] } [18:41:40.781] if (length(args) > 0) [18:41:40.781] base::do.call(base::Sys.setenv, args = args) [18:41:40.781] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.781] } [18:41:40.781] { [18:41:40.781] if (base::length(...future.futureOptionsAdded) > [18:41:40.781] 0L) { [18:41:40.781] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.781] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.781] base::options(opts) [18:41:40.781] } [18:41:40.781] { [18:41:40.781] { [18:41:40.781] NULL [18:41:40.781] RNGkind("Mersenne-Twister") [18:41:40.781] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.781] inherits = FALSE) [18:41:40.781] } [18:41:40.781] options(future.plan = NULL) [18:41:40.781] if (is.na(NA_character_)) [18:41:40.781] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.781] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.781] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.781] .init = FALSE) [18:41:40.781] } [18:41:40.781] } [18:41:40.781] } [18:41:40.781] }) [18:41:40.781] if (TRUE) { [18:41:40.781] base::sink(type = "output", split = FALSE) [18:41:40.781] if (TRUE) { [18:41:40.781] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.781] } [18:41:40.781] else { [18:41:40.781] ...future.result["stdout"] <- base::list(NULL) [18:41:40.781] } [18:41:40.781] base::close(...future.stdout) [18:41:40.781] ...future.stdout <- NULL [18:41:40.781] } [18:41:40.781] ...future.result$conditions <- ...future.conditions [18:41:40.781] ...future.result$finished <- base::Sys.time() [18:41:40.781] ...future.result [18:41:40.781] } [18:41:40.788] assign_globals() ... [18:41:40.788] List of 5 [18:41:40.788] $ ...future.FUN :function (x) [18:41:40.788] $ future.call.arguments : list() [18:41:40.788] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.788] $ ...future.elements_ii :List of 3 [18:41:40.788] ..$ a: num 1 [18:41:40.788] ..$ b: num 2 [18:41:40.788] ..$ c: num 3 [18:41:40.788] $ ...future.seeds_ii : NULL [18:41:40.788] $ ...future.globals.maxSize: NULL [18:41:40.788] - attr(*, "where")=List of 5 [18:41:40.788] ..$ ...future.FUN : [18:41:40.788] ..$ future.call.arguments : [18:41:40.788] ..$ ...future.elements_ii : [18:41:40.788] ..$ ...future.seeds_ii : [18:41:40.788] ..$ ...future.globals.maxSize: [18:41:40.788] - attr(*, "resolved")= logi FALSE [18:41:40.788] - attr(*, "total_size")= num 4876 [18:41:40.788] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.788] - attr(*, "already-done")= logi TRUE [18:41:40.800] - copied '...future.FUN' to environment [18:41:40.801] - copied 'future.call.arguments' to environment [18:41:40.801] - copied '...future.elements_ii' to environment [18:41:40.801] - copied '...future.seeds_ii' to environment [18:41:40.802] - copied '...future.globals.maxSize' to environment [18:41:40.802] assign_globals() ... done [18:41:40.803] plan(): Setting new future strategy stack: [18:41:40.803] List of future strategies: [18:41:40.803] 1. sequential: [18:41:40.803] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.803] - tweaked: FALSE [18:41:40.803] - call: NULL [18:41:40.804] plan(): nbrOfWorkers() = 1 [18:41:40.806] plan(): Setting new future strategy stack: [18:41:40.807] List of future strategies: [18:41:40.807] 1. sequential: [18:41:40.807] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.807] - tweaked: FALSE [18:41:40.807] - call: plan(strategy) [18:41:40.808] plan(): nbrOfWorkers() = 1 [18:41:40.808] SequentialFuture started (and completed) [18:41:40.808] - Launch lazy future ... done [18:41:40.809] run() for 'SequentialFuture' ... done [18:41:40.809] Created future: [18:41:40.809] SequentialFuture: [18:41:40.809] Label: 'future_sapply-1' [18:41:40.809] Expression: [18:41:40.809] { [18:41:40.809] do.call(function(...) { [18:41:40.809] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.809] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.809] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.809] on.exit(options(oopts), add = TRUE) [18:41:40.809] } [18:41:40.809] { [18:41:40.809] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.809] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.809] ...future.FUN(...future.X_jj, ...) [18:41:40.809] }) [18:41:40.809] } [18:41:40.809] }, args = future.call.arguments) [18:41:40.809] } [18:41:40.809] Lazy evaluation: FALSE [18:41:40.809] Asynchronous evaluation: FALSE [18:41:40.809] Local evaluation: TRUE [18:41:40.809] Environment: R_GlobalEnv [18:41:40.809] Capture standard output: TRUE [18:41:40.809] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.809] Globals: 5 objects totaling 475 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.809] Packages: [18:41:40.809] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.809] Resolved: TRUE [18:41:40.809] Value: 79 bytes of class 'list' [18:41:40.809] Early signaling: FALSE [18:41:40.809] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.809] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.811] Chunk #1 of 1 ... DONE [18:41:40.811] Launching 1 futures (chunks) ... DONE [18:41:40.812] Resolving 1 futures (chunks) ... [18:41:40.812] resolve() on list ... [18:41:40.812] recursive: 0 [18:41:40.812] length: 1 [18:41:40.813] [18:41:40.813] resolved() for 'SequentialFuture' ... [18:41:40.813] - state: 'finished' [18:41:40.814] - run: TRUE [18:41:40.814] - result: 'FutureResult' [18:41:40.814] resolved() for 'SequentialFuture' ... done [18:41:40.814] Future #1 [18:41:40.815] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.815] - nx: 1 [18:41:40.815] - relay: TRUE [18:41:40.816] - stdout: TRUE [18:41:40.816] - signal: TRUE [18:41:40.816] - resignal: FALSE [18:41:40.817] - force: TRUE [18:41:40.817] - relayed: [n=1] FALSE [18:41:40.817] - queued futures: [n=1] FALSE [18:41:40.817] - until=1 [18:41:40.818] - relaying element #1 [18:41:40.818] - relayed: [n=1] TRUE [18:41:40.818] - queued futures: [n=1] TRUE [18:41:40.818] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.818] length: 0 (resolved future 1) [18:41:40.819] Relaying remaining futures [18:41:40.819] signalConditionsASAP(NULL, pos=0) ... [18:41:40.819] - nx: 1 [18:41:40.819] - relay: TRUE [18:41:40.820] - stdout: TRUE [18:41:40.820] - signal: TRUE [18:41:40.820] - resignal: FALSE [18:41:40.820] - force: TRUE [18:41:40.821] - relayed: [n=1] TRUE [18:41:40.821] - queued futures: [n=1] TRUE - flush all [18:41:40.821] - relayed: [n=1] TRUE [18:41:40.821] - queued futures: [n=1] TRUE [18:41:40.822] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.822] resolve() on list ... DONE [18:41:40.822] - Number of value chunks collected: 1 [18:41:40.823] Resolving 1 futures (chunks) ... DONE [18:41:40.823] Reducing values from 1 chunks ... [18:41:40.823] - Number of values collected after concatenation: 3 [18:41:40.823] - Number of values expected: 3 [18:41:40.823] Reducing values from 1 chunks ... DONE [18:41:40.824] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:40.828] future_lapply() ... [18:41:40.829] Number of chunks: 1 [18:41:40.829] getGlobalsAndPackagesXApply() ... [18:41:40.829] - future.globals: TRUE [18:41:40.830] getGlobalsAndPackages() ... [18:41:40.830] Searching for globals... [18:41:40.835] - globals found: [2] 'FUN', 'UseMethod' [18:41:40.835] Searching for globals ... DONE [18:41:40.836] Resolving globals: FALSE [18:41:40.837] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:40.837] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:40.838] - globals: [1] 'FUN' [18:41:40.838] [18:41:40.838] getGlobalsAndPackages() ... DONE [18:41:40.839] - globals found/used: [n=1] 'FUN' [18:41:40.839] - needed namespaces: [n=0] [18:41:40.839] Finding globals ... DONE [18:41:40.840] - use_args: TRUE [18:41:40.840] - Getting '...' globals ... [18:41:40.841] resolve() on list ... [18:41:40.841] recursive: 0 [18:41:40.841] length: 1 [18:41:40.842] elements: '...' [18:41:40.842] length: 0 (resolved future 1) [18:41:40.842] resolve() on list ... DONE [18:41:40.843] - '...' content: [n=0] [18:41:40.843] List of 1 [18:41:40.843] $ ...: list() [18:41:40.843] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.843] - attr(*, "where")=List of 1 [18:41:40.843] ..$ ...: [18:41:40.843] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.843] - attr(*, "resolved")= logi TRUE [18:41:40.843] - attr(*, "total_size")= num NA [18:41:40.848] - Getting '...' globals ... DONE [18:41:40.849] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.849] List of 2 [18:41:40.849] $ ...future.FUN:function (x, ...) [18:41:40.849] $ ... : list() [18:41:40.849] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.849] - attr(*, "where")=List of 2 [18:41:40.849] ..$ ...future.FUN: [18:41:40.849] ..$ ... : [18:41:40.849] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.849] - attr(*, "resolved")= logi FALSE [18:41:40.849] - attr(*, "total_size")= int 5116 [18:41:40.855] Packages to be attached in all futures: [n=0] [18:41:40.856] getGlobalsAndPackagesXApply() ... DONE [18:41:40.856] Number of futures (= number of chunks): 1 [18:41:40.857] Launching 1 futures (chunks) ... [18:41:40.857] Chunk #1 of 1 ... [18:41:40.857] - Finding globals in 'X' for chunk #1 ... [18:41:40.858] getGlobalsAndPackages() ... [18:41:40.858] Searching for globals... [18:41:40.859] [18:41:40.859] Searching for globals ... DONE [18:41:40.859] - globals: [0] [18:41:40.859] getGlobalsAndPackages() ... DONE [18:41:40.860] + additional globals found: [n=0] [18:41:40.860] + additional namespaces needed: [n=0] [18:41:40.860] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.861] - seeds: [18:41:40.861] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.861] getGlobalsAndPackages() ... [18:41:40.862] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.862] Resolving globals: FALSE [18:41:40.862] Tweak future expression to call with '...' arguments ... [18:41:40.863] { [18:41:40.863] do.call(function(...) { [18:41:40.863] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.863] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.863] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.863] on.exit(options(oopts), add = TRUE) [18:41:40.863] } [18:41:40.863] { [18:41:40.863] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.863] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.863] ...future.FUN(...future.X_jj, ...) [18:41:40.863] }) [18:41:40.863] } [18:41:40.863] }, args = future.call.arguments) [18:41:40.863] } [18:41:40.863] Tweak future expression to call with '...' arguments ... DONE [18:41:40.864] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.865] [18:41:40.865] getGlobalsAndPackages() ... DONE [18:41:40.866] run() for 'Future' ... [18:41:40.866] - state: 'created' [18:41:40.866] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.867] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.868] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.868] - Field: 'label' [18:41:40.868] - Field: 'local' [18:41:40.869] - Field: 'owner' [18:41:40.869] - Field: 'envir' [18:41:40.869] - Field: 'packages' [18:41:40.870] - Field: 'gc' [18:41:40.870] - Field: 'conditions' [18:41:40.870] - Field: 'expr' [18:41:40.871] - Field: 'uuid' [18:41:40.871] - Field: 'seed' [18:41:40.871] - Field: 'version' [18:41:40.871] - Field: 'result' [18:41:40.872] - Field: 'asynchronous' [18:41:40.872] - Field: 'calls' [18:41:40.872] - Field: 'globals' [18:41:40.873] - Field: 'stdout' [18:41:40.873] - Field: 'earlySignal' [18:41:40.873] - Field: 'lazy' [18:41:40.874] - Field: 'state' [18:41:40.874] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.874] - Launch lazy future ... [18:41:40.875] Packages needed by the future expression (n = 0): [18:41:40.875] Packages needed by future strategies (n = 0): [18:41:40.876] { [18:41:40.876] { [18:41:40.876] { [18:41:40.876] ...future.startTime <- base::Sys.time() [18:41:40.876] { [18:41:40.876] { [18:41:40.876] { [18:41:40.876] base::local({ [18:41:40.876] has_future <- base::requireNamespace("future", [18:41:40.876] quietly = TRUE) [18:41:40.876] if (has_future) { [18:41:40.876] ns <- base::getNamespace("future") [18:41:40.876] version <- ns[[".package"]][["version"]] [18:41:40.876] if (is.null(version)) [18:41:40.876] version <- utils::packageVersion("future") [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] version <- NULL [18:41:40.876] } [18:41:40.876] if (!has_future || version < "1.8.0") { [18:41:40.876] info <- base::c(r_version = base::gsub("R version ", [18:41:40.876] "", base::R.version$version.string), [18:41:40.876] platform = base::sprintf("%s (%s-bit)", [18:41:40.876] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.876] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.876] "release", "version")], collapse = " "), [18:41:40.876] hostname = base::Sys.info()[["nodename"]]) [18:41:40.876] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.876] info) [18:41:40.876] info <- base::paste(info, collapse = "; ") [18:41:40.876] if (!has_future) { [18:41:40.876] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.876] info) [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.876] info, version) [18:41:40.876] } [18:41:40.876] base::stop(msg) [18:41:40.876] } [18:41:40.876] }) [18:41:40.876] } [18:41:40.876] ...future.strategy.old <- future::plan("list") [18:41:40.876] options(future.plan = NULL) [18:41:40.876] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.876] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.876] } [18:41:40.876] ...future.workdir <- getwd() [18:41:40.876] } [18:41:40.876] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.876] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.876] } [18:41:40.876] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.876] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.876] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.876] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.876] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.876] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.876] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.876] base::names(...future.oldOptions)) [18:41:40.876] } [18:41:40.876] if (FALSE) { [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] if (TRUE) { [18:41:40.876] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.876] open = "w") [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.876] windows = "NUL", "/dev/null"), open = "w") [18:41:40.876] } [18:41:40.876] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.876] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.876] base::sink(type = "output", split = FALSE) [18:41:40.876] base::close(...future.stdout) [18:41:40.876] }, add = TRUE) [18:41:40.876] } [18:41:40.876] ...future.frame <- base::sys.nframe() [18:41:40.876] ...future.conditions <- base::list() [18:41:40.876] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.876] if (FALSE) { [18:41:40.876] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.876] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.876] } [18:41:40.876] ...future.result <- base::tryCatch({ [18:41:40.876] base::withCallingHandlers({ [18:41:40.876] ...future.value <- base::withVisible(base::local({ [18:41:40.876] do.call(function(...) { [18:41:40.876] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.876] if (!identical(...future.globals.maxSize.org, [18:41:40.876] ...future.globals.maxSize)) { [18:41:40.876] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.876] on.exit(options(oopts), add = TRUE) [18:41:40.876] } [18:41:40.876] { [18:41:40.876] lapply(seq_along(...future.elements_ii), [18:41:40.876] FUN = function(jj) { [18:41:40.876] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.876] ...future.FUN(...future.X_jj, ...) [18:41:40.876] }) [18:41:40.876] } [18:41:40.876] }, args = future.call.arguments) [18:41:40.876] })) [18:41:40.876] future::FutureResult(value = ...future.value$value, [18:41:40.876] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.876] ...future.rng), globalenv = if (FALSE) [18:41:40.876] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.876] ...future.globalenv.names)) [18:41:40.876] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.876] }, condition = base::local({ [18:41:40.876] c <- base::c [18:41:40.876] inherits <- base::inherits [18:41:40.876] invokeRestart <- base::invokeRestart [18:41:40.876] length <- base::length [18:41:40.876] list <- base::list [18:41:40.876] seq.int <- base::seq.int [18:41:40.876] signalCondition <- base::signalCondition [18:41:40.876] sys.calls <- base::sys.calls [18:41:40.876] `[[` <- base::`[[` [18:41:40.876] `+` <- base::`+` [18:41:40.876] `<<-` <- base::`<<-` [18:41:40.876] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.876] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.876] 3L)] [18:41:40.876] } [18:41:40.876] function(cond) { [18:41:40.876] is_error <- inherits(cond, "error") [18:41:40.876] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.876] NULL) [18:41:40.876] if (is_error) { [18:41:40.876] sessionInformation <- function() { [18:41:40.876] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.876] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.876] search = base::search(), system = base::Sys.info()) [18:41:40.876] } [18:41:40.876] ...future.conditions[[length(...future.conditions) + [18:41:40.876] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.876] cond$call), session = sessionInformation(), [18:41:40.876] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.876] signalCondition(cond) [18:41:40.876] } [18:41:40.876] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.876] "immediateCondition"))) { [18:41:40.876] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.876] ...future.conditions[[length(...future.conditions) + [18:41:40.876] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.876] if (TRUE && !signal) { [18:41:40.876] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.876] { [18:41:40.876] inherits <- base::inherits [18:41:40.876] invokeRestart <- base::invokeRestart [18:41:40.876] is.null <- base::is.null [18:41:40.876] muffled <- FALSE [18:41:40.876] if (inherits(cond, "message")) { [18:41:40.876] muffled <- grepl(pattern, "muffleMessage") [18:41:40.876] if (muffled) [18:41:40.876] invokeRestart("muffleMessage") [18:41:40.876] } [18:41:40.876] else if (inherits(cond, "warning")) { [18:41:40.876] muffled <- grepl(pattern, "muffleWarning") [18:41:40.876] if (muffled) [18:41:40.876] invokeRestart("muffleWarning") [18:41:40.876] } [18:41:40.876] else if (inherits(cond, "condition")) { [18:41:40.876] if (!is.null(pattern)) { [18:41:40.876] computeRestarts <- base::computeRestarts [18:41:40.876] grepl <- base::grepl [18:41:40.876] restarts <- computeRestarts(cond) [18:41:40.876] for (restart in restarts) { [18:41:40.876] name <- restart$name [18:41:40.876] if (is.null(name)) [18:41:40.876] next [18:41:40.876] if (!grepl(pattern, name)) [18:41:40.876] next [18:41:40.876] invokeRestart(restart) [18:41:40.876] muffled <- TRUE [18:41:40.876] break [18:41:40.876] } [18:41:40.876] } [18:41:40.876] } [18:41:40.876] invisible(muffled) [18:41:40.876] } [18:41:40.876] muffleCondition(cond, pattern = "^muffle") [18:41:40.876] } [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] if (TRUE) { [18:41:40.876] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.876] { [18:41:40.876] inherits <- base::inherits [18:41:40.876] invokeRestart <- base::invokeRestart [18:41:40.876] is.null <- base::is.null [18:41:40.876] muffled <- FALSE [18:41:40.876] if (inherits(cond, "message")) { [18:41:40.876] muffled <- grepl(pattern, "muffleMessage") [18:41:40.876] if (muffled) [18:41:40.876] invokeRestart("muffleMessage") [18:41:40.876] } [18:41:40.876] else if (inherits(cond, "warning")) { [18:41:40.876] muffled <- grepl(pattern, "muffleWarning") [18:41:40.876] if (muffled) [18:41:40.876] invokeRestart("muffleWarning") [18:41:40.876] } [18:41:40.876] else if (inherits(cond, "condition")) { [18:41:40.876] if (!is.null(pattern)) { [18:41:40.876] computeRestarts <- base::computeRestarts [18:41:40.876] grepl <- base::grepl [18:41:40.876] restarts <- computeRestarts(cond) [18:41:40.876] for (restart in restarts) { [18:41:40.876] name <- restart$name [18:41:40.876] if (is.null(name)) [18:41:40.876] next [18:41:40.876] if (!grepl(pattern, name)) [18:41:40.876] next [18:41:40.876] invokeRestart(restart) [18:41:40.876] muffled <- TRUE [18:41:40.876] break [18:41:40.876] } [18:41:40.876] } [18:41:40.876] } [18:41:40.876] invisible(muffled) [18:41:40.876] } [18:41:40.876] muffleCondition(cond, pattern = "^muffle") [18:41:40.876] } [18:41:40.876] } [18:41:40.876] } [18:41:40.876] })) [18:41:40.876] }, error = function(ex) { [18:41:40.876] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.876] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.876] ...future.rng), started = ...future.startTime, [18:41:40.876] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.876] version = "1.8"), class = "FutureResult") [18:41:40.876] }, finally = { [18:41:40.876] if (!identical(...future.workdir, getwd())) [18:41:40.876] setwd(...future.workdir) [18:41:40.876] { [18:41:40.876] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.876] ...future.oldOptions$nwarnings <- NULL [18:41:40.876] } [18:41:40.876] base::options(...future.oldOptions) [18:41:40.876] if (.Platform$OS.type == "windows") { [18:41:40.876] old_names <- names(...future.oldEnvVars) [18:41:40.876] envs <- base::Sys.getenv() [18:41:40.876] names <- names(envs) [18:41:40.876] common <- intersect(names, old_names) [18:41:40.876] added <- setdiff(names, old_names) [18:41:40.876] removed <- setdiff(old_names, names) [18:41:40.876] changed <- common[...future.oldEnvVars[common] != [18:41:40.876] envs[common]] [18:41:40.876] NAMES <- toupper(changed) [18:41:40.876] args <- list() [18:41:40.876] for (kk in seq_along(NAMES)) { [18:41:40.876] name <- changed[[kk]] [18:41:40.876] NAME <- NAMES[[kk]] [18:41:40.876] if (name != NAME && is.element(NAME, old_names)) [18:41:40.876] next [18:41:40.876] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.876] } [18:41:40.876] NAMES <- toupper(added) [18:41:40.876] for (kk in seq_along(NAMES)) { [18:41:40.876] name <- added[[kk]] [18:41:40.876] NAME <- NAMES[[kk]] [18:41:40.876] if (name != NAME && is.element(NAME, old_names)) [18:41:40.876] next [18:41:40.876] args[[name]] <- "" [18:41:40.876] } [18:41:40.876] NAMES <- toupper(removed) [18:41:40.876] for (kk in seq_along(NAMES)) { [18:41:40.876] name <- removed[[kk]] [18:41:40.876] NAME <- NAMES[[kk]] [18:41:40.876] if (name != NAME && is.element(NAME, old_names)) [18:41:40.876] next [18:41:40.876] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.876] } [18:41:40.876] if (length(args) > 0) [18:41:40.876] base::do.call(base::Sys.setenv, args = args) [18:41:40.876] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.876] } [18:41:40.876] { [18:41:40.876] if (base::length(...future.futureOptionsAdded) > [18:41:40.876] 0L) { [18:41:40.876] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.876] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.876] base::options(opts) [18:41:40.876] } [18:41:40.876] { [18:41:40.876] { [18:41:40.876] NULL [18:41:40.876] RNGkind("Mersenne-Twister") [18:41:40.876] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.876] inherits = FALSE) [18:41:40.876] } [18:41:40.876] options(future.plan = NULL) [18:41:40.876] if (is.na(NA_character_)) [18:41:40.876] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.876] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.876] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.876] .init = FALSE) [18:41:40.876] } [18:41:40.876] } [18:41:40.876] } [18:41:40.876] }) [18:41:40.876] if (TRUE) { [18:41:40.876] base::sink(type = "output", split = FALSE) [18:41:40.876] if (TRUE) { [18:41:40.876] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.876] } [18:41:40.876] else { [18:41:40.876] ...future.result["stdout"] <- base::list(NULL) [18:41:40.876] } [18:41:40.876] base::close(...future.stdout) [18:41:40.876] ...future.stdout <- NULL [18:41:40.876] } [18:41:40.876] ...future.result$conditions <- ...future.conditions [18:41:40.876] ...future.result$finished <- base::Sys.time() [18:41:40.876] ...future.result [18:41:40.876] } [18:41:40.883] assign_globals() ... [18:41:40.883] List of 5 [18:41:40.883] $ ...future.FUN :function (x, ...) [18:41:40.883] $ future.call.arguments : list() [18:41:40.883] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.883] $ ...future.elements_ii :List of 3 [18:41:40.883] ..$ a: num 1 [18:41:40.883] ..$ b: num 2 [18:41:40.883] ..$ c: num 3 [18:41:40.883] $ ...future.seeds_ii : NULL [18:41:40.883] $ ...future.globals.maxSize: NULL [18:41:40.883] - attr(*, "where")=List of 5 [18:41:40.883] ..$ ...future.FUN : [18:41:40.883] ..$ future.call.arguments : [18:41:40.883] ..$ ...future.elements_ii : [18:41:40.883] ..$ ...future.seeds_ii : [18:41:40.883] ..$ ...future.globals.maxSize: [18:41:40.883] - attr(*, "resolved")= logi FALSE [18:41:40.883] - attr(*, "total_size")= num 5116 [18:41:40.883] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.883] - attr(*, "already-done")= logi TRUE [18:41:40.899] - copied '...future.FUN' to environment [18:41:40.899] - copied 'future.call.arguments' to environment [18:41:40.900] - copied '...future.elements_ii' to environment [18:41:40.900] - copied '...future.seeds_ii' to environment [18:41:40.900] - copied '...future.globals.maxSize' to environment [18:41:40.900] assign_globals() ... done [18:41:40.901] plan(): Setting new future strategy stack: [18:41:40.901] List of future strategies: [18:41:40.901] 1. sequential: [18:41:40.901] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.901] - tweaked: FALSE [18:41:40.901] - call: NULL [18:41:40.903] plan(): nbrOfWorkers() = 1 [18:41:40.905] plan(): Setting new future strategy stack: [18:41:40.905] List of future strategies: [18:41:40.905] 1. sequential: [18:41:40.905] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.905] - tweaked: FALSE [18:41:40.905] - call: plan(strategy) [18:41:40.906] plan(): nbrOfWorkers() = 1 [18:41:40.907] SequentialFuture started (and completed) [18:41:40.907] - Launch lazy future ... done [18:41:40.908] run() for 'SequentialFuture' ... done [18:41:40.908] Created future: [18:41:40.908] SequentialFuture: [18:41:40.908] Label: 'future_sapply-1' [18:41:40.908] Expression: [18:41:40.908] { [18:41:40.908] do.call(function(...) { [18:41:40.908] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.908] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.908] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.908] on.exit(options(oopts), add = TRUE) [18:41:40.908] } [18:41:40.908] { [18:41:40.908] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.908] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.908] ...future.FUN(...future.X_jj, ...) [18:41:40.908] }) [18:41:40.908] } [18:41:40.908] }, args = future.call.arguments) [18:41:40.908] } [18:41:40.908] Lazy evaluation: FALSE [18:41:40.908] Asynchronous evaluation: FALSE [18:41:40.908] Local evaluation: TRUE [18:41:40.908] Environment: R_GlobalEnv [18:41:40.908] Capture standard output: TRUE [18:41:40.908] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.908] Globals: 5 objects totaling 568 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.908] Packages: [18:41:40.908] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.908] Resolved: TRUE [18:41:40.908] Value: 174 bytes of class 'list' [18:41:40.908] Early signaling: FALSE [18:41:40.908] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.908] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.910] Chunk #1 of 1 ... DONE [18:41:40.911] Launching 1 futures (chunks) ... DONE [18:41:40.911] Resolving 1 futures (chunks) ... [18:41:40.911] resolve() on list ... [18:41:40.912] recursive: 0 [18:41:40.912] length: 1 [18:41:40.912] [18:41:40.913] resolved() for 'SequentialFuture' ... [18:41:40.913] - state: 'finished' [18:41:40.913] - run: TRUE [18:41:40.914] - result: 'FutureResult' [18:41:40.914] resolved() for 'SequentialFuture' ... done [18:41:40.914] Future #1 [18:41:40.915] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.915] - nx: 1 [18:41:40.915] - relay: TRUE [18:41:40.916] - stdout: TRUE [18:41:40.916] - signal: TRUE [18:41:40.916] - resignal: FALSE [18:41:40.916] - force: TRUE [18:41:40.917] - relayed: [n=1] FALSE [18:41:40.917] - queued futures: [n=1] FALSE [18:41:40.917] - until=1 [18:41:40.918] - relaying element #1 [18:41:40.918] - relayed: [n=1] TRUE [18:41:40.919] - queued futures: [n=1] TRUE [18:41:40.919] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.919] length: 0 (resolved future 1) [18:41:40.919] Relaying remaining futures [18:41:40.920] signalConditionsASAP(NULL, pos=0) ... [18:41:40.920] - nx: 1 [18:41:40.920] - relay: TRUE [18:41:40.921] - stdout: TRUE [18:41:40.921] - signal: TRUE [18:41:40.921] - resignal: FALSE [18:41:40.921] - force: TRUE [18:41:40.922] - relayed: [n=1] TRUE [18:41:40.922] - queued futures: [n=1] TRUE - flush all [18:41:40.922] - relayed: [n=1] TRUE [18:41:40.923] - queued futures: [n=1] TRUE [18:41:40.923] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.923] resolve() on list ... DONE [18:41:40.924] - Number of value chunks collected: 1 [18:41:40.924] Resolving 1 futures (chunks) ... DONE [18:41:40.924] Reducing values from 1 chunks ... [18:41:40.925] - Number of values collected after concatenation: 3 [18:41:40.925] - Number of values expected: 3 [18:41:40.925] Reducing values from 1 chunks ... DONE [18:41:40.925] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:40.927] future_lapply() ... [18:41:40.929] Number of chunks: 1 [18:41:40.929] getGlobalsAndPackagesXApply() ... [18:41:40.929] - future.globals: TRUE [18:41:40.931] getGlobalsAndPackages() ... [18:41:40.932] Searching for globals... [18:41:40.934] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:40.934] Searching for globals ... DONE [18:41:40.934] Resolving globals: FALSE [18:41:40.935] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:40.935] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:40.935] - globals: [1] 'FUN' [18:41:40.936] [18:41:40.936] getGlobalsAndPackages() ... DONE [18:41:40.936] - globals found/used: [n=1] 'FUN' [18:41:40.936] - needed namespaces: [n=0] [18:41:40.936] Finding globals ... DONE [18:41:40.936] - use_args: TRUE [18:41:40.937] - Getting '...' globals ... [18:41:40.937] resolve() on list ... [18:41:40.937] recursive: 0 [18:41:40.937] length: 1 [18:41:40.938] elements: '...' [18:41:40.938] length: 0 (resolved future 1) [18:41:40.938] resolve() on list ... DONE [18:41:40.938] - '...' content: [n=0] [18:41:40.938] List of 1 [18:41:40.938] $ ...: list() [18:41:40.938] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.938] - attr(*, "where")=List of 1 [18:41:40.938] ..$ ...: [18:41:40.938] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.938] - attr(*, "resolved")= logi TRUE [18:41:40.938] - attr(*, "total_size")= num NA [18:41:40.941] - Getting '...' globals ... DONE [18:41:40.942] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.942] List of 2 [18:41:40.942] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:40.942] $ ... : list() [18:41:40.942] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.942] - attr(*, "where")=List of 2 [18:41:40.942] ..$ ...future.FUN: [18:41:40.942] ..$ ... : [18:41:40.942] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.942] - attr(*, "resolved")= logi FALSE [18:41:40.942] - attr(*, "total_size")= int 6598 [18:41:40.945] Packages to be attached in all futures: [n=0] [18:41:40.945] getGlobalsAndPackagesXApply() ... DONE [18:41:40.946] Number of futures (= number of chunks): 1 [18:41:40.946] Launching 1 futures (chunks) ... [18:41:40.946] Chunk #1 of 1 ... [18:41:40.946] - Finding globals in 'X' for chunk #1 ... [18:41:40.946] getGlobalsAndPackages() ... [18:41:40.946] Searching for globals... [18:41:40.947] [18:41:40.947] Searching for globals ... DONE [18:41:40.947] - globals: [0] [18:41:40.947] getGlobalsAndPackages() ... DONE [18:41:40.947] + additional globals found: [n=0] [18:41:40.948] + additional namespaces needed: [n=0] [18:41:40.948] - Finding globals in 'X' for chunk #1 ... DONE [18:41:40.948] - seeds: [18:41:40.948] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.948] getGlobalsAndPackages() ... [18:41:40.948] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.949] Resolving globals: FALSE [18:41:40.949] Tweak future expression to call with '...' arguments ... [18:41:40.949] { [18:41:40.949] do.call(function(...) { [18:41:40.949] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.949] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.949] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.949] on.exit(options(oopts), add = TRUE) [18:41:40.949] } [18:41:40.949] { [18:41:40.949] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.949] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.949] ...future.FUN(...future.X_jj, ...) [18:41:40.949] }) [18:41:40.949] } [18:41:40.949] }, args = future.call.arguments) [18:41:40.949] } [18:41:40.949] Tweak future expression to call with '...' arguments ... DONE [18:41:40.950] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:40.950] [18:41:40.950] getGlobalsAndPackages() ... DONE [18:41:40.951] run() for 'Future' ... [18:41:40.951] - state: 'created' [18:41:40.951] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:40.951] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.952] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:40.952] - Field: 'label' [18:41:40.952] - Field: 'local' [18:41:40.952] - Field: 'owner' [18:41:40.952] - Field: 'envir' [18:41:40.953] - Field: 'packages' [18:41:40.953] - Field: 'gc' [18:41:40.953] - Field: 'conditions' [18:41:40.953] - Field: 'expr' [18:41:40.953] - Field: 'uuid' [18:41:40.953] - Field: 'seed' [18:41:40.954] - Field: 'version' [18:41:40.954] - Field: 'result' [18:41:40.954] - Field: 'asynchronous' [18:41:40.954] - Field: 'calls' [18:41:40.954] - Field: 'globals' [18:41:40.954] - Field: 'stdout' [18:41:40.955] - Field: 'earlySignal' [18:41:40.955] - Field: 'lazy' [18:41:40.955] - Field: 'state' [18:41:40.955] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:40.955] - Launch lazy future ... [18:41:40.956] Packages needed by the future expression (n = 0): [18:41:40.956] Packages needed by future strategies (n = 0): [18:41:40.956] { [18:41:40.956] { [18:41:40.956] { [18:41:40.956] ...future.startTime <- base::Sys.time() [18:41:40.956] { [18:41:40.956] { [18:41:40.956] { [18:41:40.956] base::local({ [18:41:40.956] has_future <- base::requireNamespace("future", [18:41:40.956] quietly = TRUE) [18:41:40.956] if (has_future) { [18:41:40.956] ns <- base::getNamespace("future") [18:41:40.956] version <- ns[[".package"]][["version"]] [18:41:40.956] if (is.null(version)) [18:41:40.956] version <- utils::packageVersion("future") [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] version <- NULL [18:41:40.956] } [18:41:40.956] if (!has_future || version < "1.8.0") { [18:41:40.956] info <- base::c(r_version = base::gsub("R version ", [18:41:40.956] "", base::R.version$version.string), [18:41:40.956] platform = base::sprintf("%s (%s-bit)", [18:41:40.956] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:40.956] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:40.956] "release", "version")], collapse = " "), [18:41:40.956] hostname = base::Sys.info()[["nodename"]]) [18:41:40.956] info <- base::sprintf("%s: %s", base::names(info), [18:41:40.956] info) [18:41:40.956] info <- base::paste(info, collapse = "; ") [18:41:40.956] if (!has_future) { [18:41:40.956] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:40.956] info) [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:40.956] info, version) [18:41:40.956] } [18:41:40.956] base::stop(msg) [18:41:40.956] } [18:41:40.956] }) [18:41:40.956] } [18:41:40.956] ...future.strategy.old <- future::plan("list") [18:41:40.956] options(future.plan = NULL) [18:41:40.956] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.956] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:40.956] } [18:41:40.956] ...future.workdir <- getwd() [18:41:40.956] } [18:41:40.956] ...future.oldOptions <- base::as.list(base::.Options) [18:41:40.956] ...future.oldEnvVars <- base::Sys.getenv() [18:41:40.956] } [18:41:40.956] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:40.956] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:40.956] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:40.956] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:40.956] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:40.956] future.stdout.windows.reencode = NULL, width = 80L) [18:41:40.956] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:40.956] base::names(...future.oldOptions)) [18:41:40.956] } [18:41:40.956] if (FALSE) { [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] if (TRUE) { [18:41:40.956] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:40.956] open = "w") [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:40.956] windows = "NUL", "/dev/null"), open = "w") [18:41:40.956] } [18:41:40.956] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:40.956] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:40.956] base::sink(type = "output", split = FALSE) [18:41:40.956] base::close(...future.stdout) [18:41:40.956] }, add = TRUE) [18:41:40.956] } [18:41:40.956] ...future.frame <- base::sys.nframe() [18:41:40.956] ...future.conditions <- base::list() [18:41:40.956] ...future.rng <- base::globalenv()$.Random.seed [18:41:40.956] if (FALSE) { [18:41:40.956] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:40.956] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:40.956] } [18:41:40.956] ...future.result <- base::tryCatch({ [18:41:40.956] base::withCallingHandlers({ [18:41:40.956] ...future.value <- base::withVisible(base::local({ [18:41:40.956] do.call(function(...) { [18:41:40.956] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.956] if (!identical(...future.globals.maxSize.org, [18:41:40.956] ...future.globals.maxSize)) { [18:41:40.956] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.956] on.exit(options(oopts), add = TRUE) [18:41:40.956] } [18:41:40.956] { [18:41:40.956] lapply(seq_along(...future.elements_ii), [18:41:40.956] FUN = function(jj) { [18:41:40.956] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.956] ...future.FUN(...future.X_jj, ...) [18:41:40.956] }) [18:41:40.956] } [18:41:40.956] }, args = future.call.arguments) [18:41:40.956] })) [18:41:40.956] future::FutureResult(value = ...future.value$value, [18:41:40.956] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.956] ...future.rng), globalenv = if (FALSE) [18:41:40.956] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:40.956] ...future.globalenv.names)) [18:41:40.956] else NULL, started = ...future.startTime, version = "1.8") [18:41:40.956] }, condition = base::local({ [18:41:40.956] c <- base::c [18:41:40.956] inherits <- base::inherits [18:41:40.956] invokeRestart <- base::invokeRestart [18:41:40.956] length <- base::length [18:41:40.956] list <- base::list [18:41:40.956] seq.int <- base::seq.int [18:41:40.956] signalCondition <- base::signalCondition [18:41:40.956] sys.calls <- base::sys.calls [18:41:40.956] `[[` <- base::`[[` [18:41:40.956] `+` <- base::`+` [18:41:40.956] `<<-` <- base::`<<-` [18:41:40.956] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:40.956] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:40.956] 3L)] [18:41:40.956] } [18:41:40.956] function(cond) { [18:41:40.956] is_error <- inherits(cond, "error") [18:41:40.956] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:40.956] NULL) [18:41:40.956] if (is_error) { [18:41:40.956] sessionInformation <- function() { [18:41:40.956] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:40.956] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:40.956] search = base::search(), system = base::Sys.info()) [18:41:40.956] } [18:41:40.956] ...future.conditions[[length(...future.conditions) + [18:41:40.956] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:40.956] cond$call), session = sessionInformation(), [18:41:40.956] timestamp = base::Sys.time(), signaled = 0L) [18:41:40.956] signalCondition(cond) [18:41:40.956] } [18:41:40.956] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:40.956] "immediateCondition"))) { [18:41:40.956] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:40.956] ...future.conditions[[length(...future.conditions) + [18:41:40.956] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:40.956] if (TRUE && !signal) { [18:41:40.956] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.956] { [18:41:40.956] inherits <- base::inherits [18:41:40.956] invokeRestart <- base::invokeRestart [18:41:40.956] is.null <- base::is.null [18:41:40.956] muffled <- FALSE [18:41:40.956] if (inherits(cond, "message")) { [18:41:40.956] muffled <- grepl(pattern, "muffleMessage") [18:41:40.956] if (muffled) [18:41:40.956] invokeRestart("muffleMessage") [18:41:40.956] } [18:41:40.956] else if (inherits(cond, "warning")) { [18:41:40.956] muffled <- grepl(pattern, "muffleWarning") [18:41:40.956] if (muffled) [18:41:40.956] invokeRestart("muffleWarning") [18:41:40.956] } [18:41:40.956] else if (inherits(cond, "condition")) { [18:41:40.956] if (!is.null(pattern)) { [18:41:40.956] computeRestarts <- base::computeRestarts [18:41:40.956] grepl <- base::grepl [18:41:40.956] restarts <- computeRestarts(cond) [18:41:40.956] for (restart in restarts) { [18:41:40.956] name <- restart$name [18:41:40.956] if (is.null(name)) [18:41:40.956] next [18:41:40.956] if (!grepl(pattern, name)) [18:41:40.956] next [18:41:40.956] invokeRestart(restart) [18:41:40.956] muffled <- TRUE [18:41:40.956] break [18:41:40.956] } [18:41:40.956] } [18:41:40.956] } [18:41:40.956] invisible(muffled) [18:41:40.956] } [18:41:40.956] muffleCondition(cond, pattern = "^muffle") [18:41:40.956] } [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] if (TRUE) { [18:41:40.956] muffleCondition <- function (cond, pattern = "^muffle") [18:41:40.956] { [18:41:40.956] inherits <- base::inherits [18:41:40.956] invokeRestart <- base::invokeRestart [18:41:40.956] is.null <- base::is.null [18:41:40.956] muffled <- FALSE [18:41:40.956] if (inherits(cond, "message")) { [18:41:40.956] muffled <- grepl(pattern, "muffleMessage") [18:41:40.956] if (muffled) [18:41:40.956] invokeRestart("muffleMessage") [18:41:40.956] } [18:41:40.956] else if (inherits(cond, "warning")) { [18:41:40.956] muffled <- grepl(pattern, "muffleWarning") [18:41:40.956] if (muffled) [18:41:40.956] invokeRestart("muffleWarning") [18:41:40.956] } [18:41:40.956] else if (inherits(cond, "condition")) { [18:41:40.956] if (!is.null(pattern)) { [18:41:40.956] computeRestarts <- base::computeRestarts [18:41:40.956] grepl <- base::grepl [18:41:40.956] restarts <- computeRestarts(cond) [18:41:40.956] for (restart in restarts) { [18:41:40.956] name <- restart$name [18:41:40.956] if (is.null(name)) [18:41:40.956] next [18:41:40.956] if (!grepl(pattern, name)) [18:41:40.956] next [18:41:40.956] invokeRestart(restart) [18:41:40.956] muffled <- TRUE [18:41:40.956] break [18:41:40.956] } [18:41:40.956] } [18:41:40.956] } [18:41:40.956] invisible(muffled) [18:41:40.956] } [18:41:40.956] muffleCondition(cond, pattern = "^muffle") [18:41:40.956] } [18:41:40.956] } [18:41:40.956] } [18:41:40.956] })) [18:41:40.956] }, error = function(ex) { [18:41:40.956] base::structure(base::list(value = NULL, visible = NULL, [18:41:40.956] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:40.956] ...future.rng), started = ...future.startTime, [18:41:40.956] finished = Sys.time(), session_uuid = NA_character_, [18:41:40.956] version = "1.8"), class = "FutureResult") [18:41:40.956] }, finally = { [18:41:40.956] if (!identical(...future.workdir, getwd())) [18:41:40.956] setwd(...future.workdir) [18:41:40.956] { [18:41:40.956] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:40.956] ...future.oldOptions$nwarnings <- NULL [18:41:40.956] } [18:41:40.956] base::options(...future.oldOptions) [18:41:40.956] if (.Platform$OS.type == "windows") { [18:41:40.956] old_names <- names(...future.oldEnvVars) [18:41:40.956] envs <- base::Sys.getenv() [18:41:40.956] names <- names(envs) [18:41:40.956] common <- intersect(names, old_names) [18:41:40.956] added <- setdiff(names, old_names) [18:41:40.956] removed <- setdiff(old_names, names) [18:41:40.956] changed <- common[...future.oldEnvVars[common] != [18:41:40.956] envs[common]] [18:41:40.956] NAMES <- toupper(changed) [18:41:40.956] args <- list() [18:41:40.956] for (kk in seq_along(NAMES)) { [18:41:40.956] name <- changed[[kk]] [18:41:40.956] NAME <- NAMES[[kk]] [18:41:40.956] if (name != NAME && is.element(NAME, old_names)) [18:41:40.956] next [18:41:40.956] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.956] } [18:41:40.956] NAMES <- toupper(added) [18:41:40.956] for (kk in seq_along(NAMES)) { [18:41:40.956] name <- added[[kk]] [18:41:40.956] NAME <- NAMES[[kk]] [18:41:40.956] if (name != NAME && is.element(NAME, old_names)) [18:41:40.956] next [18:41:40.956] args[[name]] <- "" [18:41:40.956] } [18:41:40.956] NAMES <- toupper(removed) [18:41:40.956] for (kk in seq_along(NAMES)) { [18:41:40.956] name <- removed[[kk]] [18:41:40.956] NAME <- NAMES[[kk]] [18:41:40.956] if (name != NAME && is.element(NAME, old_names)) [18:41:40.956] next [18:41:40.956] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:40.956] } [18:41:40.956] if (length(args) > 0) [18:41:40.956] base::do.call(base::Sys.setenv, args = args) [18:41:40.956] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:40.956] } [18:41:40.956] { [18:41:40.956] if (base::length(...future.futureOptionsAdded) > [18:41:40.956] 0L) { [18:41:40.956] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:40.956] base::names(opts) <- ...future.futureOptionsAdded [18:41:40.956] base::options(opts) [18:41:40.956] } [18:41:40.956] { [18:41:40.956] { [18:41:40.956] NULL [18:41:40.956] RNGkind("Mersenne-Twister") [18:41:40.956] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:40.956] inherits = FALSE) [18:41:40.956] } [18:41:40.956] options(future.plan = NULL) [18:41:40.956] if (is.na(NA_character_)) [18:41:40.956] Sys.unsetenv("R_FUTURE_PLAN") [18:41:40.956] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:40.956] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:40.956] .init = FALSE) [18:41:40.956] } [18:41:40.956] } [18:41:40.956] } [18:41:40.956] }) [18:41:40.956] if (TRUE) { [18:41:40.956] base::sink(type = "output", split = FALSE) [18:41:40.956] if (TRUE) { [18:41:40.956] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:40.956] } [18:41:40.956] else { [18:41:40.956] ...future.result["stdout"] <- base::list(NULL) [18:41:40.956] } [18:41:40.956] base::close(...future.stdout) [18:41:40.956] ...future.stdout <- NULL [18:41:40.956] } [18:41:40.956] ...future.result$conditions <- ...future.conditions [18:41:40.956] ...future.result$finished <- base::Sys.time() [18:41:40.956] ...future.result [18:41:40.956] } [18:41:40.962] assign_globals() ... [18:41:40.962] List of 5 [18:41:40.962] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:40.962] $ future.call.arguments : list() [18:41:40.962] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.962] $ ...future.elements_ii :List of 3 [18:41:40.962] ..$ a: num 1 [18:41:40.962] ..$ b: num 2 [18:41:40.962] ..$ c: num 3 [18:41:40.962] $ ...future.seeds_ii : NULL [18:41:40.962] $ ...future.globals.maxSize: NULL [18:41:40.962] - attr(*, "where")=List of 5 [18:41:40.962] ..$ ...future.FUN : [18:41:40.962] ..$ future.call.arguments : [18:41:40.962] ..$ ...future.elements_ii : [18:41:40.962] ..$ ...future.seeds_ii : [18:41:40.962] ..$ ...future.globals.maxSize: [18:41:40.962] - attr(*, "resolved")= logi FALSE [18:41:40.962] - attr(*, "total_size")= num 6598 [18:41:40.962] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.962] - attr(*, "already-done")= logi TRUE [18:41:40.969] - reassign environment for '...future.FUN' [18:41:40.969] - copied '...future.FUN' to environment [18:41:40.969] - copied 'future.call.arguments' to environment [18:41:40.969] - copied '...future.elements_ii' to environment [18:41:40.969] - copied '...future.seeds_ii' to environment [18:41:40.970] - copied '...future.globals.maxSize' to environment [18:41:40.970] assign_globals() ... done [18:41:40.970] plan(): Setting new future strategy stack: [18:41:40.970] List of future strategies: [18:41:40.970] 1. sequential: [18:41:40.970] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.970] - tweaked: FALSE [18:41:40.970] - call: NULL [18:41:40.971] plan(): nbrOfWorkers() = 1 [18:41:40.972] plan(): Setting new future strategy stack: [18:41:40.973] List of future strategies: [18:41:40.973] 1. sequential: [18:41:40.973] - args: function (..., envir = parent.frame(), workers = "") [18:41:40.973] - tweaked: FALSE [18:41:40.973] - call: plan(strategy) [18:41:40.973] plan(): nbrOfWorkers() = 1 [18:41:40.973] SequentialFuture started (and completed) [18:41:40.974] - Launch lazy future ... done [18:41:40.974] run() for 'SequentialFuture' ... done [18:41:40.974] Created future: [18:41:40.974] SequentialFuture: [18:41:40.974] Label: 'future_sapply-1' [18:41:40.974] Expression: [18:41:40.974] { [18:41:40.974] do.call(function(...) { [18:41:40.974] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:40.974] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:40.974] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:40.974] on.exit(options(oopts), add = TRUE) [18:41:40.974] } [18:41:40.974] { [18:41:40.974] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:40.974] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:40.974] ...future.FUN(...future.X_jj, ...) [18:41:40.974] }) [18:41:40.974] } [18:41:40.974] }, args = future.call.arguments) [18:41:40.974] } [18:41:40.974] Lazy evaluation: FALSE [18:41:40.974] Asynchronous evaluation: FALSE [18:41:40.974] Local evaluation: TRUE [18:41:40.974] Environment: R_GlobalEnv [18:41:40.974] Capture standard output: TRUE [18:41:40.974] Capture condition classes: 'condition' (excluding 'nothing') [18:41:40.974] Globals: 5 objects totaling 1.05 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:40.974] Packages: [18:41:40.974] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:40.974] Resolved: TRUE [18:41:40.974] Value: 510 bytes of class 'list' [18:41:40.974] Early signaling: FALSE [18:41:40.974] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:40.974] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:40.975] Chunk #1 of 1 ... DONE [18:41:40.975] Launching 1 futures (chunks) ... DONE [18:41:40.976] Resolving 1 futures (chunks) ... [18:41:40.976] resolve() on list ... [18:41:40.976] recursive: 0 [18:41:40.976] length: 1 [18:41:40.976] [18:41:40.976] resolved() for 'SequentialFuture' ... [18:41:40.977] - state: 'finished' [18:41:40.977] - run: TRUE [18:41:40.977] - result: 'FutureResult' [18:41:40.977] resolved() for 'SequentialFuture' ... done [18:41:40.977] Future #1 [18:41:40.978] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:40.978] - nx: 1 [18:41:40.978] - relay: TRUE [18:41:40.978] - stdout: TRUE [18:41:40.978] - signal: TRUE [18:41:40.978] - resignal: FALSE [18:41:40.979] - force: TRUE [18:41:40.979] - relayed: [n=1] FALSE [18:41:40.979] - queued futures: [n=1] FALSE [18:41:40.979] - until=1 [18:41:40.979] - relaying element #1 [18:41:40.979] - relayed: [n=1] TRUE [18:41:40.980] - queued futures: [n=1] TRUE [18:41:40.980] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:40.980] length: 0 (resolved future 1) [18:41:40.980] Relaying remaining futures [18:41:40.980] signalConditionsASAP(NULL, pos=0) ... [18:41:40.980] - nx: 1 [18:41:40.981] - relay: TRUE [18:41:40.981] - stdout: TRUE [18:41:40.981] - signal: TRUE [18:41:40.981] - resignal: FALSE [18:41:40.981] - force: TRUE [18:41:40.981] - relayed: [n=1] TRUE [18:41:40.981] - queued futures: [n=1] TRUE - flush all [18:41:40.982] - relayed: [n=1] TRUE [18:41:40.982] - queued futures: [n=1] TRUE [18:41:40.982] signalConditionsASAP(NULL, pos=0) ... done [18:41:40.982] resolve() on list ... DONE [18:41:40.982] - Number of value chunks collected: 1 [18:41:40.983] Resolving 1 futures (chunks) ... DONE [18:41:40.983] Reducing values from 1 chunks ... [18:41:40.983] - Number of values collected after concatenation: 3 [18:41:40.983] - Number of values expected: 3 [18:41:40.983] Reducing values from 1 chunks ... DONE [18:41:40.983] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:40.989] future_lapply() ... [18:41:40.989] Number of chunks: 1 [18:41:40.989] getGlobalsAndPackagesXApply() ... [18:41:40.990] - future.globals: TRUE [18:41:40.990] getGlobalsAndPackages() ... [18:41:40.990] Searching for globals... [18:41:40.991] - globals found: [1] 'FUN' [18:41:40.991] Searching for globals ... DONE [18:41:40.992] Resolving globals: FALSE [18:41:40.992] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:40.992] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:40.993] - globals: [1] 'FUN' [18:41:40.993] [18:41:40.993] getGlobalsAndPackages() ... DONE [18:41:40.993] - globals found/used: [n=1] 'FUN' [18:41:40.993] - needed namespaces: [n=0] [18:41:40.993] Finding globals ... DONE [18:41:40.994] - use_args: TRUE [18:41:40.994] - Getting '...' globals ... [18:41:40.994] resolve() on list ... [18:41:40.994] recursive: 0 [18:41:40.995] length: 1 [18:41:40.995] elements: '...' [18:41:40.995] length: 0 (resolved future 1) [18:41:40.995] resolve() on list ... DONE [18:41:40.995] - '...' content: [n=0] [18:41:40.995] List of 1 [18:41:40.995] $ ...: list() [18:41:40.995] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.995] - attr(*, "where")=List of 1 [18:41:40.995] ..$ ...: [18:41:40.995] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.995] - attr(*, "resolved")= logi TRUE [18:41:40.995] - attr(*, "total_size")= num NA [18:41:40.998] - Getting '...' globals ... DONE [18:41:40.998] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:40.999] List of 2 [18:41:40.999] $ ...future.FUN:function (x) [18:41:40.999] $ ... : list() [18:41:40.999] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:40.999] - attr(*, "where")=List of 2 [18:41:40.999] ..$ ...future.FUN: [18:41:40.999] ..$ ... : [18:41:40.999] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:40.999] - attr(*, "resolved")= logi FALSE [18:41:40.999] - attr(*, "total_size")= int 4876 [18:41:41.002] Packages to be attached in all futures: [n=0] [18:41:41.002] getGlobalsAndPackagesXApply() ... DONE [18:41:41.002] Number of futures (= number of chunks): 1 [18:41:41.003] Launching 1 futures (chunks) ... [18:41:41.003] Chunk #1 of 1 ... [18:41:41.003] - Finding globals in 'X' for chunk #1 ... [18:41:41.003] getGlobalsAndPackages() ... [18:41:41.003] Searching for globals... [18:41:41.004] [18:41:41.004] Searching for globals ... DONE [18:41:41.004] - globals: [0] [18:41:41.004] getGlobalsAndPackages() ... DONE [18:41:41.004] + additional globals found: [n=0] [18:41:41.004] + additional namespaces needed: [n=0] [18:41:41.005] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.005] - seeds: [18:41:41.005] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.005] getGlobalsAndPackages() ... [18:41:41.005] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.005] Resolving globals: FALSE [18:41:41.006] Tweak future expression to call with '...' arguments ... [18:41:41.006] { [18:41:41.006] do.call(function(...) { [18:41:41.006] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.006] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.006] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.006] on.exit(options(oopts), add = TRUE) [18:41:41.006] } [18:41:41.006] { [18:41:41.006] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.006] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.006] ...future.FUN(...future.X_jj, ...) [18:41:41.006] }) [18:41:41.006] } [18:41:41.006] }, args = future.call.arguments) [18:41:41.006] } [18:41:41.006] Tweak future expression to call with '...' arguments ... DONE [18:41:41.007] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.007] [18:41:41.007] getGlobalsAndPackages() ... DONE [18:41:41.008] run() for 'Future' ... [18:41:41.008] - state: 'created' [18:41:41.008] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.008] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.009] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.009] - Field: 'label' [18:41:41.009] - Field: 'local' [18:41:41.009] - Field: 'owner' [18:41:41.009] - Field: 'envir' [18:41:41.009] - Field: 'packages' [18:41:41.010] - Field: 'gc' [18:41:41.010] - Field: 'conditions' [18:41:41.010] - Field: 'expr' [18:41:41.010] - Field: 'uuid' [18:41:41.010] - Field: 'seed' [18:41:41.010] - Field: 'version' [18:41:41.011] - Field: 'result' [18:41:41.011] - Field: 'asynchronous' [18:41:41.011] - Field: 'calls' [18:41:41.011] - Field: 'globals' [18:41:41.011] - Field: 'stdout' [18:41:41.011] - Field: 'earlySignal' [18:41:41.012] - Field: 'lazy' [18:41:41.013] - Field: 'state' [18:41:41.013] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.013] - Launch lazy future ... [18:41:41.014] Packages needed by the future expression (n = 0): [18:41:41.014] Packages needed by future strategies (n = 0): [18:41:41.014] { [18:41:41.014] { [18:41:41.014] { [18:41:41.014] ...future.startTime <- base::Sys.time() [18:41:41.014] { [18:41:41.014] { [18:41:41.014] { [18:41:41.014] base::local({ [18:41:41.014] has_future <- base::requireNamespace("future", [18:41:41.014] quietly = TRUE) [18:41:41.014] if (has_future) { [18:41:41.014] ns <- base::getNamespace("future") [18:41:41.014] version <- ns[[".package"]][["version"]] [18:41:41.014] if (is.null(version)) [18:41:41.014] version <- utils::packageVersion("future") [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] version <- NULL [18:41:41.014] } [18:41:41.014] if (!has_future || version < "1.8.0") { [18:41:41.014] info <- base::c(r_version = base::gsub("R version ", [18:41:41.014] "", base::R.version$version.string), [18:41:41.014] platform = base::sprintf("%s (%s-bit)", [18:41:41.014] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.014] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.014] "release", "version")], collapse = " "), [18:41:41.014] hostname = base::Sys.info()[["nodename"]]) [18:41:41.014] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.014] info) [18:41:41.014] info <- base::paste(info, collapse = "; ") [18:41:41.014] if (!has_future) { [18:41:41.014] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.014] info) [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.014] info, version) [18:41:41.014] } [18:41:41.014] base::stop(msg) [18:41:41.014] } [18:41:41.014] }) [18:41:41.014] } [18:41:41.014] ...future.strategy.old <- future::plan("list") [18:41:41.014] options(future.plan = NULL) [18:41:41.014] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.014] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.014] } [18:41:41.014] ...future.workdir <- getwd() [18:41:41.014] } [18:41:41.014] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.014] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.014] } [18:41:41.014] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.014] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.014] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.014] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.014] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.014] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.014] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.014] base::names(...future.oldOptions)) [18:41:41.014] } [18:41:41.014] if (FALSE) { [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] if (TRUE) { [18:41:41.014] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.014] open = "w") [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.014] windows = "NUL", "/dev/null"), open = "w") [18:41:41.014] } [18:41:41.014] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.014] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.014] base::sink(type = "output", split = FALSE) [18:41:41.014] base::close(...future.stdout) [18:41:41.014] }, add = TRUE) [18:41:41.014] } [18:41:41.014] ...future.frame <- base::sys.nframe() [18:41:41.014] ...future.conditions <- base::list() [18:41:41.014] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.014] if (FALSE) { [18:41:41.014] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.014] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.014] } [18:41:41.014] ...future.result <- base::tryCatch({ [18:41:41.014] base::withCallingHandlers({ [18:41:41.014] ...future.value <- base::withVisible(base::local({ [18:41:41.014] do.call(function(...) { [18:41:41.014] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.014] if (!identical(...future.globals.maxSize.org, [18:41:41.014] ...future.globals.maxSize)) { [18:41:41.014] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.014] on.exit(options(oopts), add = TRUE) [18:41:41.014] } [18:41:41.014] { [18:41:41.014] lapply(seq_along(...future.elements_ii), [18:41:41.014] FUN = function(jj) { [18:41:41.014] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.014] ...future.FUN(...future.X_jj, ...) [18:41:41.014] }) [18:41:41.014] } [18:41:41.014] }, args = future.call.arguments) [18:41:41.014] })) [18:41:41.014] future::FutureResult(value = ...future.value$value, [18:41:41.014] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.014] ...future.rng), globalenv = if (FALSE) [18:41:41.014] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.014] ...future.globalenv.names)) [18:41:41.014] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.014] }, condition = base::local({ [18:41:41.014] c <- base::c [18:41:41.014] inherits <- base::inherits [18:41:41.014] invokeRestart <- base::invokeRestart [18:41:41.014] length <- base::length [18:41:41.014] list <- base::list [18:41:41.014] seq.int <- base::seq.int [18:41:41.014] signalCondition <- base::signalCondition [18:41:41.014] sys.calls <- base::sys.calls [18:41:41.014] `[[` <- base::`[[` [18:41:41.014] `+` <- base::`+` [18:41:41.014] `<<-` <- base::`<<-` [18:41:41.014] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.014] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.014] 3L)] [18:41:41.014] } [18:41:41.014] function(cond) { [18:41:41.014] is_error <- inherits(cond, "error") [18:41:41.014] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.014] NULL) [18:41:41.014] if (is_error) { [18:41:41.014] sessionInformation <- function() { [18:41:41.014] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.014] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.014] search = base::search(), system = base::Sys.info()) [18:41:41.014] } [18:41:41.014] ...future.conditions[[length(...future.conditions) + [18:41:41.014] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.014] cond$call), session = sessionInformation(), [18:41:41.014] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.014] signalCondition(cond) [18:41:41.014] } [18:41:41.014] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.014] "immediateCondition"))) { [18:41:41.014] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.014] ...future.conditions[[length(...future.conditions) + [18:41:41.014] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.014] if (TRUE && !signal) { [18:41:41.014] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.014] { [18:41:41.014] inherits <- base::inherits [18:41:41.014] invokeRestart <- base::invokeRestart [18:41:41.014] is.null <- base::is.null [18:41:41.014] muffled <- FALSE [18:41:41.014] if (inherits(cond, "message")) { [18:41:41.014] muffled <- grepl(pattern, "muffleMessage") [18:41:41.014] if (muffled) [18:41:41.014] invokeRestart("muffleMessage") [18:41:41.014] } [18:41:41.014] else if (inherits(cond, "warning")) { [18:41:41.014] muffled <- grepl(pattern, "muffleWarning") [18:41:41.014] if (muffled) [18:41:41.014] invokeRestart("muffleWarning") [18:41:41.014] } [18:41:41.014] else if (inherits(cond, "condition")) { [18:41:41.014] if (!is.null(pattern)) { [18:41:41.014] computeRestarts <- base::computeRestarts [18:41:41.014] grepl <- base::grepl [18:41:41.014] restarts <- computeRestarts(cond) [18:41:41.014] for (restart in restarts) { [18:41:41.014] name <- restart$name [18:41:41.014] if (is.null(name)) [18:41:41.014] next [18:41:41.014] if (!grepl(pattern, name)) [18:41:41.014] next [18:41:41.014] invokeRestart(restart) [18:41:41.014] muffled <- TRUE [18:41:41.014] break [18:41:41.014] } [18:41:41.014] } [18:41:41.014] } [18:41:41.014] invisible(muffled) [18:41:41.014] } [18:41:41.014] muffleCondition(cond, pattern = "^muffle") [18:41:41.014] } [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] if (TRUE) { [18:41:41.014] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.014] { [18:41:41.014] inherits <- base::inherits [18:41:41.014] invokeRestart <- base::invokeRestart [18:41:41.014] is.null <- base::is.null [18:41:41.014] muffled <- FALSE [18:41:41.014] if (inherits(cond, "message")) { [18:41:41.014] muffled <- grepl(pattern, "muffleMessage") [18:41:41.014] if (muffled) [18:41:41.014] invokeRestart("muffleMessage") [18:41:41.014] } [18:41:41.014] else if (inherits(cond, "warning")) { [18:41:41.014] muffled <- grepl(pattern, "muffleWarning") [18:41:41.014] if (muffled) [18:41:41.014] invokeRestart("muffleWarning") [18:41:41.014] } [18:41:41.014] else if (inherits(cond, "condition")) { [18:41:41.014] if (!is.null(pattern)) { [18:41:41.014] computeRestarts <- base::computeRestarts [18:41:41.014] grepl <- base::grepl [18:41:41.014] restarts <- computeRestarts(cond) [18:41:41.014] for (restart in restarts) { [18:41:41.014] name <- restart$name [18:41:41.014] if (is.null(name)) [18:41:41.014] next [18:41:41.014] if (!grepl(pattern, name)) [18:41:41.014] next [18:41:41.014] invokeRestart(restart) [18:41:41.014] muffled <- TRUE [18:41:41.014] break [18:41:41.014] } [18:41:41.014] } [18:41:41.014] } [18:41:41.014] invisible(muffled) [18:41:41.014] } [18:41:41.014] muffleCondition(cond, pattern = "^muffle") [18:41:41.014] } [18:41:41.014] } [18:41:41.014] } [18:41:41.014] })) [18:41:41.014] }, error = function(ex) { [18:41:41.014] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.014] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.014] ...future.rng), started = ...future.startTime, [18:41:41.014] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.014] version = "1.8"), class = "FutureResult") [18:41:41.014] }, finally = { [18:41:41.014] if (!identical(...future.workdir, getwd())) [18:41:41.014] setwd(...future.workdir) [18:41:41.014] { [18:41:41.014] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.014] ...future.oldOptions$nwarnings <- NULL [18:41:41.014] } [18:41:41.014] base::options(...future.oldOptions) [18:41:41.014] if (.Platform$OS.type == "windows") { [18:41:41.014] old_names <- names(...future.oldEnvVars) [18:41:41.014] envs <- base::Sys.getenv() [18:41:41.014] names <- names(envs) [18:41:41.014] common <- intersect(names, old_names) [18:41:41.014] added <- setdiff(names, old_names) [18:41:41.014] removed <- setdiff(old_names, names) [18:41:41.014] changed <- common[...future.oldEnvVars[common] != [18:41:41.014] envs[common]] [18:41:41.014] NAMES <- toupper(changed) [18:41:41.014] args <- list() [18:41:41.014] for (kk in seq_along(NAMES)) { [18:41:41.014] name <- changed[[kk]] [18:41:41.014] NAME <- NAMES[[kk]] [18:41:41.014] if (name != NAME && is.element(NAME, old_names)) [18:41:41.014] next [18:41:41.014] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.014] } [18:41:41.014] NAMES <- toupper(added) [18:41:41.014] for (kk in seq_along(NAMES)) { [18:41:41.014] name <- added[[kk]] [18:41:41.014] NAME <- NAMES[[kk]] [18:41:41.014] if (name != NAME && is.element(NAME, old_names)) [18:41:41.014] next [18:41:41.014] args[[name]] <- "" [18:41:41.014] } [18:41:41.014] NAMES <- toupper(removed) [18:41:41.014] for (kk in seq_along(NAMES)) { [18:41:41.014] name <- removed[[kk]] [18:41:41.014] NAME <- NAMES[[kk]] [18:41:41.014] if (name != NAME && is.element(NAME, old_names)) [18:41:41.014] next [18:41:41.014] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.014] } [18:41:41.014] if (length(args) > 0) [18:41:41.014] base::do.call(base::Sys.setenv, args = args) [18:41:41.014] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.014] } [18:41:41.014] { [18:41:41.014] if (base::length(...future.futureOptionsAdded) > [18:41:41.014] 0L) { [18:41:41.014] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.014] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.014] base::options(opts) [18:41:41.014] } [18:41:41.014] { [18:41:41.014] { [18:41:41.014] NULL [18:41:41.014] RNGkind("Mersenne-Twister") [18:41:41.014] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.014] inherits = FALSE) [18:41:41.014] } [18:41:41.014] options(future.plan = NULL) [18:41:41.014] if (is.na(NA_character_)) [18:41:41.014] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.014] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.014] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.014] .init = FALSE) [18:41:41.014] } [18:41:41.014] } [18:41:41.014] } [18:41:41.014] }) [18:41:41.014] if (TRUE) { [18:41:41.014] base::sink(type = "output", split = FALSE) [18:41:41.014] if (TRUE) { [18:41:41.014] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.014] } [18:41:41.014] else { [18:41:41.014] ...future.result["stdout"] <- base::list(NULL) [18:41:41.014] } [18:41:41.014] base::close(...future.stdout) [18:41:41.014] ...future.stdout <- NULL [18:41:41.014] } [18:41:41.014] ...future.result$conditions <- ...future.conditions [18:41:41.014] ...future.result$finished <- base::Sys.time() [18:41:41.014] ...future.result [18:41:41.014] } [18:41:41.018] assign_globals() ... [18:41:41.018] List of 5 [18:41:41.018] $ ...future.FUN :function (x) [18:41:41.018] $ future.call.arguments : list() [18:41:41.018] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.018] $ ...future.elements_ii :List of 3 [18:41:41.018] ..$ a: num 1 [18:41:41.018] ..$ b: num 2 [18:41:41.018] ..$ c: num 3 [18:41:41.018] $ ...future.seeds_ii : NULL [18:41:41.018] $ ...future.globals.maxSize: NULL [18:41:41.018] - attr(*, "where")=List of 5 [18:41:41.018] ..$ ...future.FUN : [18:41:41.018] ..$ future.call.arguments : [18:41:41.018] ..$ ...future.elements_ii : [18:41:41.018] ..$ ...future.seeds_ii : [18:41:41.018] ..$ ...future.globals.maxSize: [18:41:41.018] - attr(*, "resolved")= logi FALSE [18:41:41.018] - attr(*, "total_size")= num 4876 [18:41:41.018] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.018] - attr(*, "already-done")= logi TRUE [18:41:41.025] - copied '...future.FUN' to environment [18:41:41.025] - copied 'future.call.arguments' to environment [18:41:41.025] - copied '...future.elements_ii' to environment [18:41:41.025] - copied '...future.seeds_ii' to environment [18:41:41.026] - copied '...future.globals.maxSize' to environment [18:41:41.026] assign_globals() ... done [18:41:41.026] plan(): Setting new future strategy stack: [18:41:41.026] List of future strategies: [18:41:41.026] 1. sequential: [18:41:41.026] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.026] - tweaked: FALSE [18:41:41.026] - call: NULL [18:41:41.027] plan(): nbrOfWorkers() = 1 [18:41:41.028] plan(): Setting new future strategy stack: [18:41:41.028] List of future strategies: [18:41:41.028] 1. sequential: [18:41:41.028] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.028] - tweaked: FALSE [18:41:41.028] - call: plan(strategy) [18:41:41.029] plan(): nbrOfWorkers() = 1 [18:41:41.029] SequentialFuture started (and completed) [18:41:41.029] - Launch lazy future ... done [18:41:41.030] run() for 'SequentialFuture' ... done [18:41:41.030] Created future: [18:41:41.030] SequentialFuture: [18:41:41.030] Label: 'future_sapply-1' [18:41:41.030] Expression: [18:41:41.030] { [18:41:41.030] do.call(function(...) { [18:41:41.030] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.030] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.030] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.030] on.exit(options(oopts), add = TRUE) [18:41:41.030] } [18:41:41.030] { [18:41:41.030] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.030] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.030] ...future.FUN(...future.X_jj, ...) [18:41:41.030] }) [18:41:41.030] } [18:41:41.030] }, args = future.call.arguments) [18:41:41.030] } [18:41:41.030] Lazy evaluation: FALSE [18:41:41.030] Asynchronous evaluation: FALSE [18:41:41.030] Local evaluation: TRUE [18:41:41.030] Environment: R_GlobalEnv [18:41:41.030] Capture standard output: TRUE [18:41:41.030] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.030] Globals: 5 objects totaling 475 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.030] Packages: [18:41:41.030] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.030] Resolved: TRUE [18:41:41.030] Value: 79 bytes of class 'list' [18:41:41.030] Early signaling: FALSE [18:41:41.030] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.030] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.031] Chunk #1 of 1 ... DONE [18:41:41.031] Launching 1 futures (chunks) ... DONE [18:41:41.031] Resolving 1 futures (chunks) ... [18:41:41.032] resolve() on list ... [18:41:41.032] recursive: 0 [18:41:41.032] length: 1 [18:41:41.032] [18:41:41.032] resolved() for 'SequentialFuture' ... [18:41:41.032] - state: 'finished' [18:41:41.033] - run: TRUE [18:41:41.033] - result: 'FutureResult' [18:41:41.033] resolved() for 'SequentialFuture' ... done [18:41:41.033] Future #1 [18:41:41.033] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.033] - nx: 1 [18:41:41.034] - relay: TRUE [18:41:41.034] - stdout: TRUE [18:41:41.034] - signal: TRUE [18:41:41.034] - resignal: FALSE [18:41:41.034] - force: TRUE [18:41:41.034] - relayed: [n=1] FALSE [18:41:41.035] - queued futures: [n=1] FALSE [18:41:41.035] - until=1 [18:41:41.035] - relaying element #1 [18:41:41.035] - relayed: [n=1] TRUE [18:41:41.035] - queued futures: [n=1] TRUE [18:41:41.035] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.036] length: 0 (resolved future 1) [18:41:41.036] Relaying remaining futures [18:41:41.036] signalConditionsASAP(NULL, pos=0) ... [18:41:41.036] - nx: 1 [18:41:41.036] - relay: TRUE [18:41:41.036] - stdout: TRUE [18:41:41.037] - signal: TRUE [18:41:41.037] - resignal: FALSE [18:41:41.037] - force: TRUE [18:41:41.037] - relayed: [n=1] TRUE [18:41:41.037] - queued futures: [n=1] TRUE - flush all [18:41:41.037] - relayed: [n=1] TRUE [18:41:41.038] - queued futures: [n=1] TRUE [18:41:41.038] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.038] resolve() on list ... DONE [18:41:41.038] - Number of value chunks collected: 1 [18:41:41.038] Resolving 1 futures (chunks) ... DONE [18:41:41.038] Reducing values from 1 chunks ... [18:41:41.039] - Number of values collected after concatenation: 3 [18:41:41.039] - Number of values expected: 3 [18:41:41.039] Reducing values from 1 chunks ... DONE [18:41:41.039] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y1:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y2:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 [18:41:41.047] future_lapply() ... [18:41:41.047] Number of chunks: 1 [18:41:41.048] getGlobalsAndPackagesXApply() ... [18:41:41.048] - future.globals: TRUE [18:41:41.048] getGlobalsAndPackages() ... [18:41:41.048] Searching for globals... [18:41:41.049] - globals found: [2] 'FUN', 'UseMethod' [18:41:41.050] Searching for globals ... DONE [18:41:41.050] Resolving globals: FALSE [18:41:41.050] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:41.051] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:41.051] - globals: [1] 'FUN' [18:41:41.051] [18:41:41.051] getGlobalsAndPackages() ... DONE [18:41:41.051] - globals found/used: [n=1] 'FUN' [18:41:41.051] - needed namespaces: [n=0] [18:41:41.052] Finding globals ... DONE [18:41:41.052] - use_args: TRUE [18:41:41.052] - Getting '...' globals ... [18:41:41.052] resolve() on list ... [18:41:41.053] recursive: 0 [18:41:41.053] length: 1 [18:41:41.053] elements: '...' [18:41:41.053] length: 0 (resolved future 1) [18:41:41.053] resolve() on list ... DONE [18:41:41.053] - '...' content: [n=0] [18:41:41.054] List of 1 [18:41:41.054] $ ...: list() [18:41:41.054] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.054] - attr(*, "where")=List of 1 [18:41:41.054] ..$ ...: [18:41:41.054] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.054] - attr(*, "resolved")= logi TRUE [18:41:41.054] - attr(*, "total_size")= num NA [18:41:41.056] - Getting '...' globals ... DONE [18:41:41.057] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.057] List of 2 [18:41:41.057] $ ...future.FUN:function (x, ...) [18:41:41.057] $ ... : list() [18:41:41.057] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.057] - attr(*, "where")=List of 2 [18:41:41.057] ..$ ...future.FUN: [18:41:41.057] ..$ ... : [18:41:41.057] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.057] - attr(*, "resolved")= logi FALSE [18:41:41.057] - attr(*, "total_size")= int 5116 [18:41:41.060] Packages to be attached in all futures: [n=0] [18:41:41.060] getGlobalsAndPackagesXApply() ... DONE [18:41:41.061] Number of futures (= number of chunks): 1 [18:41:41.061] Launching 1 futures (chunks) ... [18:41:41.061] Chunk #1 of 1 ... [18:41:41.061] - Finding globals in 'X' for chunk #1 ... [18:41:41.061] getGlobalsAndPackages() ... [18:41:41.061] Searching for globals... [18:41:41.062] [18:41:41.062] Searching for globals ... DONE [18:41:41.062] - globals: [0] [18:41:41.062] getGlobalsAndPackages() ... DONE [18:41:41.062] + additional globals found: [n=0] [18:41:41.064] + additional namespaces needed: [n=0] [18:41:41.064] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.064] - seeds: [18:41:41.064] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.064] getGlobalsAndPackages() ... [18:41:41.064] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.065] Resolving globals: FALSE [18:41:41.065] Tweak future expression to call with '...' arguments ... [18:41:41.065] { [18:41:41.065] do.call(function(...) { [18:41:41.065] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.065] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.065] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.065] on.exit(options(oopts), add = TRUE) [18:41:41.065] } [18:41:41.065] { [18:41:41.065] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.065] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.065] ...future.FUN(...future.X_jj, ...) [18:41:41.065] }) [18:41:41.065] } [18:41:41.065] }, args = future.call.arguments) [18:41:41.065] } [18:41:41.065] Tweak future expression to call with '...' arguments ... DONE [18:41:41.066] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.066] [18:41:41.066] getGlobalsAndPackages() ... DONE [18:41:41.067] run() for 'Future' ... [18:41:41.067] - state: 'created' [18:41:41.067] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.067] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.068] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.068] - Field: 'label' [18:41:41.068] - Field: 'local' [18:41:41.068] - Field: 'owner' [18:41:41.068] - Field: 'envir' [18:41:41.068] - Field: 'packages' [18:41:41.069] - Field: 'gc' [18:41:41.069] - Field: 'conditions' [18:41:41.069] - Field: 'expr' [18:41:41.069] - Field: 'uuid' [18:41:41.069] - Field: 'seed' [18:41:41.070] - Field: 'version' [18:41:41.070] - Field: 'result' [18:41:41.070] - Field: 'asynchronous' [18:41:41.070] - Field: 'calls' [18:41:41.070] - Field: 'globals' [18:41:41.070] - Field: 'stdout' [18:41:41.071] - Field: 'earlySignal' [18:41:41.071] - Field: 'lazy' [18:41:41.071] - Field: 'state' [18:41:41.071] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.071] - Launch lazy future ... [18:41:41.071] Packages needed by the future expression (n = 0): [18:41:41.072] Packages needed by future strategies (n = 0): [18:41:41.072] { [18:41:41.072] { [18:41:41.072] { [18:41:41.072] ...future.startTime <- base::Sys.time() [18:41:41.072] { [18:41:41.072] { [18:41:41.072] { [18:41:41.072] base::local({ [18:41:41.072] has_future <- base::requireNamespace("future", [18:41:41.072] quietly = TRUE) [18:41:41.072] if (has_future) { [18:41:41.072] ns <- base::getNamespace("future") [18:41:41.072] version <- ns[[".package"]][["version"]] [18:41:41.072] if (is.null(version)) [18:41:41.072] version <- utils::packageVersion("future") [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] version <- NULL [18:41:41.072] } [18:41:41.072] if (!has_future || version < "1.8.0") { [18:41:41.072] info <- base::c(r_version = base::gsub("R version ", [18:41:41.072] "", base::R.version$version.string), [18:41:41.072] platform = base::sprintf("%s (%s-bit)", [18:41:41.072] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.072] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.072] "release", "version")], collapse = " "), [18:41:41.072] hostname = base::Sys.info()[["nodename"]]) [18:41:41.072] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.072] info) [18:41:41.072] info <- base::paste(info, collapse = "; ") [18:41:41.072] if (!has_future) { [18:41:41.072] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.072] info) [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.072] info, version) [18:41:41.072] } [18:41:41.072] base::stop(msg) [18:41:41.072] } [18:41:41.072] }) [18:41:41.072] } [18:41:41.072] ...future.strategy.old <- future::plan("list") [18:41:41.072] options(future.plan = NULL) [18:41:41.072] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.072] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.072] } [18:41:41.072] ...future.workdir <- getwd() [18:41:41.072] } [18:41:41.072] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.072] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.072] } [18:41:41.072] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.072] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.072] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.072] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.072] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.072] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.072] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.072] base::names(...future.oldOptions)) [18:41:41.072] } [18:41:41.072] if (FALSE) { [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] if (TRUE) { [18:41:41.072] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.072] open = "w") [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.072] windows = "NUL", "/dev/null"), open = "w") [18:41:41.072] } [18:41:41.072] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.072] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.072] base::sink(type = "output", split = FALSE) [18:41:41.072] base::close(...future.stdout) [18:41:41.072] }, add = TRUE) [18:41:41.072] } [18:41:41.072] ...future.frame <- base::sys.nframe() [18:41:41.072] ...future.conditions <- base::list() [18:41:41.072] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.072] if (FALSE) { [18:41:41.072] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.072] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.072] } [18:41:41.072] ...future.result <- base::tryCatch({ [18:41:41.072] base::withCallingHandlers({ [18:41:41.072] ...future.value <- base::withVisible(base::local({ [18:41:41.072] do.call(function(...) { [18:41:41.072] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.072] if (!identical(...future.globals.maxSize.org, [18:41:41.072] ...future.globals.maxSize)) { [18:41:41.072] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.072] on.exit(options(oopts), add = TRUE) [18:41:41.072] } [18:41:41.072] { [18:41:41.072] lapply(seq_along(...future.elements_ii), [18:41:41.072] FUN = function(jj) { [18:41:41.072] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.072] ...future.FUN(...future.X_jj, ...) [18:41:41.072] }) [18:41:41.072] } [18:41:41.072] }, args = future.call.arguments) [18:41:41.072] })) [18:41:41.072] future::FutureResult(value = ...future.value$value, [18:41:41.072] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.072] ...future.rng), globalenv = if (FALSE) [18:41:41.072] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.072] ...future.globalenv.names)) [18:41:41.072] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.072] }, condition = base::local({ [18:41:41.072] c <- base::c [18:41:41.072] inherits <- base::inherits [18:41:41.072] invokeRestart <- base::invokeRestart [18:41:41.072] length <- base::length [18:41:41.072] list <- base::list [18:41:41.072] seq.int <- base::seq.int [18:41:41.072] signalCondition <- base::signalCondition [18:41:41.072] sys.calls <- base::sys.calls [18:41:41.072] `[[` <- base::`[[` [18:41:41.072] `+` <- base::`+` [18:41:41.072] `<<-` <- base::`<<-` [18:41:41.072] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.072] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.072] 3L)] [18:41:41.072] } [18:41:41.072] function(cond) { [18:41:41.072] is_error <- inherits(cond, "error") [18:41:41.072] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.072] NULL) [18:41:41.072] if (is_error) { [18:41:41.072] sessionInformation <- function() { [18:41:41.072] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.072] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.072] search = base::search(), system = base::Sys.info()) [18:41:41.072] } [18:41:41.072] ...future.conditions[[length(...future.conditions) + [18:41:41.072] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.072] cond$call), session = sessionInformation(), [18:41:41.072] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.072] signalCondition(cond) [18:41:41.072] } [18:41:41.072] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.072] "immediateCondition"))) { [18:41:41.072] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.072] ...future.conditions[[length(...future.conditions) + [18:41:41.072] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.072] if (TRUE && !signal) { [18:41:41.072] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.072] { [18:41:41.072] inherits <- base::inherits [18:41:41.072] invokeRestart <- base::invokeRestart [18:41:41.072] is.null <- base::is.null [18:41:41.072] muffled <- FALSE [18:41:41.072] if (inherits(cond, "message")) { [18:41:41.072] muffled <- grepl(pattern, "muffleMessage") [18:41:41.072] if (muffled) [18:41:41.072] invokeRestart("muffleMessage") [18:41:41.072] } [18:41:41.072] else if (inherits(cond, "warning")) { [18:41:41.072] muffled <- grepl(pattern, "muffleWarning") [18:41:41.072] if (muffled) [18:41:41.072] invokeRestart("muffleWarning") [18:41:41.072] } [18:41:41.072] else if (inherits(cond, "condition")) { [18:41:41.072] if (!is.null(pattern)) { [18:41:41.072] computeRestarts <- base::computeRestarts [18:41:41.072] grepl <- base::grepl [18:41:41.072] restarts <- computeRestarts(cond) [18:41:41.072] for (restart in restarts) { [18:41:41.072] name <- restart$name [18:41:41.072] if (is.null(name)) [18:41:41.072] next [18:41:41.072] if (!grepl(pattern, name)) [18:41:41.072] next [18:41:41.072] invokeRestart(restart) [18:41:41.072] muffled <- TRUE [18:41:41.072] break [18:41:41.072] } [18:41:41.072] } [18:41:41.072] } [18:41:41.072] invisible(muffled) [18:41:41.072] } [18:41:41.072] muffleCondition(cond, pattern = "^muffle") [18:41:41.072] } [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] if (TRUE) { [18:41:41.072] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.072] { [18:41:41.072] inherits <- base::inherits [18:41:41.072] invokeRestart <- base::invokeRestart [18:41:41.072] is.null <- base::is.null [18:41:41.072] muffled <- FALSE [18:41:41.072] if (inherits(cond, "message")) { [18:41:41.072] muffled <- grepl(pattern, "muffleMessage") [18:41:41.072] if (muffled) [18:41:41.072] invokeRestart("muffleMessage") [18:41:41.072] } [18:41:41.072] else if (inherits(cond, "warning")) { [18:41:41.072] muffled <- grepl(pattern, "muffleWarning") [18:41:41.072] if (muffled) [18:41:41.072] invokeRestart("muffleWarning") [18:41:41.072] } [18:41:41.072] else if (inherits(cond, "condition")) { [18:41:41.072] if (!is.null(pattern)) { [18:41:41.072] computeRestarts <- base::computeRestarts [18:41:41.072] grepl <- base::grepl [18:41:41.072] restarts <- computeRestarts(cond) [18:41:41.072] for (restart in restarts) { [18:41:41.072] name <- restart$name [18:41:41.072] if (is.null(name)) [18:41:41.072] next [18:41:41.072] if (!grepl(pattern, name)) [18:41:41.072] next [18:41:41.072] invokeRestart(restart) [18:41:41.072] muffled <- TRUE [18:41:41.072] break [18:41:41.072] } [18:41:41.072] } [18:41:41.072] } [18:41:41.072] invisible(muffled) [18:41:41.072] } [18:41:41.072] muffleCondition(cond, pattern = "^muffle") [18:41:41.072] } [18:41:41.072] } [18:41:41.072] } [18:41:41.072] })) [18:41:41.072] }, error = function(ex) { [18:41:41.072] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.072] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.072] ...future.rng), started = ...future.startTime, [18:41:41.072] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.072] version = "1.8"), class = "FutureResult") [18:41:41.072] }, finally = { [18:41:41.072] if (!identical(...future.workdir, getwd())) [18:41:41.072] setwd(...future.workdir) [18:41:41.072] { [18:41:41.072] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.072] ...future.oldOptions$nwarnings <- NULL [18:41:41.072] } [18:41:41.072] base::options(...future.oldOptions) [18:41:41.072] if (.Platform$OS.type == "windows") { [18:41:41.072] old_names <- names(...future.oldEnvVars) [18:41:41.072] envs <- base::Sys.getenv() [18:41:41.072] names <- names(envs) [18:41:41.072] common <- intersect(names, old_names) [18:41:41.072] added <- setdiff(names, old_names) [18:41:41.072] removed <- setdiff(old_names, names) [18:41:41.072] changed <- common[...future.oldEnvVars[common] != [18:41:41.072] envs[common]] [18:41:41.072] NAMES <- toupper(changed) [18:41:41.072] args <- list() [18:41:41.072] for (kk in seq_along(NAMES)) { [18:41:41.072] name <- changed[[kk]] [18:41:41.072] NAME <- NAMES[[kk]] [18:41:41.072] if (name != NAME && is.element(NAME, old_names)) [18:41:41.072] next [18:41:41.072] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.072] } [18:41:41.072] NAMES <- toupper(added) [18:41:41.072] for (kk in seq_along(NAMES)) { [18:41:41.072] name <- added[[kk]] [18:41:41.072] NAME <- NAMES[[kk]] [18:41:41.072] if (name != NAME && is.element(NAME, old_names)) [18:41:41.072] next [18:41:41.072] args[[name]] <- "" [18:41:41.072] } [18:41:41.072] NAMES <- toupper(removed) [18:41:41.072] for (kk in seq_along(NAMES)) { [18:41:41.072] name <- removed[[kk]] [18:41:41.072] NAME <- NAMES[[kk]] [18:41:41.072] if (name != NAME && is.element(NAME, old_names)) [18:41:41.072] next [18:41:41.072] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.072] } [18:41:41.072] if (length(args) > 0) [18:41:41.072] base::do.call(base::Sys.setenv, args = args) [18:41:41.072] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.072] } [18:41:41.072] { [18:41:41.072] if (base::length(...future.futureOptionsAdded) > [18:41:41.072] 0L) { [18:41:41.072] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.072] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.072] base::options(opts) [18:41:41.072] } [18:41:41.072] { [18:41:41.072] { [18:41:41.072] NULL [18:41:41.072] RNGkind("Mersenne-Twister") [18:41:41.072] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.072] inherits = FALSE) [18:41:41.072] } [18:41:41.072] options(future.plan = NULL) [18:41:41.072] if (is.na(NA_character_)) [18:41:41.072] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.072] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.072] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.072] .init = FALSE) [18:41:41.072] } [18:41:41.072] } [18:41:41.072] } [18:41:41.072] }) [18:41:41.072] if (TRUE) { [18:41:41.072] base::sink(type = "output", split = FALSE) [18:41:41.072] if (TRUE) { [18:41:41.072] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.072] } [18:41:41.072] else { [18:41:41.072] ...future.result["stdout"] <- base::list(NULL) [18:41:41.072] } [18:41:41.072] base::close(...future.stdout) [18:41:41.072] ...future.stdout <- NULL [18:41:41.072] } [18:41:41.072] ...future.result$conditions <- ...future.conditions [18:41:41.072] ...future.result$finished <- base::Sys.time() [18:41:41.072] ...future.result [18:41:41.072] } [18:41:41.076] assign_globals() ... [18:41:41.076] List of 5 [18:41:41.076] $ ...future.FUN :function (x, ...) [18:41:41.076] $ future.call.arguments : list() [18:41:41.076] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.076] $ ...future.elements_ii :List of 3 [18:41:41.076] ..$ a: num 1 [18:41:41.076] ..$ b: num 2 [18:41:41.076] ..$ c: num 3 [18:41:41.076] $ ...future.seeds_ii : NULL [18:41:41.076] $ ...future.globals.maxSize: NULL [18:41:41.076] - attr(*, "where")=List of 5 [18:41:41.076] ..$ ...future.FUN : [18:41:41.076] ..$ future.call.arguments : [18:41:41.076] ..$ ...future.elements_ii : [18:41:41.076] ..$ ...future.seeds_ii : [18:41:41.076] ..$ ...future.globals.maxSize: [18:41:41.076] - attr(*, "resolved")= logi FALSE [18:41:41.076] - attr(*, "total_size")= num 5116 [18:41:41.076] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.076] - attr(*, "already-done")= logi TRUE [18:41:41.083] - copied '...future.FUN' to environment [18:41:41.083] - copied 'future.call.arguments' to environment [18:41:41.083] - copied '...future.elements_ii' to environment [18:41:41.083] - copied '...future.seeds_ii' to environment [18:41:41.083] - copied '...future.globals.maxSize' to environment [18:41:41.083] assign_globals() ... done [18:41:41.084] plan(): Setting new future strategy stack: [18:41:41.084] List of future strategies: [18:41:41.084] 1. sequential: [18:41:41.084] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.084] - tweaked: FALSE [18:41:41.084] - call: NULL [18:41:41.085] plan(): nbrOfWorkers() = 1 [18:41:41.086] plan(): Setting new future strategy stack: [18:41:41.086] List of future strategies: [18:41:41.086] 1. sequential: [18:41:41.086] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.086] - tweaked: FALSE [18:41:41.086] - call: plan(strategy) [18:41:41.087] plan(): nbrOfWorkers() = 1 [18:41:41.087] SequentialFuture started (and completed) [18:41:41.087] - Launch lazy future ... done [18:41:41.087] run() for 'SequentialFuture' ... done [18:41:41.087] Created future: [18:41:41.088] SequentialFuture: [18:41:41.088] Label: 'future_sapply-1' [18:41:41.088] Expression: [18:41:41.088] { [18:41:41.088] do.call(function(...) { [18:41:41.088] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.088] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.088] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.088] on.exit(options(oopts), add = TRUE) [18:41:41.088] } [18:41:41.088] { [18:41:41.088] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.088] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.088] ...future.FUN(...future.X_jj, ...) [18:41:41.088] }) [18:41:41.088] } [18:41:41.088] }, args = future.call.arguments) [18:41:41.088] } [18:41:41.088] Lazy evaluation: FALSE [18:41:41.088] Asynchronous evaluation: FALSE [18:41:41.088] Local evaluation: TRUE [18:41:41.088] Environment: R_GlobalEnv [18:41:41.088] Capture standard output: TRUE [18:41:41.088] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.088] Globals: 5 objects totaling 568 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.088] Packages: [18:41:41.088] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.088] Resolved: TRUE [18:41:41.088] Value: 174 bytes of class 'list' [18:41:41.088] Early signaling: FALSE [18:41:41.088] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.088] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.089] Chunk #1 of 1 ... DONE [18:41:41.089] Launching 1 futures (chunks) ... DONE [18:41:41.089] Resolving 1 futures (chunks) ... [18:41:41.089] resolve() on list ... [18:41:41.089] recursive: 0 [18:41:41.089] length: 1 [18:41:41.090] [18:41:41.090] resolved() for 'SequentialFuture' ... [18:41:41.090] - state: 'finished' [18:41:41.090] - run: TRUE [18:41:41.090] - result: 'FutureResult' [18:41:41.091] resolved() for 'SequentialFuture' ... done [18:41:41.091] Future #1 [18:41:41.092] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.092] - nx: 1 [18:41:41.092] - relay: TRUE [18:41:41.093] - stdout: TRUE [18:41:41.093] - signal: TRUE [18:41:41.093] - resignal: FALSE [18:41:41.093] - force: TRUE [18:41:41.093] - relayed: [n=1] FALSE [18:41:41.093] - queued futures: [n=1] FALSE [18:41:41.094] - until=1 [18:41:41.094] - relaying element #1 [18:41:41.094] - relayed: [n=1] TRUE [18:41:41.094] - queued futures: [n=1] TRUE [18:41:41.094] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.095] length: 0 (resolved future 1) [18:41:41.095] Relaying remaining futures [18:41:41.095] signalConditionsASAP(NULL, pos=0) ... [18:41:41.095] - nx: 1 [18:41:41.095] - relay: TRUE [18:41:41.095] - stdout: TRUE [18:41:41.095] - signal: TRUE [18:41:41.096] - resignal: FALSE [18:41:41.096] - force: TRUE [18:41:41.096] - relayed: [n=1] TRUE [18:41:41.096] - queued futures: [n=1] TRUE - flush all [18:41:41.096] - relayed: [n=1] TRUE [18:41:41.096] - queued futures: [n=1] TRUE [18:41:41.097] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.097] resolve() on list ... DONE [18:41:41.097] - Number of value chunks collected: 1 [18:41:41.097] Resolving 1 futures (chunks) ... DONE [18:41:41.097] Reducing values from 1 chunks ... [18:41:41.098] - Number of values collected after concatenation: 3 [18:41:41.098] - Number of values expected: 3 [18:41:41.098] Reducing values from 1 chunks ... DONE [18:41:41.098] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y1:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y2:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 [18:41:41.105] future_lapply() ... [18:41:41.106] Number of chunks: 1 [18:41:41.106] getGlobalsAndPackagesXApply() ... [18:41:41.106] - future.globals: TRUE [18:41:41.107] getGlobalsAndPackages() ... [18:41:41.107] Searching for globals... [18:41:41.108] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:41.109] Searching for globals ... DONE [18:41:41.109] Resolving globals: FALSE [18:41:41.109] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:41.110] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:41.110] - globals: [1] 'FUN' [18:41:41.110] [18:41:41.110] getGlobalsAndPackages() ... DONE [18:41:41.110] - globals found/used: [n=1] 'FUN' [18:41:41.111] - needed namespaces: [n=0] [18:41:41.111] Finding globals ... DONE [18:41:41.111] - use_args: TRUE [18:41:41.111] - Getting '...' globals ... [18:41:41.112] resolve() on list ... [18:41:41.112] recursive: 0 [18:41:41.112] length: 1 [18:41:41.112] elements: '...' [18:41:41.112] length: 0 (resolved future 1) [18:41:41.112] resolve() on list ... DONE [18:41:41.113] - '...' content: [n=0] [18:41:41.113] List of 1 [18:41:41.113] $ ...: list() [18:41:41.113] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.113] - attr(*, "where")=List of 1 [18:41:41.113] ..$ ...: [18:41:41.113] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.113] - attr(*, "resolved")= logi TRUE [18:41:41.113] - attr(*, "total_size")= num NA [18:41:41.117] - Getting '...' globals ... DONE [18:41:41.117] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.117] List of 2 [18:41:41.117] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:41.117] $ ... : list() [18:41:41.117] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.117] - attr(*, "where")=List of 2 [18:41:41.117] ..$ ...future.FUN: [18:41:41.117] ..$ ... : [18:41:41.117] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.117] - attr(*, "resolved")= logi FALSE [18:41:41.117] - attr(*, "total_size")= int 6598 [18:41:41.121] Packages to be attached in all futures: [n=0] [18:41:41.121] getGlobalsAndPackagesXApply() ... DONE [18:41:41.121] Number of futures (= number of chunks): 1 [18:41:41.121] Launching 1 futures (chunks) ... [18:41:41.121] Chunk #1 of 1 ... [18:41:41.122] - Finding globals in 'X' for chunk #1 ... [18:41:41.122] getGlobalsAndPackages() ... [18:41:41.122] Searching for globals... [18:41:41.122] [18:41:41.122] Searching for globals ... DONE [18:41:41.123] - globals: [0] [18:41:41.123] getGlobalsAndPackages() ... DONE [18:41:41.123] + additional globals found: [n=0] [18:41:41.123] + additional namespaces needed: [n=0] [18:41:41.123] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.123] - seeds: [18:41:41.124] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.124] getGlobalsAndPackages() ... [18:41:41.124] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.124] Resolving globals: FALSE [18:41:41.124] Tweak future expression to call with '...' arguments ... [18:41:41.124] { [18:41:41.124] do.call(function(...) { [18:41:41.124] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.124] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.124] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.124] on.exit(options(oopts), add = TRUE) [18:41:41.124] } [18:41:41.124] { [18:41:41.124] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.124] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.124] ...future.FUN(...future.X_jj, ...) [18:41:41.124] }) [18:41:41.124] } [18:41:41.124] }, args = future.call.arguments) [18:41:41.124] } [18:41:41.125] Tweak future expression to call with '...' arguments ... DONE [18:41:41.125] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.126] [18:41:41.126] getGlobalsAndPackages() ... DONE [18:41:41.126] run() for 'Future' ... [18:41:41.126] - state: 'created' [18:41:41.126] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.127] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.127] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.127] - Field: 'label' [18:41:41.127] - Field: 'local' [18:41:41.128] - Field: 'owner' [18:41:41.128] - Field: 'envir' [18:41:41.128] - Field: 'packages' [18:41:41.128] - Field: 'gc' [18:41:41.128] - Field: 'conditions' [18:41:41.128] - Field: 'expr' [18:41:41.129] - Field: 'uuid' [18:41:41.129] - Field: 'seed' [18:41:41.129] - Field: 'version' [18:41:41.129] - Field: 'result' [18:41:41.129] - Field: 'asynchronous' [18:41:41.130] - Field: 'calls' [18:41:41.130] - Field: 'globals' [18:41:41.130] - Field: 'stdout' [18:41:41.130] - Field: 'earlySignal' [18:41:41.130] - Field: 'lazy' [18:41:41.130] - Field: 'state' [18:41:41.131] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.131] - Launch lazy future ... [18:41:41.131] Packages needed by the future expression (n = 0): [18:41:41.131] Packages needed by future strategies (n = 0): [18:41:41.132] { [18:41:41.132] { [18:41:41.132] { [18:41:41.132] ...future.startTime <- base::Sys.time() [18:41:41.132] { [18:41:41.132] { [18:41:41.132] { [18:41:41.132] base::local({ [18:41:41.132] has_future <- base::requireNamespace("future", [18:41:41.132] quietly = TRUE) [18:41:41.132] if (has_future) { [18:41:41.132] ns <- base::getNamespace("future") [18:41:41.132] version <- ns[[".package"]][["version"]] [18:41:41.132] if (is.null(version)) [18:41:41.132] version <- utils::packageVersion("future") [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] version <- NULL [18:41:41.132] } [18:41:41.132] if (!has_future || version < "1.8.0") { [18:41:41.132] info <- base::c(r_version = base::gsub("R version ", [18:41:41.132] "", base::R.version$version.string), [18:41:41.132] platform = base::sprintf("%s (%s-bit)", [18:41:41.132] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.132] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.132] "release", "version")], collapse = " "), [18:41:41.132] hostname = base::Sys.info()[["nodename"]]) [18:41:41.132] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.132] info) [18:41:41.132] info <- base::paste(info, collapse = "; ") [18:41:41.132] if (!has_future) { [18:41:41.132] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.132] info) [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.132] info, version) [18:41:41.132] } [18:41:41.132] base::stop(msg) [18:41:41.132] } [18:41:41.132] }) [18:41:41.132] } [18:41:41.132] ...future.strategy.old <- future::plan("list") [18:41:41.132] options(future.plan = NULL) [18:41:41.132] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.132] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.132] } [18:41:41.132] ...future.workdir <- getwd() [18:41:41.132] } [18:41:41.132] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.132] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.132] } [18:41:41.132] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.132] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.132] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.132] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.132] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.132] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.132] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.132] base::names(...future.oldOptions)) [18:41:41.132] } [18:41:41.132] if (FALSE) { [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] if (TRUE) { [18:41:41.132] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.132] open = "w") [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.132] windows = "NUL", "/dev/null"), open = "w") [18:41:41.132] } [18:41:41.132] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.132] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.132] base::sink(type = "output", split = FALSE) [18:41:41.132] base::close(...future.stdout) [18:41:41.132] }, add = TRUE) [18:41:41.132] } [18:41:41.132] ...future.frame <- base::sys.nframe() [18:41:41.132] ...future.conditions <- base::list() [18:41:41.132] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.132] if (FALSE) { [18:41:41.132] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.132] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.132] } [18:41:41.132] ...future.result <- base::tryCatch({ [18:41:41.132] base::withCallingHandlers({ [18:41:41.132] ...future.value <- base::withVisible(base::local({ [18:41:41.132] do.call(function(...) { [18:41:41.132] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.132] if (!identical(...future.globals.maxSize.org, [18:41:41.132] ...future.globals.maxSize)) { [18:41:41.132] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.132] on.exit(options(oopts), add = TRUE) [18:41:41.132] } [18:41:41.132] { [18:41:41.132] lapply(seq_along(...future.elements_ii), [18:41:41.132] FUN = function(jj) { [18:41:41.132] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.132] ...future.FUN(...future.X_jj, ...) [18:41:41.132] }) [18:41:41.132] } [18:41:41.132] }, args = future.call.arguments) [18:41:41.132] })) [18:41:41.132] future::FutureResult(value = ...future.value$value, [18:41:41.132] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.132] ...future.rng), globalenv = if (FALSE) [18:41:41.132] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.132] ...future.globalenv.names)) [18:41:41.132] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.132] }, condition = base::local({ [18:41:41.132] c <- base::c [18:41:41.132] inherits <- base::inherits [18:41:41.132] invokeRestart <- base::invokeRestart [18:41:41.132] length <- base::length [18:41:41.132] list <- base::list [18:41:41.132] seq.int <- base::seq.int [18:41:41.132] signalCondition <- base::signalCondition [18:41:41.132] sys.calls <- base::sys.calls [18:41:41.132] `[[` <- base::`[[` [18:41:41.132] `+` <- base::`+` [18:41:41.132] `<<-` <- base::`<<-` [18:41:41.132] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.132] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.132] 3L)] [18:41:41.132] } [18:41:41.132] function(cond) { [18:41:41.132] is_error <- inherits(cond, "error") [18:41:41.132] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.132] NULL) [18:41:41.132] if (is_error) { [18:41:41.132] sessionInformation <- function() { [18:41:41.132] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.132] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.132] search = base::search(), system = base::Sys.info()) [18:41:41.132] } [18:41:41.132] ...future.conditions[[length(...future.conditions) + [18:41:41.132] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.132] cond$call), session = sessionInformation(), [18:41:41.132] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.132] signalCondition(cond) [18:41:41.132] } [18:41:41.132] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.132] "immediateCondition"))) { [18:41:41.132] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.132] ...future.conditions[[length(...future.conditions) + [18:41:41.132] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.132] if (TRUE && !signal) { [18:41:41.132] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.132] { [18:41:41.132] inherits <- base::inherits [18:41:41.132] invokeRestart <- base::invokeRestart [18:41:41.132] is.null <- base::is.null [18:41:41.132] muffled <- FALSE [18:41:41.132] if (inherits(cond, "message")) { [18:41:41.132] muffled <- grepl(pattern, "muffleMessage") [18:41:41.132] if (muffled) [18:41:41.132] invokeRestart("muffleMessage") [18:41:41.132] } [18:41:41.132] else if (inherits(cond, "warning")) { [18:41:41.132] muffled <- grepl(pattern, "muffleWarning") [18:41:41.132] if (muffled) [18:41:41.132] invokeRestart("muffleWarning") [18:41:41.132] } [18:41:41.132] else if (inherits(cond, "condition")) { [18:41:41.132] if (!is.null(pattern)) { [18:41:41.132] computeRestarts <- base::computeRestarts [18:41:41.132] grepl <- base::grepl [18:41:41.132] restarts <- computeRestarts(cond) [18:41:41.132] for (restart in restarts) { [18:41:41.132] name <- restart$name [18:41:41.132] if (is.null(name)) [18:41:41.132] next [18:41:41.132] if (!grepl(pattern, name)) [18:41:41.132] next [18:41:41.132] invokeRestart(restart) [18:41:41.132] muffled <- TRUE [18:41:41.132] break [18:41:41.132] } [18:41:41.132] } [18:41:41.132] } [18:41:41.132] invisible(muffled) [18:41:41.132] } [18:41:41.132] muffleCondition(cond, pattern = "^muffle") [18:41:41.132] } [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] if (TRUE) { [18:41:41.132] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.132] { [18:41:41.132] inherits <- base::inherits [18:41:41.132] invokeRestart <- base::invokeRestart [18:41:41.132] is.null <- base::is.null [18:41:41.132] muffled <- FALSE [18:41:41.132] if (inherits(cond, "message")) { [18:41:41.132] muffled <- grepl(pattern, "muffleMessage") [18:41:41.132] if (muffled) [18:41:41.132] invokeRestart("muffleMessage") [18:41:41.132] } [18:41:41.132] else if (inherits(cond, "warning")) { [18:41:41.132] muffled <- grepl(pattern, "muffleWarning") [18:41:41.132] if (muffled) [18:41:41.132] invokeRestart("muffleWarning") [18:41:41.132] } [18:41:41.132] else if (inherits(cond, "condition")) { [18:41:41.132] if (!is.null(pattern)) { [18:41:41.132] computeRestarts <- base::computeRestarts [18:41:41.132] grepl <- base::grepl [18:41:41.132] restarts <- computeRestarts(cond) [18:41:41.132] for (restart in restarts) { [18:41:41.132] name <- restart$name [18:41:41.132] if (is.null(name)) [18:41:41.132] next [18:41:41.132] if (!grepl(pattern, name)) [18:41:41.132] next [18:41:41.132] invokeRestart(restart) [18:41:41.132] muffled <- TRUE [18:41:41.132] break [18:41:41.132] } [18:41:41.132] } [18:41:41.132] } [18:41:41.132] invisible(muffled) [18:41:41.132] } [18:41:41.132] muffleCondition(cond, pattern = "^muffle") [18:41:41.132] } [18:41:41.132] } [18:41:41.132] } [18:41:41.132] })) [18:41:41.132] }, error = function(ex) { [18:41:41.132] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.132] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.132] ...future.rng), started = ...future.startTime, [18:41:41.132] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.132] version = "1.8"), class = "FutureResult") [18:41:41.132] }, finally = { [18:41:41.132] if (!identical(...future.workdir, getwd())) [18:41:41.132] setwd(...future.workdir) [18:41:41.132] { [18:41:41.132] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.132] ...future.oldOptions$nwarnings <- NULL [18:41:41.132] } [18:41:41.132] base::options(...future.oldOptions) [18:41:41.132] if (.Platform$OS.type == "windows") { [18:41:41.132] old_names <- names(...future.oldEnvVars) [18:41:41.132] envs <- base::Sys.getenv() [18:41:41.132] names <- names(envs) [18:41:41.132] common <- intersect(names, old_names) [18:41:41.132] added <- setdiff(names, old_names) [18:41:41.132] removed <- setdiff(old_names, names) [18:41:41.132] changed <- common[...future.oldEnvVars[common] != [18:41:41.132] envs[common]] [18:41:41.132] NAMES <- toupper(changed) [18:41:41.132] args <- list() [18:41:41.132] for (kk in seq_along(NAMES)) { [18:41:41.132] name <- changed[[kk]] [18:41:41.132] NAME <- NAMES[[kk]] [18:41:41.132] if (name != NAME && is.element(NAME, old_names)) [18:41:41.132] next [18:41:41.132] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.132] } [18:41:41.132] NAMES <- toupper(added) [18:41:41.132] for (kk in seq_along(NAMES)) { [18:41:41.132] name <- added[[kk]] [18:41:41.132] NAME <- NAMES[[kk]] [18:41:41.132] if (name != NAME && is.element(NAME, old_names)) [18:41:41.132] next [18:41:41.132] args[[name]] <- "" [18:41:41.132] } [18:41:41.132] NAMES <- toupper(removed) [18:41:41.132] for (kk in seq_along(NAMES)) { [18:41:41.132] name <- removed[[kk]] [18:41:41.132] NAME <- NAMES[[kk]] [18:41:41.132] if (name != NAME && is.element(NAME, old_names)) [18:41:41.132] next [18:41:41.132] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.132] } [18:41:41.132] if (length(args) > 0) [18:41:41.132] base::do.call(base::Sys.setenv, args = args) [18:41:41.132] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.132] } [18:41:41.132] { [18:41:41.132] if (base::length(...future.futureOptionsAdded) > [18:41:41.132] 0L) { [18:41:41.132] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.132] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.132] base::options(opts) [18:41:41.132] } [18:41:41.132] { [18:41:41.132] { [18:41:41.132] NULL [18:41:41.132] RNGkind("Mersenne-Twister") [18:41:41.132] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.132] inherits = FALSE) [18:41:41.132] } [18:41:41.132] options(future.plan = NULL) [18:41:41.132] if (is.na(NA_character_)) [18:41:41.132] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.132] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.132] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.132] .init = FALSE) [18:41:41.132] } [18:41:41.132] } [18:41:41.132] } [18:41:41.132] }) [18:41:41.132] if (TRUE) { [18:41:41.132] base::sink(type = "output", split = FALSE) [18:41:41.132] if (TRUE) { [18:41:41.132] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.132] } [18:41:41.132] else { [18:41:41.132] ...future.result["stdout"] <- base::list(NULL) [18:41:41.132] } [18:41:41.132] base::close(...future.stdout) [18:41:41.132] ...future.stdout <- NULL [18:41:41.132] } [18:41:41.132] ...future.result$conditions <- ...future.conditions [18:41:41.132] ...future.result$finished <- base::Sys.time() [18:41:41.132] ...future.result [18:41:41.132] } [18:41:41.136] assign_globals() ... [18:41:41.136] List of 5 [18:41:41.136] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:41.136] $ future.call.arguments : list() [18:41:41.136] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.136] $ ...future.elements_ii :List of 3 [18:41:41.136] ..$ a: num 1 [18:41:41.136] ..$ b: num 2 [18:41:41.136] ..$ c: num 3 [18:41:41.136] $ ...future.seeds_ii : NULL [18:41:41.136] $ ...future.globals.maxSize: NULL [18:41:41.136] - attr(*, "where")=List of 5 [18:41:41.136] ..$ ...future.FUN : [18:41:41.136] ..$ future.call.arguments : [18:41:41.136] ..$ ...future.elements_ii : [18:41:41.136] ..$ ...future.seeds_ii : [18:41:41.136] ..$ ...future.globals.maxSize: [18:41:41.136] - attr(*, "resolved")= logi FALSE [18:41:41.136] - attr(*, "total_size")= num 6598 [18:41:41.136] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.136] - attr(*, "already-done")= logi TRUE [18:41:41.144] - reassign environment for '...future.FUN' [18:41:41.144] - copied '...future.FUN' to environment [18:41:41.144] - copied 'future.call.arguments' to environment [18:41:41.144] - copied '...future.elements_ii' to environment [18:41:41.144] - copied '...future.seeds_ii' to environment [18:41:41.145] - copied '...future.globals.maxSize' to environment [18:41:41.145] assign_globals() ... done [18:41:41.145] plan(): Setting new future strategy stack: [18:41:41.145] List of future strategies: [18:41:41.145] 1. sequential: [18:41:41.145] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.145] - tweaked: FALSE [18:41:41.145] - call: NULL [18:41:41.146] plan(): nbrOfWorkers() = 1 [18:41:41.147] plan(): Setting new future strategy stack: [18:41:41.148] List of future strategies: [18:41:41.148] 1. sequential: [18:41:41.148] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.148] - tweaked: FALSE [18:41:41.148] - call: plan(strategy) [18:41:41.148] plan(): nbrOfWorkers() = 1 [18:41:41.148] SequentialFuture started (and completed) [18:41:41.149] - Launch lazy future ... done [18:41:41.149] run() for 'SequentialFuture' ... done [18:41:41.149] Created future: [18:41:41.149] SequentialFuture: [18:41:41.149] Label: 'future_sapply-1' [18:41:41.149] Expression: [18:41:41.149] { [18:41:41.149] do.call(function(...) { [18:41:41.149] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.149] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.149] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.149] on.exit(options(oopts), add = TRUE) [18:41:41.149] } [18:41:41.149] { [18:41:41.149] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.149] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.149] ...future.FUN(...future.X_jj, ...) [18:41:41.149] }) [18:41:41.149] } [18:41:41.149] }, args = future.call.arguments) [18:41:41.149] } [18:41:41.149] Lazy evaluation: FALSE [18:41:41.149] Asynchronous evaluation: FALSE [18:41:41.149] Local evaluation: TRUE [18:41:41.149] Environment: R_GlobalEnv [18:41:41.149] Capture standard output: TRUE [18:41:41.149] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.149] Globals: 5 objects totaling 1.05 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.149] Packages: [18:41:41.149] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.149] Resolved: TRUE [18:41:41.149] Value: 510 bytes of class 'list' [18:41:41.149] Early signaling: FALSE [18:41:41.149] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.149] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.150] Chunk #1 of 1 ... DONE [18:41:41.150] Launching 1 futures (chunks) ... DONE [18:41:41.151] Resolving 1 futures (chunks) ... [18:41:41.151] resolve() on list ... [18:41:41.151] recursive: 0 [18:41:41.151] length: 1 [18:41:41.151] [18:41:41.151] resolved() for 'SequentialFuture' ... [18:41:41.152] - state: 'finished' [18:41:41.152] - run: TRUE [18:41:41.152] - result: 'FutureResult' [18:41:41.152] resolved() for 'SequentialFuture' ... done [18:41:41.152] Future #1 [18:41:41.153] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.153] - nx: 1 [18:41:41.153] - relay: TRUE [18:41:41.153] - stdout: TRUE [18:41:41.153] - signal: TRUE [18:41:41.153] - resignal: FALSE [18:41:41.153] - force: TRUE [18:41:41.154] - relayed: [n=1] FALSE [18:41:41.154] - queued futures: [n=1] FALSE [18:41:41.154] - until=1 [18:41:41.154] - relaying element #1 [18:41:41.154] - relayed: [n=1] TRUE [18:41:41.154] - queued futures: [n=1] TRUE [18:41:41.155] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.155] length: 0 (resolved future 1) [18:41:41.155] Relaying remaining futures [18:41:41.155] signalConditionsASAP(NULL, pos=0) ... [18:41:41.155] - nx: 1 [18:41:41.155] - relay: TRUE [18:41:41.156] - stdout: TRUE [18:41:41.156] - signal: TRUE [18:41:41.156] - resignal: FALSE [18:41:41.156] - force: TRUE [18:41:41.156] - relayed: [n=1] TRUE [18:41:41.157] - queued futures: [n=1] TRUE - flush all [18:41:41.157] - relayed: [n=1] TRUE [18:41:41.157] - queued futures: [n=1] TRUE [18:41:41.157] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.157] resolve() on list ... DONE [18:41:41.157] - Number of value chunks collected: 1 [18:41:41.158] Resolving 1 futures (chunks) ... DONE [18:41:41.158] Reducing values from 1 chunks ... [18:41:41.158] - Number of values collected after concatenation: 3 [18:41:41.158] - Number of values expected: 3 [18:41:41.158] Reducing values from 1 chunks ... DONE [18:41:41.158] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y1:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y2:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... [18:41:41.167] future_lapply() ... [18:41:41.168] Number of chunks: 1 [18:41:41.168] getGlobalsAndPackagesXApply() ... [18:41:41.168] - future.globals: TRUE [18:41:41.168] getGlobalsAndPackages() ... [18:41:41.168] Searching for globals... [18:41:41.170] - globals found: [1] 'FUN' [18:41:41.170] Searching for globals ... DONE [18:41:41.170] Resolving globals: FALSE [18:41:41.170] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:41.171] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:41.171] - globals: [1] 'FUN' [18:41:41.171] [18:41:41.171] getGlobalsAndPackages() ... DONE [18:41:41.171] - globals found/used: [n=1] 'FUN' [18:41:41.172] - needed namespaces: [n=0] [18:41:41.172] Finding globals ... DONE [18:41:41.172] - use_args: TRUE [18:41:41.172] - Getting '...' globals ... [18:41:41.172] resolve() on list ... [18:41:41.173] recursive: 0 [18:41:41.173] length: 1 [18:41:41.173] elements: '...' [18:41:41.173] length: 0 (resolved future 1) [18:41:41.173] resolve() on list ... DONE [18:41:41.173] - '...' content: [n=0] [18:41:41.174] List of 1 [18:41:41.174] $ ...: list() [18:41:41.174] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.174] - attr(*, "where")=List of 1 [18:41:41.174] ..$ ...: [18:41:41.174] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.174] - attr(*, "resolved")= logi TRUE [18:41:41.174] - attr(*, "total_size")= num NA [18:41:41.177] - Getting '...' globals ... DONE [18:41:41.177] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.177] List of 2 [18:41:41.177] $ ...future.FUN:function (x) [18:41:41.177] $ ... : list() [18:41:41.177] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.177] - attr(*, "where")=List of 2 [18:41:41.177] ..$ ...future.FUN: [18:41:41.177] ..$ ... : [18:41:41.177] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.177] - attr(*, "resolved")= logi FALSE [18:41:41.177] - attr(*, "total_size")= int 4876 [18:41:41.180] Packages to be attached in all futures: [n=0] [18:41:41.180] getGlobalsAndPackagesXApply() ... DONE [18:41:41.181] Number of futures (= number of chunks): 1 [18:41:41.181] Launching 1 futures (chunks) ... [18:41:41.181] Chunk #1 of 1 ... [18:41:41.181] - Finding globals in 'X' for chunk #1 ... [18:41:41.181] getGlobalsAndPackages() ... [18:41:41.182] Searching for globals... [18:41:41.182] [18:41:41.182] Searching for globals ... DONE [18:41:41.182] - globals: [0] [18:41:41.182] getGlobalsAndPackages() ... DONE [18:41:41.182] + additional globals found: [n=0] [18:41:41.183] + additional namespaces needed: [n=0] [18:41:41.183] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.183] - seeds: [18:41:41.183] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.183] getGlobalsAndPackages() ... [18:41:41.183] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.184] Resolving globals: FALSE [18:41:41.184] Tweak future expression to call with '...' arguments ... [18:41:41.184] { [18:41:41.184] do.call(function(...) { [18:41:41.184] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.184] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.184] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.184] on.exit(options(oopts), add = TRUE) [18:41:41.184] } [18:41:41.184] { [18:41:41.184] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.184] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.184] ...future.FUN(...future.X_jj, ...) [18:41:41.184] }) [18:41:41.184] } [18:41:41.184] }, args = future.call.arguments) [18:41:41.184] } [18:41:41.184] Tweak future expression to call with '...' arguments ... DONE [18:41:41.185] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.185] [18:41:41.185] getGlobalsAndPackages() ... DONE [18:41:41.186] run() for 'Future' ... [18:41:41.186] - state: 'created' [18:41:41.186] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.186] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.187] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.187] - Field: 'label' [18:41:41.187] - Field: 'local' [18:41:41.187] - Field: 'owner' [18:41:41.187] - Field: 'envir' [18:41:41.187] - Field: 'packages' [18:41:41.188] - Field: 'gc' [18:41:41.188] - Field: 'conditions' [18:41:41.188] - Field: 'expr' [18:41:41.188] - Field: 'uuid' [18:41:41.188] - Field: 'seed' [18:41:41.188] - Field: 'version' [18:41:41.189] - Field: 'result' [18:41:41.189] - Field: 'asynchronous' [18:41:41.189] - Field: 'calls' [18:41:41.190] - Field: 'globals' [18:41:41.190] - Field: 'stdout' [18:41:41.191] - Field: 'earlySignal' [18:41:41.191] - Field: 'lazy' [18:41:41.191] - Field: 'state' [18:41:41.191] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.191] - Launch lazy future ... [18:41:41.192] Packages needed by the future expression (n = 0): [18:41:41.192] Packages needed by future strategies (n = 0): [18:41:41.192] { [18:41:41.192] { [18:41:41.192] { [18:41:41.192] ...future.startTime <- base::Sys.time() [18:41:41.192] { [18:41:41.192] { [18:41:41.192] { [18:41:41.192] base::local({ [18:41:41.192] has_future <- base::requireNamespace("future", [18:41:41.192] quietly = TRUE) [18:41:41.192] if (has_future) { [18:41:41.192] ns <- base::getNamespace("future") [18:41:41.192] version <- ns[[".package"]][["version"]] [18:41:41.192] if (is.null(version)) [18:41:41.192] version <- utils::packageVersion("future") [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] version <- NULL [18:41:41.192] } [18:41:41.192] if (!has_future || version < "1.8.0") { [18:41:41.192] info <- base::c(r_version = base::gsub("R version ", [18:41:41.192] "", base::R.version$version.string), [18:41:41.192] platform = base::sprintf("%s (%s-bit)", [18:41:41.192] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.192] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.192] "release", "version")], collapse = " "), [18:41:41.192] hostname = base::Sys.info()[["nodename"]]) [18:41:41.192] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.192] info) [18:41:41.192] info <- base::paste(info, collapse = "; ") [18:41:41.192] if (!has_future) { [18:41:41.192] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.192] info) [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.192] info, version) [18:41:41.192] } [18:41:41.192] base::stop(msg) [18:41:41.192] } [18:41:41.192] }) [18:41:41.192] } [18:41:41.192] ...future.strategy.old <- future::plan("list") [18:41:41.192] options(future.plan = NULL) [18:41:41.192] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.192] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.192] } [18:41:41.192] ...future.workdir <- getwd() [18:41:41.192] } [18:41:41.192] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.192] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.192] } [18:41:41.192] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.192] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.192] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.192] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.192] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.192] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.192] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.192] base::names(...future.oldOptions)) [18:41:41.192] } [18:41:41.192] if (FALSE) { [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] if (TRUE) { [18:41:41.192] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.192] open = "w") [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.192] windows = "NUL", "/dev/null"), open = "w") [18:41:41.192] } [18:41:41.192] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.192] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.192] base::sink(type = "output", split = FALSE) [18:41:41.192] base::close(...future.stdout) [18:41:41.192] }, add = TRUE) [18:41:41.192] } [18:41:41.192] ...future.frame <- base::sys.nframe() [18:41:41.192] ...future.conditions <- base::list() [18:41:41.192] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.192] if (FALSE) { [18:41:41.192] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.192] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.192] } [18:41:41.192] ...future.result <- base::tryCatch({ [18:41:41.192] base::withCallingHandlers({ [18:41:41.192] ...future.value <- base::withVisible(base::local({ [18:41:41.192] do.call(function(...) { [18:41:41.192] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.192] if (!identical(...future.globals.maxSize.org, [18:41:41.192] ...future.globals.maxSize)) { [18:41:41.192] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.192] on.exit(options(oopts), add = TRUE) [18:41:41.192] } [18:41:41.192] { [18:41:41.192] lapply(seq_along(...future.elements_ii), [18:41:41.192] FUN = function(jj) { [18:41:41.192] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.192] ...future.FUN(...future.X_jj, ...) [18:41:41.192] }) [18:41:41.192] } [18:41:41.192] }, args = future.call.arguments) [18:41:41.192] })) [18:41:41.192] future::FutureResult(value = ...future.value$value, [18:41:41.192] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.192] ...future.rng), globalenv = if (FALSE) [18:41:41.192] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.192] ...future.globalenv.names)) [18:41:41.192] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.192] }, condition = base::local({ [18:41:41.192] c <- base::c [18:41:41.192] inherits <- base::inherits [18:41:41.192] invokeRestart <- base::invokeRestart [18:41:41.192] length <- base::length [18:41:41.192] list <- base::list [18:41:41.192] seq.int <- base::seq.int [18:41:41.192] signalCondition <- base::signalCondition [18:41:41.192] sys.calls <- base::sys.calls [18:41:41.192] `[[` <- base::`[[` [18:41:41.192] `+` <- base::`+` [18:41:41.192] `<<-` <- base::`<<-` [18:41:41.192] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.192] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.192] 3L)] [18:41:41.192] } [18:41:41.192] function(cond) { [18:41:41.192] is_error <- inherits(cond, "error") [18:41:41.192] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.192] NULL) [18:41:41.192] if (is_error) { [18:41:41.192] sessionInformation <- function() { [18:41:41.192] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.192] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.192] search = base::search(), system = base::Sys.info()) [18:41:41.192] } [18:41:41.192] ...future.conditions[[length(...future.conditions) + [18:41:41.192] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.192] cond$call), session = sessionInformation(), [18:41:41.192] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.192] signalCondition(cond) [18:41:41.192] } [18:41:41.192] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.192] "immediateCondition"))) { [18:41:41.192] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.192] ...future.conditions[[length(...future.conditions) + [18:41:41.192] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.192] if (TRUE && !signal) { [18:41:41.192] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.192] { [18:41:41.192] inherits <- base::inherits [18:41:41.192] invokeRestart <- base::invokeRestart [18:41:41.192] is.null <- base::is.null [18:41:41.192] muffled <- FALSE [18:41:41.192] if (inherits(cond, "message")) { [18:41:41.192] muffled <- grepl(pattern, "muffleMessage") [18:41:41.192] if (muffled) [18:41:41.192] invokeRestart("muffleMessage") [18:41:41.192] } [18:41:41.192] else if (inherits(cond, "warning")) { [18:41:41.192] muffled <- grepl(pattern, "muffleWarning") [18:41:41.192] if (muffled) [18:41:41.192] invokeRestart("muffleWarning") [18:41:41.192] } [18:41:41.192] else if (inherits(cond, "condition")) { [18:41:41.192] if (!is.null(pattern)) { [18:41:41.192] computeRestarts <- base::computeRestarts [18:41:41.192] grepl <- base::grepl [18:41:41.192] restarts <- computeRestarts(cond) [18:41:41.192] for (restart in restarts) { [18:41:41.192] name <- restart$name [18:41:41.192] if (is.null(name)) [18:41:41.192] next [18:41:41.192] if (!grepl(pattern, name)) [18:41:41.192] next [18:41:41.192] invokeRestart(restart) [18:41:41.192] muffled <- TRUE [18:41:41.192] break [18:41:41.192] } [18:41:41.192] } [18:41:41.192] } [18:41:41.192] invisible(muffled) [18:41:41.192] } [18:41:41.192] muffleCondition(cond, pattern = "^muffle") [18:41:41.192] } [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] if (TRUE) { [18:41:41.192] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.192] { [18:41:41.192] inherits <- base::inherits [18:41:41.192] invokeRestart <- base::invokeRestart [18:41:41.192] is.null <- base::is.null [18:41:41.192] muffled <- FALSE [18:41:41.192] if (inherits(cond, "message")) { [18:41:41.192] muffled <- grepl(pattern, "muffleMessage") [18:41:41.192] if (muffled) [18:41:41.192] invokeRestart("muffleMessage") [18:41:41.192] } [18:41:41.192] else if (inherits(cond, "warning")) { [18:41:41.192] muffled <- grepl(pattern, "muffleWarning") [18:41:41.192] if (muffled) [18:41:41.192] invokeRestart("muffleWarning") [18:41:41.192] } [18:41:41.192] else if (inherits(cond, "condition")) { [18:41:41.192] if (!is.null(pattern)) { [18:41:41.192] computeRestarts <- base::computeRestarts [18:41:41.192] grepl <- base::grepl [18:41:41.192] restarts <- computeRestarts(cond) [18:41:41.192] for (restart in restarts) { [18:41:41.192] name <- restart$name [18:41:41.192] if (is.null(name)) [18:41:41.192] next [18:41:41.192] if (!grepl(pattern, name)) [18:41:41.192] next [18:41:41.192] invokeRestart(restart) [18:41:41.192] muffled <- TRUE [18:41:41.192] break [18:41:41.192] } [18:41:41.192] } [18:41:41.192] } [18:41:41.192] invisible(muffled) [18:41:41.192] } [18:41:41.192] muffleCondition(cond, pattern = "^muffle") [18:41:41.192] } [18:41:41.192] } [18:41:41.192] } [18:41:41.192] })) [18:41:41.192] }, error = function(ex) { [18:41:41.192] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.192] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.192] ...future.rng), started = ...future.startTime, [18:41:41.192] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.192] version = "1.8"), class = "FutureResult") [18:41:41.192] }, finally = { [18:41:41.192] if (!identical(...future.workdir, getwd())) [18:41:41.192] setwd(...future.workdir) [18:41:41.192] { [18:41:41.192] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.192] ...future.oldOptions$nwarnings <- NULL [18:41:41.192] } [18:41:41.192] base::options(...future.oldOptions) [18:41:41.192] if (.Platform$OS.type == "windows") { [18:41:41.192] old_names <- names(...future.oldEnvVars) [18:41:41.192] envs <- base::Sys.getenv() [18:41:41.192] names <- names(envs) [18:41:41.192] common <- intersect(names, old_names) [18:41:41.192] added <- setdiff(names, old_names) [18:41:41.192] removed <- setdiff(old_names, names) [18:41:41.192] changed <- common[...future.oldEnvVars[common] != [18:41:41.192] envs[common]] [18:41:41.192] NAMES <- toupper(changed) [18:41:41.192] args <- list() [18:41:41.192] for (kk in seq_along(NAMES)) { [18:41:41.192] name <- changed[[kk]] [18:41:41.192] NAME <- NAMES[[kk]] [18:41:41.192] if (name != NAME && is.element(NAME, old_names)) [18:41:41.192] next [18:41:41.192] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.192] } [18:41:41.192] NAMES <- toupper(added) [18:41:41.192] for (kk in seq_along(NAMES)) { [18:41:41.192] name <- added[[kk]] [18:41:41.192] NAME <- NAMES[[kk]] [18:41:41.192] if (name != NAME && is.element(NAME, old_names)) [18:41:41.192] next [18:41:41.192] args[[name]] <- "" [18:41:41.192] } [18:41:41.192] NAMES <- toupper(removed) [18:41:41.192] for (kk in seq_along(NAMES)) { [18:41:41.192] name <- removed[[kk]] [18:41:41.192] NAME <- NAMES[[kk]] [18:41:41.192] if (name != NAME && is.element(NAME, old_names)) [18:41:41.192] next [18:41:41.192] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.192] } [18:41:41.192] if (length(args) > 0) [18:41:41.192] base::do.call(base::Sys.setenv, args = args) [18:41:41.192] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.192] } [18:41:41.192] { [18:41:41.192] if (base::length(...future.futureOptionsAdded) > [18:41:41.192] 0L) { [18:41:41.192] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.192] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.192] base::options(opts) [18:41:41.192] } [18:41:41.192] { [18:41:41.192] { [18:41:41.192] NULL [18:41:41.192] RNGkind("Mersenne-Twister") [18:41:41.192] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.192] inherits = FALSE) [18:41:41.192] } [18:41:41.192] options(future.plan = NULL) [18:41:41.192] if (is.na(NA_character_)) [18:41:41.192] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.192] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.192] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.192] .init = FALSE) [18:41:41.192] } [18:41:41.192] } [18:41:41.192] } [18:41:41.192] }) [18:41:41.192] if (TRUE) { [18:41:41.192] base::sink(type = "output", split = FALSE) [18:41:41.192] if (TRUE) { [18:41:41.192] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.192] } [18:41:41.192] else { [18:41:41.192] ...future.result["stdout"] <- base::list(NULL) [18:41:41.192] } [18:41:41.192] base::close(...future.stdout) [18:41:41.192] ...future.stdout <- NULL [18:41:41.192] } [18:41:41.192] ...future.result$conditions <- ...future.conditions [18:41:41.192] ...future.result$finished <- base::Sys.time() [18:41:41.192] ...future.result [18:41:41.192] } [18:41:41.196] assign_globals() ... [18:41:41.197] List of 5 [18:41:41.197] $ ...future.FUN :function (x) [18:41:41.197] $ future.call.arguments : list() [18:41:41.197] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.197] $ ...future.elements_ii :List of 3 [18:41:41.197] ..$ a: num 1 [18:41:41.197] ..$ b: num 2 [18:41:41.197] ..$ c: num 3 [18:41:41.197] $ ...future.seeds_ii : NULL [18:41:41.197] $ ...future.globals.maxSize: NULL [18:41:41.197] - attr(*, "where")=List of 5 [18:41:41.197] ..$ ...future.FUN : [18:41:41.197] ..$ future.call.arguments : [18:41:41.197] ..$ ...future.elements_ii : [18:41:41.197] ..$ ...future.seeds_ii : [18:41:41.197] ..$ ...future.globals.maxSize: [18:41:41.197] - attr(*, "resolved")= logi FALSE [18:41:41.197] - attr(*, "total_size")= num 4876 [18:41:41.197] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.197] - attr(*, "already-done")= logi TRUE [18:41:41.203] - copied '...future.FUN' to environment [18:41:41.203] - copied 'future.call.arguments' to environment [18:41:41.203] - copied '...future.elements_ii' to environment [18:41:41.203] - copied '...future.seeds_ii' to environment [18:41:41.204] - copied '...future.globals.maxSize' to environment [18:41:41.204] assign_globals() ... done [18:41:41.204] plan(): Setting new future strategy stack: [18:41:41.204] List of future strategies: [18:41:41.204] 1. sequential: [18:41:41.204] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.204] - tweaked: FALSE [18:41:41.204] - call: NULL [18:41:41.205] plan(): nbrOfWorkers() = 1 [18:41:41.206] plan(): Setting new future strategy stack: [18:41:41.206] List of future strategies: [18:41:41.206] 1. sequential: [18:41:41.206] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.206] - tweaked: FALSE [18:41:41.206] - call: plan(strategy) [18:41:41.207] plan(): nbrOfWorkers() = 1 [18:41:41.207] SequentialFuture started (and completed) [18:41:41.207] - Launch lazy future ... done [18:41:41.208] run() for 'SequentialFuture' ... done [18:41:41.208] Created future: [18:41:41.208] SequentialFuture: [18:41:41.208] Label: 'future_sapply-1' [18:41:41.208] Expression: [18:41:41.208] { [18:41:41.208] do.call(function(...) { [18:41:41.208] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.208] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.208] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.208] on.exit(options(oopts), add = TRUE) [18:41:41.208] } [18:41:41.208] { [18:41:41.208] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.208] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.208] ...future.FUN(...future.X_jj, ...) [18:41:41.208] }) [18:41:41.208] } [18:41:41.208] }, args = future.call.arguments) [18:41:41.208] } [18:41:41.208] Lazy evaluation: FALSE [18:41:41.208] Asynchronous evaluation: FALSE [18:41:41.208] Local evaluation: TRUE [18:41:41.208] Environment: R_GlobalEnv [18:41:41.208] Capture standard output: TRUE [18:41:41.208] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.208] Globals: 5 objects totaling 475 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.208] Packages: [18:41:41.208] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.208] Resolved: TRUE [18:41:41.208] Value: 79 bytes of class 'list' [18:41:41.208] Early signaling: FALSE [18:41:41.208] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.208] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.209] Chunk #1 of 1 ... DONE [18:41:41.209] Launching 1 futures (chunks) ... DONE [18:41:41.209] Resolving 1 futures (chunks) ... [18:41:41.210] resolve() on list ... [18:41:41.210] recursive: 0 [18:41:41.210] length: 1 [18:41:41.210] [18:41:41.210] resolved() for 'SequentialFuture' ... [18:41:41.210] - state: 'finished' [18:41:41.211] - run: TRUE [18:41:41.211] - result: 'FutureResult' [18:41:41.211] resolved() for 'SequentialFuture' ... done [18:41:41.211] Future #1 [18:41:41.211] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.212] - nx: 1 [18:41:41.212] - relay: TRUE [18:41:41.212] - stdout: TRUE [18:41:41.212] - signal: TRUE [18:41:41.212] - resignal: FALSE [18:41:41.212] - force: TRUE [18:41:41.212] - relayed: [n=1] FALSE [18:41:41.213] - queued futures: [n=1] FALSE [18:41:41.213] - until=1 [18:41:41.213] - relaying element #1 [18:41:41.213] - relayed: [n=1] TRUE [18:41:41.213] - queued futures: [n=1] TRUE [18:41:41.213] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.214] length: 0 (resolved future 1) [18:41:41.214] Relaying remaining futures [18:41:41.214] signalConditionsASAP(NULL, pos=0) ... [18:41:41.214] - nx: 1 [18:41:41.214] - relay: TRUE [18:41:41.214] - stdout: TRUE [18:41:41.215] - signal: TRUE [18:41:41.215] - resignal: FALSE [18:41:41.215] - force: TRUE [18:41:41.215] - relayed: [n=1] TRUE [18:41:41.215] - queued futures: [n=1] TRUE - flush all [18:41:41.215] - relayed: [n=1] TRUE [18:41:41.216] - queued futures: [n=1] TRUE [18:41:41.216] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.216] resolve() on list ... DONE [18:41:41.216] - Number of value chunks collected: 1 [18:41:41.216] Resolving 1 futures (chunks) ... DONE [18:41:41.216] Reducing values from 1 chunks ... [18:41:41.218] - Number of values collected after concatenation: 3 [18:41:41.218] - Number of values expected: 3 [18:41:41.218] Reducing values from 1 chunks ... DONE [18:41:41.218] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:41.220] future_lapply() ... [18:41:41.221] Number of chunks: 1 [18:41:41.221] getGlobalsAndPackagesXApply() ... [18:41:41.221] - future.globals: TRUE [18:41:41.222] getGlobalsAndPackages() ... [18:41:41.222] Searching for globals... [18:41:41.223] - globals found: [2] 'FUN', 'UseMethod' [18:41:41.223] Searching for globals ... DONE [18:41:41.223] Resolving globals: FALSE [18:41:41.224] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:41.224] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:41.225] - globals: [1] 'FUN' [18:41:41.225] [18:41:41.225] getGlobalsAndPackages() ... DONE [18:41:41.225] - globals found/used: [n=1] 'FUN' [18:41:41.225] - needed namespaces: [n=0] [18:41:41.225] Finding globals ... DONE [18:41:41.226] - use_args: TRUE [18:41:41.226] - Getting '...' globals ... [18:41:41.226] resolve() on list ... [18:41:41.226] recursive: 0 [18:41:41.226] length: 1 [18:41:41.227] elements: '...' [18:41:41.227] length: 0 (resolved future 1) [18:41:41.227] resolve() on list ... DONE [18:41:41.227] - '...' content: [n=0] [18:41:41.227] List of 1 [18:41:41.227] $ ...: list() [18:41:41.227] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.227] - attr(*, "where")=List of 1 [18:41:41.227] ..$ ...: [18:41:41.227] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.227] - attr(*, "resolved")= logi TRUE [18:41:41.227] - attr(*, "total_size")= num NA [18:41:41.230] - Getting '...' globals ... DONE [18:41:41.230] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.231] List of 2 [18:41:41.231] $ ...future.FUN:function (x, ...) [18:41:41.231] $ ... : list() [18:41:41.231] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.231] - attr(*, "where")=List of 2 [18:41:41.231] ..$ ...future.FUN: [18:41:41.231] ..$ ... : [18:41:41.231] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.231] - attr(*, "resolved")= logi FALSE [18:41:41.231] - attr(*, "total_size")= int 5116 [18:41:41.234] Packages to be attached in all futures: [n=0] [18:41:41.234] getGlobalsAndPackagesXApply() ... DONE [18:41:41.234] Number of futures (= number of chunks): 1 [18:41:41.234] Launching 1 futures (chunks) ... [18:41:41.235] Chunk #1 of 1 ... [18:41:41.235] - Finding globals in 'X' for chunk #1 ... [18:41:41.235] getGlobalsAndPackages() ... [18:41:41.235] Searching for globals... [18:41:41.235] [18:41:41.236] Searching for globals ... DONE [18:41:41.236] - globals: [0] [18:41:41.236] getGlobalsAndPackages() ... DONE [18:41:41.236] + additional globals found: [n=0] [18:41:41.236] + additional namespaces needed: [n=0] [18:41:41.236] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.236] - seeds: [18:41:41.237] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.237] getGlobalsAndPackages() ... [18:41:41.237] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.237] Resolving globals: FALSE [18:41:41.237] Tweak future expression to call with '...' arguments ... [18:41:41.238] { [18:41:41.238] do.call(function(...) { [18:41:41.238] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.238] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.238] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.238] on.exit(options(oopts), add = TRUE) [18:41:41.238] } [18:41:41.238] { [18:41:41.238] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.238] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.238] ...future.FUN(...future.X_jj, ...) [18:41:41.238] }) [18:41:41.238] } [18:41:41.238] }, args = future.call.arguments) [18:41:41.238] } [18:41:41.238] Tweak future expression to call with '...' arguments ... DONE [18:41:41.238] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.239] [18:41:41.239] getGlobalsAndPackages() ... DONE [18:41:41.239] run() for 'Future' ... [18:41:41.239] - state: 'created' [18:41:41.241] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.241] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.241] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.242] - Field: 'label' [18:41:41.242] - Field: 'local' [18:41:41.242] - Field: 'owner' [18:41:41.242] - Field: 'envir' [18:41:41.242] - Field: 'packages' [18:41:41.243] - Field: 'gc' [18:41:41.243] - Field: 'conditions' [18:41:41.243] - Field: 'expr' [18:41:41.243] - Field: 'uuid' [18:41:41.243] - Field: 'seed' [18:41:41.243] - Field: 'version' [18:41:41.244] - Field: 'result' [18:41:41.244] - Field: 'asynchronous' [18:41:41.244] - Field: 'calls' [18:41:41.244] - Field: 'globals' [18:41:41.244] - Field: 'stdout' [18:41:41.244] - Field: 'earlySignal' [18:41:41.245] - Field: 'lazy' [18:41:41.245] - Field: 'state' [18:41:41.245] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.245] - Launch lazy future ... [18:41:41.245] Packages needed by the future expression (n = 0): [18:41:41.246] Packages needed by future strategies (n = 0): [18:41:41.246] { [18:41:41.246] { [18:41:41.246] { [18:41:41.246] ...future.startTime <- base::Sys.time() [18:41:41.246] { [18:41:41.246] { [18:41:41.246] { [18:41:41.246] base::local({ [18:41:41.246] has_future <- base::requireNamespace("future", [18:41:41.246] quietly = TRUE) [18:41:41.246] if (has_future) { [18:41:41.246] ns <- base::getNamespace("future") [18:41:41.246] version <- ns[[".package"]][["version"]] [18:41:41.246] if (is.null(version)) [18:41:41.246] version <- utils::packageVersion("future") [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] version <- NULL [18:41:41.246] } [18:41:41.246] if (!has_future || version < "1.8.0") { [18:41:41.246] info <- base::c(r_version = base::gsub("R version ", [18:41:41.246] "", base::R.version$version.string), [18:41:41.246] platform = base::sprintf("%s (%s-bit)", [18:41:41.246] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.246] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.246] "release", "version")], collapse = " "), [18:41:41.246] hostname = base::Sys.info()[["nodename"]]) [18:41:41.246] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.246] info) [18:41:41.246] info <- base::paste(info, collapse = "; ") [18:41:41.246] if (!has_future) { [18:41:41.246] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.246] info) [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.246] info, version) [18:41:41.246] } [18:41:41.246] base::stop(msg) [18:41:41.246] } [18:41:41.246] }) [18:41:41.246] } [18:41:41.246] ...future.strategy.old <- future::plan("list") [18:41:41.246] options(future.plan = NULL) [18:41:41.246] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.246] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.246] } [18:41:41.246] ...future.workdir <- getwd() [18:41:41.246] } [18:41:41.246] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.246] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.246] } [18:41:41.246] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.246] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.246] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.246] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.246] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.246] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.246] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.246] base::names(...future.oldOptions)) [18:41:41.246] } [18:41:41.246] if (FALSE) { [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] if (TRUE) { [18:41:41.246] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.246] open = "w") [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.246] windows = "NUL", "/dev/null"), open = "w") [18:41:41.246] } [18:41:41.246] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.246] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.246] base::sink(type = "output", split = FALSE) [18:41:41.246] base::close(...future.stdout) [18:41:41.246] }, add = TRUE) [18:41:41.246] } [18:41:41.246] ...future.frame <- base::sys.nframe() [18:41:41.246] ...future.conditions <- base::list() [18:41:41.246] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.246] if (FALSE) { [18:41:41.246] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.246] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.246] } [18:41:41.246] ...future.result <- base::tryCatch({ [18:41:41.246] base::withCallingHandlers({ [18:41:41.246] ...future.value <- base::withVisible(base::local({ [18:41:41.246] do.call(function(...) { [18:41:41.246] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.246] if (!identical(...future.globals.maxSize.org, [18:41:41.246] ...future.globals.maxSize)) { [18:41:41.246] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.246] on.exit(options(oopts), add = TRUE) [18:41:41.246] } [18:41:41.246] { [18:41:41.246] lapply(seq_along(...future.elements_ii), [18:41:41.246] FUN = function(jj) { [18:41:41.246] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.246] ...future.FUN(...future.X_jj, ...) [18:41:41.246] }) [18:41:41.246] } [18:41:41.246] }, args = future.call.arguments) [18:41:41.246] })) [18:41:41.246] future::FutureResult(value = ...future.value$value, [18:41:41.246] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.246] ...future.rng), globalenv = if (FALSE) [18:41:41.246] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.246] ...future.globalenv.names)) [18:41:41.246] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.246] }, condition = base::local({ [18:41:41.246] c <- base::c [18:41:41.246] inherits <- base::inherits [18:41:41.246] invokeRestart <- base::invokeRestart [18:41:41.246] length <- base::length [18:41:41.246] list <- base::list [18:41:41.246] seq.int <- base::seq.int [18:41:41.246] signalCondition <- base::signalCondition [18:41:41.246] sys.calls <- base::sys.calls [18:41:41.246] `[[` <- base::`[[` [18:41:41.246] `+` <- base::`+` [18:41:41.246] `<<-` <- base::`<<-` [18:41:41.246] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.246] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.246] 3L)] [18:41:41.246] } [18:41:41.246] function(cond) { [18:41:41.246] is_error <- inherits(cond, "error") [18:41:41.246] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.246] NULL) [18:41:41.246] if (is_error) { [18:41:41.246] sessionInformation <- function() { [18:41:41.246] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.246] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.246] search = base::search(), system = base::Sys.info()) [18:41:41.246] } [18:41:41.246] ...future.conditions[[length(...future.conditions) + [18:41:41.246] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.246] cond$call), session = sessionInformation(), [18:41:41.246] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.246] signalCondition(cond) [18:41:41.246] } [18:41:41.246] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.246] "immediateCondition"))) { [18:41:41.246] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.246] ...future.conditions[[length(...future.conditions) + [18:41:41.246] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.246] if (TRUE && !signal) { [18:41:41.246] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.246] { [18:41:41.246] inherits <- base::inherits [18:41:41.246] invokeRestart <- base::invokeRestart [18:41:41.246] is.null <- base::is.null [18:41:41.246] muffled <- FALSE [18:41:41.246] if (inherits(cond, "message")) { [18:41:41.246] muffled <- grepl(pattern, "muffleMessage") [18:41:41.246] if (muffled) [18:41:41.246] invokeRestart("muffleMessage") [18:41:41.246] } [18:41:41.246] else if (inherits(cond, "warning")) { [18:41:41.246] muffled <- grepl(pattern, "muffleWarning") [18:41:41.246] if (muffled) [18:41:41.246] invokeRestart("muffleWarning") [18:41:41.246] } [18:41:41.246] else if (inherits(cond, "condition")) { [18:41:41.246] if (!is.null(pattern)) { [18:41:41.246] computeRestarts <- base::computeRestarts [18:41:41.246] grepl <- base::grepl [18:41:41.246] restarts <- computeRestarts(cond) [18:41:41.246] for (restart in restarts) { [18:41:41.246] name <- restart$name [18:41:41.246] if (is.null(name)) [18:41:41.246] next [18:41:41.246] if (!grepl(pattern, name)) [18:41:41.246] next [18:41:41.246] invokeRestart(restart) [18:41:41.246] muffled <- TRUE [18:41:41.246] break [18:41:41.246] } [18:41:41.246] } [18:41:41.246] } [18:41:41.246] invisible(muffled) [18:41:41.246] } [18:41:41.246] muffleCondition(cond, pattern = "^muffle") [18:41:41.246] } [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] if (TRUE) { [18:41:41.246] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.246] { [18:41:41.246] inherits <- base::inherits [18:41:41.246] invokeRestart <- base::invokeRestart [18:41:41.246] is.null <- base::is.null [18:41:41.246] muffled <- FALSE [18:41:41.246] if (inherits(cond, "message")) { [18:41:41.246] muffled <- grepl(pattern, "muffleMessage") [18:41:41.246] if (muffled) [18:41:41.246] invokeRestart("muffleMessage") [18:41:41.246] } [18:41:41.246] else if (inherits(cond, "warning")) { [18:41:41.246] muffled <- grepl(pattern, "muffleWarning") [18:41:41.246] if (muffled) [18:41:41.246] invokeRestart("muffleWarning") [18:41:41.246] } [18:41:41.246] else if (inherits(cond, "condition")) { [18:41:41.246] if (!is.null(pattern)) { [18:41:41.246] computeRestarts <- base::computeRestarts [18:41:41.246] grepl <- base::grepl [18:41:41.246] restarts <- computeRestarts(cond) [18:41:41.246] for (restart in restarts) { [18:41:41.246] name <- restart$name [18:41:41.246] if (is.null(name)) [18:41:41.246] next [18:41:41.246] if (!grepl(pattern, name)) [18:41:41.246] next [18:41:41.246] invokeRestart(restart) [18:41:41.246] muffled <- TRUE [18:41:41.246] break [18:41:41.246] } [18:41:41.246] } [18:41:41.246] } [18:41:41.246] invisible(muffled) [18:41:41.246] } [18:41:41.246] muffleCondition(cond, pattern = "^muffle") [18:41:41.246] } [18:41:41.246] } [18:41:41.246] } [18:41:41.246] })) [18:41:41.246] }, error = function(ex) { [18:41:41.246] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.246] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.246] ...future.rng), started = ...future.startTime, [18:41:41.246] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.246] version = "1.8"), class = "FutureResult") [18:41:41.246] }, finally = { [18:41:41.246] if (!identical(...future.workdir, getwd())) [18:41:41.246] setwd(...future.workdir) [18:41:41.246] { [18:41:41.246] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.246] ...future.oldOptions$nwarnings <- NULL [18:41:41.246] } [18:41:41.246] base::options(...future.oldOptions) [18:41:41.246] if (.Platform$OS.type == "windows") { [18:41:41.246] old_names <- names(...future.oldEnvVars) [18:41:41.246] envs <- base::Sys.getenv() [18:41:41.246] names <- names(envs) [18:41:41.246] common <- intersect(names, old_names) [18:41:41.246] added <- setdiff(names, old_names) [18:41:41.246] removed <- setdiff(old_names, names) [18:41:41.246] changed <- common[...future.oldEnvVars[common] != [18:41:41.246] envs[common]] [18:41:41.246] NAMES <- toupper(changed) [18:41:41.246] args <- list() [18:41:41.246] for (kk in seq_along(NAMES)) { [18:41:41.246] name <- changed[[kk]] [18:41:41.246] NAME <- NAMES[[kk]] [18:41:41.246] if (name != NAME && is.element(NAME, old_names)) [18:41:41.246] next [18:41:41.246] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.246] } [18:41:41.246] NAMES <- toupper(added) [18:41:41.246] for (kk in seq_along(NAMES)) { [18:41:41.246] name <- added[[kk]] [18:41:41.246] NAME <- NAMES[[kk]] [18:41:41.246] if (name != NAME && is.element(NAME, old_names)) [18:41:41.246] next [18:41:41.246] args[[name]] <- "" [18:41:41.246] } [18:41:41.246] NAMES <- toupper(removed) [18:41:41.246] for (kk in seq_along(NAMES)) { [18:41:41.246] name <- removed[[kk]] [18:41:41.246] NAME <- NAMES[[kk]] [18:41:41.246] if (name != NAME && is.element(NAME, old_names)) [18:41:41.246] next [18:41:41.246] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.246] } [18:41:41.246] if (length(args) > 0) [18:41:41.246] base::do.call(base::Sys.setenv, args = args) [18:41:41.246] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.246] } [18:41:41.246] { [18:41:41.246] if (base::length(...future.futureOptionsAdded) > [18:41:41.246] 0L) { [18:41:41.246] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.246] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.246] base::options(opts) [18:41:41.246] } [18:41:41.246] { [18:41:41.246] { [18:41:41.246] NULL [18:41:41.246] RNGkind("Mersenne-Twister") [18:41:41.246] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.246] inherits = FALSE) [18:41:41.246] } [18:41:41.246] options(future.plan = NULL) [18:41:41.246] if (is.na(NA_character_)) [18:41:41.246] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.246] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.246] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.246] .init = FALSE) [18:41:41.246] } [18:41:41.246] } [18:41:41.246] } [18:41:41.246] }) [18:41:41.246] if (TRUE) { [18:41:41.246] base::sink(type = "output", split = FALSE) [18:41:41.246] if (TRUE) { [18:41:41.246] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.246] } [18:41:41.246] else { [18:41:41.246] ...future.result["stdout"] <- base::list(NULL) [18:41:41.246] } [18:41:41.246] base::close(...future.stdout) [18:41:41.246] ...future.stdout <- NULL [18:41:41.246] } [18:41:41.246] ...future.result$conditions <- ...future.conditions [18:41:41.246] ...future.result$finished <- base::Sys.time() [18:41:41.246] ...future.result [18:41:41.246] } [18:41:41.250] assign_globals() ... [18:41:41.250] List of 5 [18:41:41.250] $ ...future.FUN :function (x, ...) [18:41:41.250] $ future.call.arguments : list() [18:41:41.250] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.250] $ ...future.elements_ii :List of 3 [18:41:41.250] ..$ a: num 1 [18:41:41.250] ..$ b: num 2 [18:41:41.250] ..$ c: num 3 [18:41:41.250] $ ...future.seeds_ii : NULL [18:41:41.250] $ ...future.globals.maxSize: NULL [18:41:41.250] - attr(*, "where")=List of 5 [18:41:41.250] ..$ ...future.FUN : [18:41:41.250] ..$ future.call.arguments : [18:41:41.250] ..$ ...future.elements_ii : [18:41:41.250] ..$ ...future.seeds_ii : [18:41:41.250] ..$ ...future.globals.maxSize: [18:41:41.250] - attr(*, "resolved")= logi FALSE [18:41:41.250] - attr(*, "total_size")= num 5116 [18:41:41.250] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.250] - attr(*, "already-done")= logi TRUE [18:41:41.257] - copied '...future.FUN' to environment [18:41:41.257] - copied 'future.call.arguments' to environment [18:41:41.257] - copied '...future.elements_ii' to environment [18:41:41.257] - copied '...future.seeds_ii' to environment [18:41:41.258] - copied '...future.globals.maxSize' to environment [18:41:41.258] assign_globals() ... done [18:41:41.258] plan(): Setting new future strategy stack: [18:41:41.258] List of future strategies: [18:41:41.258] 1. sequential: [18:41:41.258] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.258] - tweaked: FALSE [18:41:41.258] - call: NULL [18:41:41.259] plan(): nbrOfWorkers() = 1 [18:41:41.260] plan(): Setting new future strategy stack: [18:41:41.260] List of future strategies: [18:41:41.260] 1. sequential: [18:41:41.260] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.260] - tweaked: FALSE [18:41:41.260] - call: plan(strategy) [18:41:41.261] plan(): nbrOfWorkers() = 1 [18:41:41.261] SequentialFuture started (and completed) [18:41:41.262] - Launch lazy future ... done [18:41:41.262] run() for 'SequentialFuture' ... done [18:41:41.262] Created future: [18:41:41.262] SequentialFuture: [18:41:41.262] Label: 'future_sapply-1' [18:41:41.262] Expression: [18:41:41.262] { [18:41:41.262] do.call(function(...) { [18:41:41.262] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.262] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.262] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.262] on.exit(options(oopts), add = TRUE) [18:41:41.262] } [18:41:41.262] { [18:41:41.262] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.262] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.262] ...future.FUN(...future.X_jj, ...) [18:41:41.262] }) [18:41:41.262] } [18:41:41.262] }, args = future.call.arguments) [18:41:41.262] } [18:41:41.262] Lazy evaluation: FALSE [18:41:41.262] Asynchronous evaluation: FALSE [18:41:41.262] Local evaluation: TRUE [18:41:41.262] Environment: R_GlobalEnv [18:41:41.262] Capture standard output: TRUE [18:41:41.262] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.262] Globals: 5 objects totaling 568 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.262] Packages: [18:41:41.262] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.262] Resolved: TRUE [18:41:41.262] Value: 174 bytes of class 'list' [18:41:41.262] Early signaling: FALSE [18:41:41.262] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.262] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.263] Chunk #1 of 1 ... DONE [18:41:41.263] Launching 1 futures (chunks) ... DONE [18:41:41.264] Resolving 1 futures (chunks) ... [18:41:41.264] resolve() on list ... [18:41:41.264] recursive: 0 [18:41:41.264] length: 1 [18:41:41.264] [18:41:41.264] resolved() for 'SequentialFuture' ... [18:41:41.265] - state: 'finished' [18:41:41.265] - run: TRUE [18:41:41.265] - result: 'FutureResult' [18:41:41.265] resolved() for 'SequentialFuture' ... done [18:41:41.265] Future #1 [18:41:41.266] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.266] - nx: 1 [18:41:41.266] - relay: TRUE [18:41:41.266] - stdout: TRUE [18:41:41.266] - signal: TRUE [18:41:41.266] - resignal: FALSE [18:41:41.266] - force: TRUE [18:41:41.267] - relayed: [n=1] FALSE [18:41:41.267] - queued futures: [n=1] FALSE [18:41:41.267] - until=1 [18:41:41.267] - relaying element #1 [18:41:41.269] - relayed: [n=1] TRUE [18:41:41.269] - queued futures: [n=1] TRUE [18:41:41.269] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.269] length: 0 (resolved future 1) [18:41:41.269] Relaying remaining futures [18:41:41.270] signalConditionsASAP(NULL, pos=0) ... [18:41:41.270] - nx: 1 [18:41:41.270] - relay: TRUE [18:41:41.270] - stdout: TRUE [18:41:41.270] - signal: TRUE [18:41:41.270] - resignal: FALSE [18:41:41.271] - force: TRUE [18:41:41.271] - relayed: [n=1] TRUE [18:41:41.271] - queued futures: [n=1] TRUE - flush all [18:41:41.271] - relayed: [n=1] TRUE [18:41:41.271] - queued futures: [n=1] TRUE [18:41:41.271] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.272] resolve() on list ... DONE [18:41:41.272] - Number of value chunks collected: 1 [18:41:41.272] Resolving 1 futures (chunks) ... DONE [18:41:41.272] Reducing values from 1 chunks ... [18:41:41.272] - Number of values collected after concatenation: 3 [18:41:41.273] - Number of values expected: 3 [18:41:41.273] Reducing values from 1 chunks ... DONE [18:41:41.273] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:41.275] future_lapply() ... [18:41:41.276] Number of chunks: 1 [18:41:41.276] getGlobalsAndPackagesXApply() ... [18:41:41.276] - future.globals: TRUE [18:41:41.276] getGlobalsAndPackages() ... [18:41:41.277] Searching for globals... [18:41:41.278] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:41.279] Searching for globals ... DONE [18:41:41.279] Resolving globals: FALSE [18:41:41.279] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:41.280] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:41.280] - globals: [1] 'FUN' [18:41:41.280] [18:41:41.280] getGlobalsAndPackages() ... DONE [18:41:41.280] - globals found/used: [n=1] 'FUN' [18:41:41.281] - needed namespaces: [n=0] [18:41:41.281] Finding globals ... DONE [18:41:41.281] - use_args: TRUE [18:41:41.281] - Getting '...' globals ... [18:41:41.282] resolve() on list ... [18:41:41.282] recursive: 0 [18:41:41.282] length: 1 [18:41:41.282] elements: '...' [18:41:41.282] length: 0 (resolved future 1) [18:41:41.282] resolve() on list ... DONE [18:41:41.283] - '...' content: [n=0] [18:41:41.283] List of 1 [18:41:41.283] $ ...: list() [18:41:41.283] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.283] - attr(*, "where")=List of 1 [18:41:41.283] ..$ ...: [18:41:41.283] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.283] - attr(*, "resolved")= logi TRUE [18:41:41.283] - attr(*, "total_size")= num NA [18:41:41.286] - Getting '...' globals ... DONE [18:41:41.286] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.286] List of 2 [18:41:41.286] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:41.286] $ ... : list() [18:41:41.286] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.286] - attr(*, "where")=List of 2 [18:41:41.286] ..$ ...future.FUN: [18:41:41.286] ..$ ... : [18:41:41.286] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.286] - attr(*, "resolved")= logi FALSE [18:41:41.286] - attr(*, "total_size")= int 6598 [18:41:41.289] Packages to be attached in all futures: [n=0] [18:41:41.289] getGlobalsAndPackagesXApply() ... DONE [18:41:41.292] Number of futures (= number of chunks): 1 [18:41:41.292] Launching 1 futures (chunks) ... [18:41:41.292] Chunk #1 of 1 ... [18:41:41.292] - Finding globals in 'X' for chunk #1 ... [18:41:41.292] getGlobalsAndPackages() ... [18:41:41.293] Searching for globals... [18:41:41.293] [18:41:41.293] Searching for globals ... DONE [18:41:41.293] - globals: [0] [18:41:41.293] getGlobalsAndPackages() ... DONE [18:41:41.294] + additional globals found: [n=0] [18:41:41.294] + additional namespaces needed: [n=0] [18:41:41.294] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.294] - seeds: [18:41:41.294] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.294] getGlobalsAndPackages() ... [18:41:41.295] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.295] Resolving globals: FALSE [18:41:41.295] Tweak future expression to call with '...' arguments ... [18:41:41.295] { [18:41:41.295] do.call(function(...) { [18:41:41.295] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.295] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.295] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.295] on.exit(options(oopts), add = TRUE) [18:41:41.295] } [18:41:41.295] { [18:41:41.295] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.295] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.295] ...future.FUN(...future.X_jj, ...) [18:41:41.295] }) [18:41:41.295] } [18:41:41.295] }, args = future.call.arguments) [18:41:41.295] } [18:41:41.296] Tweak future expression to call with '...' arguments ... DONE [18:41:41.296] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.296] [18:41:41.296] getGlobalsAndPackages() ... DONE [18:41:41.297] run() for 'Future' ... [18:41:41.297] - state: 'created' [18:41:41.297] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.298] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.298] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.298] - Field: 'label' [18:41:41.298] - Field: 'local' [18:41:41.298] - Field: 'owner' [18:41:41.299] - Field: 'envir' [18:41:41.299] - Field: 'packages' [18:41:41.299] - Field: 'gc' [18:41:41.299] - Field: 'conditions' [18:41:41.299] - Field: 'expr' [18:41:41.299] - Field: 'uuid' [18:41:41.300] - Field: 'seed' [18:41:41.300] - Field: 'version' [18:41:41.300] - Field: 'result' [18:41:41.300] - Field: 'asynchronous' [18:41:41.300] - Field: 'calls' [18:41:41.300] - Field: 'globals' [18:41:41.301] - Field: 'stdout' [18:41:41.301] - Field: 'earlySignal' [18:41:41.301] - Field: 'lazy' [18:41:41.301] - Field: 'state' [18:41:41.301] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.302] - Launch lazy future ... [18:41:41.302] Packages needed by the future expression (n = 0): [18:41:41.302] Packages needed by future strategies (n = 0): [18:41:41.303] { [18:41:41.303] { [18:41:41.303] { [18:41:41.303] ...future.startTime <- base::Sys.time() [18:41:41.303] { [18:41:41.303] { [18:41:41.303] { [18:41:41.303] base::local({ [18:41:41.303] has_future <- base::requireNamespace("future", [18:41:41.303] quietly = TRUE) [18:41:41.303] if (has_future) { [18:41:41.303] ns <- base::getNamespace("future") [18:41:41.303] version <- ns[[".package"]][["version"]] [18:41:41.303] if (is.null(version)) [18:41:41.303] version <- utils::packageVersion("future") [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] version <- NULL [18:41:41.303] } [18:41:41.303] if (!has_future || version < "1.8.0") { [18:41:41.303] info <- base::c(r_version = base::gsub("R version ", [18:41:41.303] "", base::R.version$version.string), [18:41:41.303] platform = base::sprintf("%s (%s-bit)", [18:41:41.303] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.303] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.303] "release", "version")], collapse = " "), [18:41:41.303] hostname = base::Sys.info()[["nodename"]]) [18:41:41.303] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.303] info) [18:41:41.303] info <- base::paste(info, collapse = "; ") [18:41:41.303] if (!has_future) { [18:41:41.303] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.303] info) [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.303] info, version) [18:41:41.303] } [18:41:41.303] base::stop(msg) [18:41:41.303] } [18:41:41.303] }) [18:41:41.303] } [18:41:41.303] ...future.strategy.old <- future::plan("list") [18:41:41.303] options(future.plan = NULL) [18:41:41.303] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.303] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.303] } [18:41:41.303] ...future.workdir <- getwd() [18:41:41.303] } [18:41:41.303] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.303] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.303] } [18:41:41.303] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.303] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.303] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.303] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.303] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.303] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.303] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.303] base::names(...future.oldOptions)) [18:41:41.303] } [18:41:41.303] if (FALSE) { [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] if (TRUE) { [18:41:41.303] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.303] open = "w") [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.303] windows = "NUL", "/dev/null"), open = "w") [18:41:41.303] } [18:41:41.303] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.303] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.303] base::sink(type = "output", split = FALSE) [18:41:41.303] base::close(...future.stdout) [18:41:41.303] }, add = TRUE) [18:41:41.303] } [18:41:41.303] ...future.frame <- base::sys.nframe() [18:41:41.303] ...future.conditions <- base::list() [18:41:41.303] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.303] if (FALSE) { [18:41:41.303] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.303] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.303] } [18:41:41.303] ...future.result <- base::tryCatch({ [18:41:41.303] base::withCallingHandlers({ [18:41:41.303] ...future.value <- base::withVisible(base::local({ [18:41:41.303] do.call(function(...) { [18:41:41.303] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.303] if (!identical(...future.globals.maxSize.org, [18:41:41.303] ...future.globals.maxSize)) { [18:41:41.303] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.303] on.exit(options(oopts), add = TRUE) [18:41:41.303] } [18:41:41.303] { [18:41:41.303] lapply(seq_along(...future.elements_ii), [18:41:41.303] FUN = function(jj) { [18:41:41.303] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.303] ...future.FUN(...future.X_jj, ...) [18:41:41.303] }) [18:41:41.303] } [18:41:41.303] }, args = future.call.arguments) [18:41:41.303] })) [18:41:41.303] future::FutureResult(value = ...future.value$value, [18:41:41.303] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.303] ...future.rng), globalenv = if (FALSE) [18:41:41.303] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.303] ...future.globalenv.names)) [18:41:41.303] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.303] }, condition = base::local({ [18:41:41.303] c <- base::c [18:41:41.303] inherits <- base::inherits [18:41:41.303] invokeRestart <- base::invokeRestart [18:41:41.303] length <- base::length [18:41:41.303] list <- base::list [18:41:41.303] seq.int <- base::seq.int [18:41:41.303] signalCondition <- base::signalCondition [18:41:41.303] sys.calls <- base::sys.calls [18:41:41.303] `[[` <- base::`[[` [18:41:41.303] `+` <- base::`+` [18:41:41.303] `<<-` <- base::`<<-` [18:41:41.303] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.303] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.303] 3L)] [18:41:41.303] } [18:41:41.303] function(cond) { [18:41:41.303] is_error <- inherits(cond, "error") [18:41:41.303] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.303] NULL) [18:41:41.303] if (is_error) { [18:41:41.303] sessionInformation <- function() { [18:41:41.303] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.303] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.303] search = base::search(), system = base::Sys.info()) [18:41:41.303] } [18:41:41.303] ...future.conditions[[length(...future.conditions) + [18:41:41.303] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.303] cond$call), session = sessionInformation(), [18:41:41.303] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.303] signalCondition(cond) [18:41:41.303] } [18:41:41.303] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.303] "immediateCondition"))) { [18:41:41.303] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.303] ...future.conditions[[length(...future.conditions) + [18:41:41.303] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.303] if (TRUE && !signal) { [18:41:41.303] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.303] { [18:41:41.303] inherits <- base::inherits [18:41:41.303] invokeRestart <- base::invokeRestart [18:41:41.303] is.null <- base::is.null [18:41:41.303] muffled <- FALSE [18:41:41.303] if (inherits(cond, "message")) { [18:41:41.303] muffled <- grepl(pattern, "muffleMessage") [18:41:41.303] if (muffled) [18:41:41.303] invokeRestart("muffleMessage") [18:41:41.303] } [18:41:41.303] else if (inherits(cond, "warning")) { [18:41:41.303] muffled <- grepl(pattern, "muffleWarning") [18:41:41.303] if (muffled) [18:41:41.303] invokeRestart("muffleWarning") [18:41:41.303] } [18:41:41.303] else if (inherits(cond, "condition")) { [18:41:41.303] if (!is.null(pattern)) { [18:41:41.303] computeRestarts <- base::computeRestarts [18:41:41.303] grepl <- base::grepl [18:41:41.303] restarts <- computeRestarts(cond) [18:41:41.303] for (restart in restarts) { [18:41:41.303] name <- restart$name [18:41:41.303] if (is.null(name)) [18:41:41.303] next [18:41:41.303] if (!grepl(pattern, name)) [18:41:41.303] next [18:41:41.303] invokeRestart(restart) [18:41:41.303] muffled <- TRUE [18:41:41.303] break [18:41:41.303] } [18:41:41.303] } [18:41:41.303] } [18:41:41.303] invisible(muffled) [18:41:41.303] } [18:41:41.303] muffleCondition(cond, pattern = "^muffle") [18:41:41.303] } [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] if (TRUE) { [18:41:41.303] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.303] { [18:41:41.303] inherits <- base::inherits [18:41:41.303] invokeRestart <- base::invokeRestart [18:41:41.303] is.null <- base::is.null [18:41:41.303] muffled <- FALSE [18:41:41.303] if (inherits(cond, "message")) { [18:41:41.303] muffled <- grepl(pattern, "muffleMessage") [18:41:41.303] if (muffled) [18:41:41.303] invokeRestart("muffleMessage") [18:41:41.303] } [18:41:41.303] else if (inherits(cond, "warning")) { [18:41:41.303] muffled <- grepl(pattern, "muffleWarning") [18:41:41.303] if (muffled) [18:41:41.303] invokeRestart("muffleWarning") [18:41:41.303] } [18:41:41.303] else if (inherits(cond, "condition")) { [18:41:41.303] if (!is.null(pattern)) { [18:41:41.303] computeRestarts <- base::computeRestarts [18:41:41.303] grepl <- base::grepl [18:41:41.303] restarts <- computeRestarts(cond) [18:41:41.303] for (restart in restarts) { [18:41:41.303] name <- restart$name [18:41:41.303] if (is.null(name)) [18:41:41.303] next [18:41:41.303] if (!grepl(pattern, name)) [18:41:41.303] next [18:41:41.303] invokeRestart(restart) [18:41:41.303] muffled <- TRUE [18:41:41.303] break [18:41:41.303] } [18:41:41.303] } [18:41:41.303] } [18:41:41.303] invisible(muffled) [18:41:41.303] } [18:41:41.303] muffleCondition(cond, pattern = "^muffle") [18:41:41.303] } [18:41:41.303] } [18:41:41.303] } [18:41:41.303] })) [18:41:41.303] }, error = function(ex) { [18:41:41.303] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.303] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.303] ...future.rng), started = ...future.startTime, [18:41:41.303] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.303] version = "1.8"), class = "FutureResult") [18:41:41.303] }, finally = { [18:41:41.303] if (!identical(...future.workdir, getwd())) [18:41:41.303] setwd(...future.workdir) [18:41:41.303] { [18:41:41.303] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.303] ...future.oldOptions$nwarnings <- NULL [18:41:41.303] } [18:41:41.303] base::options(...future.oldOptions) [18:41:41.303] if (.Platform$OS.type == "windows") { [18:41:41.303] old_names <- names(...future.oldEnvVars) [18:41:41.303] envs <- base::Sys.getenv() [18:41:41.303] names <- names(envs) [18:41:41.303] common <- intersect(names, old_names) [18:41:41.303] added <- setdiff(names, old_names) [18:41:41.303] removed <- setdiff(old_names, names) [18:41:41.303] changed <- common[...future.oldEnvVars[common] != [18:41:41.303] envs[common]] [18:41:41.303] NAMES <- toupper(changed) [18:41:41.303] args <- list() [18:41:41.303] for (kk in seq_along(NAMES)) { [18:41:41.303] name <- changed[[kk]] [18:41:41.303] NAME <- NAMES[[kk]] [18:41:41.303] if (name != NAME && is.element(NAME, old_names)) [18:41:41.303] next [18:41:41.303] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.303] } [18:41:41.303] NAMES <- toupper(added) [18:41:41.303] for (kk in seq_along(NAMES)) { [18:41:41.303] name <- added[[kk]] [18:41:41.303] NAME <- NAMES[[kk]] [18:41:41.303] if (name != NAME && is.element(NAME, old_names)) [18:41:41.303] next [18:41:41.303] args[[name]] <- "" [18:41:41.303] } [18:41:41.303] NAMES <- toupper(removed) [18:41:41.303] for (kk in seq_along(NAMES)) { [18:41:41.303] name <- removed[[kk]] [18:41:41.303] NAME <- NAMES[[kk]] [18:41:41.303] if (name != NAME && is.element(NAME, old_names)) [18:41:41.303] next [18:41:41.303] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.303] } [18:41:41.303] if (length(args) > 0) [18:41:41.303] base::do.call(base::Sys.setenv, args = args) [18:41:41.303] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.303] } [18:41:41.303] { [18:41:41.303] if (base::length(...future.futureOptionsAdded) > [18:41:41.303] 0L) { [18:41:41.303] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.303] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.303] base::options(opts) [18:41:41.303] } [18:41:41.303] { [18:41:41.303] { [18:41:41.303] NULL [18:41:41.303] RNGkind("Mersenne-Twister") [18:41:41.303] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.303] inherits = FALSE) [18:41:41.303] } [18:41:41.303] options(future.plan = NULL) [18:41:41.303] if (is.na(NA_character_)) [18:41:41.303] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.303] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.303] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.303] .init = FALSE) [18:41:41.303] } [18:41:41.303] } [18:41:41.303] } [18:41:41.303] }) [18:41:41.303] if (TRUE) { [18:41:41.303] base::sink(type = "output", split = FALSE) [18:41:41.303] if (TRUE) { [18:41:41.303] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.303] } [18:41:41.303] else { [18:41:41.303] ...future.result["stdout"] <- base::list(NULL) [18:41:41.303] } [18:41:41.303] base::close(...future.stdout) [18:41:41.303] ...future.stdout <- NULL [18:41:41.303] } [18:41:41.303] ...future.result$conditions <- ...future.conditions [18:41:41.303] ...future.result$finished <- base::Sys.time() [18:41:41.303] ...future.result [18:41:41.303] } [18:41:41.306] assign_globals() ... [18:41:41.307] List of 5 [18:41:41.307] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:41.307] $ future.call.arguments : list() [18:41:41.307] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.307] $ ...future.elements_ii :List of 3 [18:41:41.307] ..$ a: num 1 [18:41:41.307] ..$ b: num 2 [18:41:41.307] ..$ c: num 3 [18:41:41.307] $ ...future.seeds_ii : NULL [18:41:41.307] $ ...future.globals.maxSize: NULL [18:41:41.307] - attr(*, "where")=List of 5 [18:41:41.307] ..$ ...future.FUN : [18:41:41.307] ..$ future.call.arguments : [18:41:41.307] ..$ ...future.elements_ii : [18:41:41.307] ..$ ...future.seeds_ii : [18:41:41.307] ..$ ...future.globals.maxSize: [18:41:41.307] - attr(*, "resolved")= logi FALSE [18:41:41.307] - attr(*, "total_size")= num 6598 [18:41:41.307] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.307] - attr(*, "already-done")= logi TRUE [18:41:41.313] - reassign environment for '...future.FUN' [18:41:41.313] - copied '...future.FUN' to environment [18:41:41.313] - copied 'future.call.arguments' to environment [18:41:41.314] - copied '...future.elements_ii' to environment [18:41:41.314] - copied '...future.seeds_ii' to environment [18:41:41.314] - copied '...future.globals.maxSize' to environment [18:41:41.314] assign_globals() ... done [18:41:41.314] plan(): Setting new future strategy stack: [18:41:41.315] List of future strategies: [18:41:41.315] 1. sequential: [18:41:41.315] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.315] - tweaked: FALSE [18:41:41.315] - call: NULL [18:41:41.315] plan(): nbrOfWorkers() = 1 [18:41:41.317] plan(): Setting new future strategy stack: [18:41:41.317] List of future strategies: [18:41:41.317] 1. sequential: [18:41:41.317] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.317] - tweaked: FALSE [18:41:41.317] - call: plan(strategy) [18:41:41.317] plan(): nbrOfWorkers() = 1 [18:41:41.318] SequentialFuture started (and completed) [18:41:41.318] - Launch lazy future ... done [18:41:41.318] run() for 'SequentialFuture' ... done [18:41:41.318] Created future: [18:41:41.318] SequentialFuture: [18:41:41.318] Label: 'future_sapply-1' [18:41:41.318] Expression: [18:41:41.318] { [18:41:41.318] do.call(function(...) { [18:41:41.318] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.318] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.318] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.318] on.exit(options(oopts), add = TRUE) [18:41:41.318] } [18:41:41.318] { [18:41:41.318] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.318] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.318] ...future.FUN(...future.X_jj, ...) [18:41:41.318] }) [18:41:41.318] } [18:41:41.318] }, args = future.call.arguments) [18:41:41.318] } [18:41:41.318] Lazy evaluation: FALSE [18:41:41.318] Asynchronous evaluation: FALSE [18:41:41.318] Local evaluation: TRUE [18:41:41.318] Environment: R_GlobalEnv [18:41:41.318] Capture standard output: TRUE [18:41:41.318] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.318] Globals: 5 objects totaling 1.05 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.318] Packages: [18:41:41.318] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.318] Resolved: TRUE [18:41:41.318] Value: 510 bytes of class 'list' [18:41:41.318] Early signaling: FALSE [18:41:41.318] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.318] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.319] Chunk #1 of 1 ... DONE [18:41:41.321] Launching 1 futures (chunks) ... DONE [18:41:41.321] Resolving 1 futures (chunks) ... [18:41:41.321] resolve() on list ... [18:41:41.321] recursive: 0 [18:41:41.322] length: 1 [18:41:41.322] [18:41:41.322] resolved() for 'SequentialFuture' ... [18:41:41.322] - state: 'finished' [18:41:41.322] - run: TRUE [18:41:41.323] - result: 'FutureResult' [18:41:41.323] resolved() for 'SequentialFuture' ... done [18:41:41.323] Future #1 [18:41:41.323] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.323] - nx: 1 [18:41:41.323] - relay: TRUE [18:41:41.324] - stdout: TRUE [18:41:41.324] - signal: TRUE [18:41:41.324] - resignal: FALSE [18:41:41.324] - force: TRUE [18:41:41.324] - relayed: [n=1] FALSE [18:41:41.324] - queued futures: [n=1] FALSE [18:41:41.325] - until=1 [18:41:41.325] - relaying element #1 [18:41:41.325] - relayed: [n=1] TRUE [18:41:41.325] - queued futures: [n=1] TRUE [18:41:41.325] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.326] length: 0 (resolved future 1) [18:41:41.326] Relaying remaining futures [18:41:41.326] signalConditionsASAP(NULL, pos=0) ... [18:41:41.326] - nx: 1 [18:41:41.326] - relay: TRUE [18:41:41.326] - stdout: TRUE [18:41:41.327] - signal: TRUE [18:41:41.327] - resignal: FALSE [18:41:41.327] - force: TRUE [18:41:41.327] - relayed: [n=1] TRUE [18:41:41.327] - queued futures: [n=1] TRUE - flush all [18:41:41.327] - relayed: [n=1] TRUE [18:41:41.328] - queued futures: [n=1] TRUE [18:41:41.328] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.328] resolve() on list ... DONE [18:41:41.328] - Number of value chunks collected: 1 [18:41:41.328] Resolving 1 futures (chunks) ... DONE [18:41:41.328] Reducing values from 1 chunks ... [18:41:41.329] - Number of values collected after concatenation: 3 [18:41:41.329] - Number of values expected: 3 [18:41:41.329] Reducing values from 1 chunks ... DONE [18:41:41.329] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:41.332] future_lapply() ... [18:41:41.333] Number of chunks: 1 [18:41:41.333] getGlobalsAndPackagesXApply() ... [18:41:41.333] - future.globals: TRUE [18:41:41.333] getGlobalsAndPackages() ... [18:41:41.333] Searching for globals... [18:41:41.335] - globals found: [1] 'FUN' [18:41:41.335] Searching for globals ... DONE [18:41:41.335] Resolving globals: FALSE [18:41:41.335] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:41.336] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:41.336] - globals: [1] 'FUN' [18:41:41.336] [18:41:41.336] getGlobalsAndPackages() ... DONE [18:41:41.336] - globals found/used: [n=1] 'FUN' [18:41:41.337] - needed namespaces: [n=0] [18:41:41.337] Finding globals ... DONE [18:41:41.337] - use_args: TRUE [18:41:41.337] - Getting '...' globals ... [18:41:41.337] resolve() on list ... [18:41:41.338] recursive: 0 [18:41:41.338] length: 1 [18:41:41.338] elements: '...' [18:41:41.338] length: 0 (resolved future 1) [18:41:41.338] resolve() on list ... DONE [18:41:41.338] - '...' content: [n=0] [18:41:41.339] List of 1 [18:41:41.339] $ ...: list() [18:41:41.339] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.339] - attr(*, "where")=List of 1 [18:41:41.339] ..$ ...: [18:41:41.339] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.339] - attr(*, "resolved")= logi TRUE [18:41:41.339] - attr(*, "total_size")= num NA [18:41:41.341] - Getting '...' globals ... DONE [18:41:41.342] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.342] List of 2 [18:41:41.342] $ ...future.FUN:function (x) [18:41:41.342] $ ... : list() [18:41:41.342] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.342] - attr(*, "where")=List of 2 [18:41:41.342] ..$ ...future.FUN: [18:41:41.342] ..$ ... : [18:41:41.342] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.342] - attr(*, "resolved")= logi FALSE [18:41:41.342] - attr(*, "total_size")= int 4876 [18:41:41.346] Packages to be attached in all futures: [n=0] [18:41:41.346] getGlobalsAndPackagesXApply() ... DONE [18:41:41.347] Number of futures (= number of chunks): 1 [18:41:41.347] Launching 1 futures (chunks) ... [18:41:41.347] Chunk #1 of 1 ... [18:41:41.347] - Finding globals in 'X' for chunk #1 ... [18:41:41.348] getGlobalsAndPackages() ... [18:41:41.348] Searching for globals... [18:41:41.348] [18:41:41.348] Searching for globals ... DONE [18:41:41.348] - globals: [0] [18:41:41.349] getGlobalsAndPackages() ... DONE [18:41:41.349] + additional globals found: [n=0] [18:41:41.349] + additional namespaces needed: [n=0] [18:41:41.349] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.349] - seeds: [18:41:41.349] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.350] getGlobalsAndPackages() ... [18:41:41.350] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.350] Resolving globals: FALSE [18:41:41.350] Tweak future expression to call with '...' arguments ... [18:41:41.350] { [18:41:41.350] do.call(function(...) { [18:41:41.350] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.350] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.350] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.350] on.exit(options(oopts), add = TRUE) [18:41:41.350] } [18:41:41.350] { [18:41:41.350] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.350] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.350] ...future.FUN(...future.X_jj, ...) [18:41:41.350] }) [18:41:41.350] } [18:41:41.350] }, args = future.call.arguments) [18:41:41.350] } [18:41:41.351] Tweak future expression to call with '...' arguments ... DONE [18:41:41.351] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.351] [18:41:41.352] getGlobalsAndPackages() ... DONE [18:41:41.352] run() for 'Future' ... [18:41:41.352] - state: 'created' [18:41:41.352] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.353] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.353] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.353] - Field: 'label' [18:41:41.353] - Field: 'local' [18:41:41.353] - Field: 'owner' [18:41:41.354] - Field: 'envir' [18:41:41.354] - Field: 'packages' [18:41:41.354] - Field: 'gc' [18:41:41.354] - Field: 'conditions' [18:41:41.354] - Field: 'expr' [18:41:41.354] - Field: 'uuid' [18:41:41.355] - Field: 'seed' [18:41:41.355] - Field: 'version' [18:41:41.355] - Field: 'result' [18:41:41.355] - Field: 'asynchronous' [18:41:41.355] - Field: 'calls' [18:41:41.355] - Field: 'globals' [18:41:41.356] - Field: 'stdout' [18:41:41.356] - Field: 'earlySignal' [18:41:41.356] - Field: 'lazy' [18:41:41.356] - Field: 'state' [18:41:41.356] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.356] - Launch lazy future ... [18:41:41.357] Packages needed by the future expression (n = 0): [18:41:41.357] Packages needed by future strategies (n = 0): [18:41:41.357] { [18:41:41.357] { [18:41:41.357] { [18:41:41.357] ...future.startTime <- base::Sys.time() [18:41:41.357] { [18:41:41.357] { [18:41:41.357] { [18:41:41.357] base::local({ [18:41:41.357] has_future <- base::requireNamespace("future", [18:41:41.357] quietly = TRUE) [18:41:41.357] if (has_future) { [18:41:41.357] ns <- base::getNamespace("future") [18:41:41.357] version <- ns[[".package"]][["version"]] [18:41:41.357] if (is.null(version)) [18:41:41.357] version <- utils::packageVersion("future") [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] version <- NULL [18:41:41.357] } [18:41:41.357] if (!has_future || version < "1.8.0") { [18:41:41.357] info <- base::c(r_version = base::gsub("R version ", [18:41:41.357] "", base::R.version$version.string), [18:41:41.357] platform = base::sprintf("%s (%s-bit)", [18:41:41.357] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.357] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.357] "release", "version")], collapse = " "), [18:41:41.357] hostname = base::Sys.info()[["nodename"]]) [18:41:41.357] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.357] info) [18:41:41.357] info <- base::paste(info, collapse = "; ") [18:41:41.357] if (!has_future) { [18:41:41.357] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.357] info) [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.357] info, version) [18:41:41.357] } [18:41:41.357] base::stop(msg) [18:41:41.357] } [18:41:41.357] }) [18:41:41.357] } [18:41:41.357] ...future.strategy.old <- future::plan("list") [18:41:41.357] options(future.plan = NULL) [18:41:41.357] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.357] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.357] } [18:41:41.357] ...future.workdir <- getwd() [18:41:41.357] } [18:41:41.357] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.357] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.357] } [18:41:41.357] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.357] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.357] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.357] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.357] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.357] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.357] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.357] base::names(...future.oldOptions)) [18:41:41.357] } [18:41:41.357] if (FALSE) { [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] if (TRUE) { [18:41:41.357] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.357] open = "w") [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.357] windows = "NUL", "/dev/null"), open = "w") [18:41:41.357] } [18:41:41.357] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.357] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.357] base::sink(type = "output", split = FALSE) [18:41:41.357] base::close(...future.stdout) [18:41:41.357] }, add = TRUE) [18:41:41.357] } [18:41:41.357] ...future.frame <- base::sys.nframe() [18:41:41.357] ...future.conditions <- base::list() [18:41:41.357] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.357] if (FALSE) { [18:41:41.357] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.357] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.357] } [18:41:41.357] ...future.result <- base::tryCatch({ [18:41:41.357] base::withCallingHandlers({ [18:41:41.357] ...future.value <- base::withVisible(base::local({ [18:41:41.357] do.call(function(...) { [18:41:41.357] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.357] if (!identical(...future.globals.maxSize.org, [18:41:41.357] ...future.globals.maxSize)) { [18:41:41.357] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.357] on.exit(options(oopts), add = TRUE) [18:41:41.357] } [18:41:41.357] { [18:41:41.357] lapply(seq_along(...future.elements_ii), [18:41:41.357] FUN = function(jj) { [18:41:41.357] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.357] ...future.FUN(...future.X_jj, ...) [18:41:41.357] }) [18:41:41.357] } [18:41:41.357] }, args = future.call.arguments) [18:41:41.357] })) [18:41:41.357] future::FutureResult(value = ...future.value$value, [18:41:41.357] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.357] ...future.rng), globalenv = if (FALSE) [18:41:41.357] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.357] ...future.globalenv.names)) [18:41:41.357] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.357] }, condition = base::local({ [18:41:41.357] c <- base::c [18:41:41.357] inherits <- base::inherits [18:41:41.357] invokeRestart <- base::invokeRestart [18:41:41.357] length <- base::length [18:41:41.357] list <- base::list [18:41:41.357] seq.int <- base::seq.int [18:41:41.357] signalCondition <- base::signalCondition [18:41:41.357] sys.calls <- base::sys.calls [18:41:41.357] `[[` <- base::`[[` [18:41:41.357] `+` <- base::`+` [18:41:41.357] `<<-` <- base::`<<-` [18:41:41.357] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.357] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.357] 3L)] [18:41:41.357] } [18:41:41.357] function(cond) { [18:41:41.357] is_error <- inherits(cond, "error") [18:41:41.357] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.357] NULL) [18:41:41.357] if (is_error) { [18:41:41.357] sessionInformation <- function() { [18:41:41.357] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.357] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.357] search = base::search(), system = base::Sys.info()) [18:41:41.357] } [18:41:41.357] ...future.conditions[[length(...future.conditions) + [18:41:41.357] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.357] cond$call), session = sessionInformation(), [18:41:41.357] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.357] signalCondition(cond) [18:41:41.357] } [18:41:41.357] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.357] "immediateCondition"))) { [18:41:41.357] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.357] ...future.conditions[[length(...future.conditions) + [18:41:41.357] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.357] if (TRUE && !signal) { [18:41:41.357] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.357] { [18:41:41.357] inherits <- base::inherits [18:41:41.357] invokeRestart <- base::invokeRestart [18:41:41.357] is.null <- base::is.null [18:41:41.357] muffled <- FALSE [18:41:41.357] if (inherits(cond, "message")) { [18:41:41.357] muffled <- grepl(pattern, "muffleMessage") [18:41:41.357] if (muffled) [18:41:41.357] invokeRestart("muffleMessage") [18:41:41.357] } [18:41:41.357] else if (inherits(cond, "warning")) { [18:41:41.357] muffled <- grepl(pattern, "muffleWarning") [18:41:41.357] if (muffled) [18:41:41.357] invokeRestart("muffleWarning") [18:41:41.357] } [18:41:41.357] else if (inherits(cond, "condition")) { [18:41:41.357] if (!is.null(pattern)) { [18:41:41.357] computeRestarts <- base::computeRestarts [18:41:41.357] grepl <- base::grepl [18:41:41.357] restarts <- computeRestarts(cond) [18:41:41.357] for (restart in restarts) { [18:41:41.357] name <- restart$name [18:41:41.357] if (is.null(name)) [18:41:41.357] next [18:41:41.357] if (!grepl(pattern, name)) [18:41:41.357] next [18:41:41.357] invokeRestart(restart) [18:41:41.357] muffled <- TRUE [18:41:41.357] break [18:41:41.357] } [18:41:41.357] } [18:41:41.357] } [18:41:41.357] invisible(muffled) [18:41:41.357] } [18:41:41.357] muffleCondition(cond, pattern = "^muffle") [18:41:41.357] } [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] if (TRUE) { [18:41:41.357] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.357] { [18:41:41.357] inherits <- base::inherits [18:41:41.357] invokeRestart <- base::invokeRestart [18:41:41.357] is.null <- base::is.null [18:41:41.357] muffled <- FALSE [18:41:41.357] if (inherits(cond, "message")) { [18:41:41.357] muffled <- grepl(pattern, "muffleMessage") [18:41:41.357] if (muffled) [18:41:41.357] invokeRestart("muffleMessage") [18:41:41.357] } [18:41:41.357] else if (inherits(cond, "warning")) { [18:41:41.357] muffled <- grepl(pattern, "muffleWarning") [18:41:41.357] if (muffled) [18:41:41.357] invokeRestart("muffleWarning") [18:41:41.357] } [18:41:41.357] else if (inherits(cond, "condition")) { [18:41:41.357] if (!is.null(pattern)) { [18:41:41.357] computeRestarts <- base::computeRestarts [18:41:41.357] grepl <- base::grepl [18:41:41.357] restarts <- computeRestarts(cond) [18:41:41.357] for (restart in restarts) { [18:41:41.357] name <- restart$name [18:41:41.357] if (is.null(name)) [18:41:41.357] next [18:41:41.357] if (!grepl(pattern, name)) [18:41:41.357] next [18:41:41.357] invokeRestart(restart) [18:41:41.357] muffled <- TRUE [18:41:41.357] break [18:41:41.357] } [18:41:41.357] } [18:41:41.357] } [18:41:41.357] invisible(muffled) [18:41:41.357] } [18:41:41.357] muffleCondition(cond, pattern = "^muffle") [18:41:41.357] } [18:41:41.357] } [18:41:41.357] } [18:41:41.357] })) [18:41:41.357] }, error = function(ex) { [18:41:41.357] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.357] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.357] ...future.rng), started = ...future.startTime, [18:41:41.357] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.357] version = "1.8"), class = "FutureResult") [18:41:41.357] }, finally = { [18:41:41.357] if (!identical(...future.workdir, getwd())) [18:41:41.357] setwd(...future.workdir) [18:41:41.357] { [18:41:41.357] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.357] ...future.oldOptions$nwarnings <- NULL [18:41:41.357] } [18:41:41.357] base::options(...future.oldOptions) [18:41:41.357] if (.Platform$OS.type == "windows") { [18:41:41.357] old_names <- names(...future.oldEnvVars) [18:41:41.357] envs <- base::Sys.getenv() [18:41:41.357] names <- names(envs) [18:41:41.357] common <- intersect(names, old_names) [18:41:41.357] added <- setdiff(names, old_names) [18:41:41.357] removed <- setdiff(old_names, names) [18:41:41.357] changed <- common[...future.oldEnvVars[common] != [18:41:41.357] envs[common]] [18:41:41.357] NAMES <- toupper(changed) [18:41:41.357] args <- list() [18:41:41.357] for (kk in seq_along(NAMES)) { [18:41:41.357] name <- changed[[kk]] [18:41:41.357] NAME <- NAMES[[kk]] [18:41:41.357] if (name != NAME && is.element(NAME, old_names)) [18:41:41.357] next [18:41:41.357] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.357] } [18:41:41.357] NAMES <- toupper(added) [18:41:41.357] for (kk in seq_along(NAMES)) { [18:41:41.357] name <- added[[kk]] [18:41:41.357] NAME <- NAMES[[kk]] [18:41:41.357] if (name != NAME && is.element(NAME, old_names)) [18:41:41.357] next [18:41:41.357] args[[name]] <- "" [18:41:41.357] } [18:41:41.357] NAMES <- toupper(removed) [18:41:41.357] for (kk in seq_along(NAMES)) { [18:41:41.357] name <- removed[[kk]] [18:41:41.357] NAME <- NAMES[[kk]] [18:41:41.357] if (name != NAME && is.element(NAME, old_names)) [18:41:41.357] next [18:41:41.357] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.357] } [18:41:41.357] if (length(args) > 0) [18:41:41.357] base::do.call(base::Sys.setenv, args = args) [18:41:41.357] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.357] } [18:41:41.357] { [18:41:41.357] if (base::length(...future.futureOptionsAdded) > [18:41:41.357] 0L) { [18:41:41.357] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.357] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.357] base::options(opts) [18:41:41.357] } [18:41:41.357] { [18:41:41.357] { [18:41:41.357] NULL [18:41:41.357] RNGkind("Mersenne-Twister") [18:41:41.357] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.357] inherits = FALSE) [18:41:41.357] } [18:41:41.357] options(future.plan = NULL) [18:41:41.357] if (is.na(NA_character_)) [18:41:41.357] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.357] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.357] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.357] .init = FALSE) [18:41:41.357] } [18:41:41.357] } [18:41:41.357] } [18:41:41.357] }) [18:41:41.357] if (TRUE) { [18:41:41.357] base::sink(type = "output", split = FALSE) [18:41:41.357] if (TRUE) { [18:41:41.357] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.357] } [18:41:41.357] else { [18:41:41.357] ...future.result["stdout"] <- base::list(NULL) [18:41:41.357] } [18:41:41.357] base::close(...future.stdout) [18:41:41.357] ...future.stdout <- NULL [18:41:41.357] } [18:41:41.357] ...future.result$conditions <- ...future.conditions [18:41:41.357] ...future.result$finished <- base::Sys.time() [18:41:41.357] ...future.result [18:41:41.357] } [18:41:41.361] assign_globals() ... [18:41:41.361] List of 5 [18:41:41.361] $ ...future.FUN :function (x) [18:41:41.361] $ future.call.arguments : list() [18:41:41.361] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.361] $ ...future.elements_ii :List of 3 [18:41:41.361] ..$ a: num 1 [18:41:41.361] ..$ b: num 2 [18:41:41.361] ..$ c: num 3 [18:41:41.361] $ ...future.seeds_ii : NULL [18:41:41.361] $ ...future.globals.maxSize: NULL [18:41:41.361] - attr(*, "where")=List of 5 [18:41:41.361] ..$ ...future.FUN : [18:41:41.361] ..$ future.call.arguments : [18:41:41.361] ..$ ...future.elements_ii : [18:41:41.361] ..$ ...future.seeds_ii : [18:41:41.361] ..$ ...future.globals.maxSize: [18:41:41.361] - attr(*, "resolved")= logi FALSE [18:41:41.361] - attr(*, "total_size")= num 4876 [18:41:41.361] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.361] - attr(*, "already-done")= logi TRUE [18:41:41.368] - copied '...future.FUN' to environment [18:41:41.368] - copied 'future.call.arguments' to environment [18:41:41.368] - copied '...future.elements_ii' to environment [18:41:41.368] - copied '...future.seeds_ii' to environment [18:41:41.368] - copied '...future.globals.maxSize' to environment [18:41:41.368] assign_globals() ... done [18:41:41.369] plan(): Setting new future strategy stack: [18:41:41.369] List of future strategies: [18:41:41.369] 1. sequential: [18:41:41.369] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.369] - tweaked: FALSE [18:41:41.369] - call: NULL [18:41:41.370] plan(): nbrOfWorkers() = 1 [18:41:41.371] plan(): Setting new future strategy stack: [18:41:41.371] List of future strategies: [18:41:41.371] 1. sequential: [18:41:41.371] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.371] - tweaked: FALSE [18:41:41.371] - call: plan(strategy) [18:41:41.373] plan(): nbrOfWorkers() = 1 [18:41:41.373] SequentialFuture started (and completed) [18:41:41.373] - Launch lazy future ... done [18:41:41.373] run() for 'SequentialFuture' ... done [18:41:41.374] Created future: [18:41:41.374] SequentialFuture: [18:41:41.374] Label: 'future_sapply-1' [18:41:41.374] Expression: [18:41:41.374] { [18:41:41.374] do.call(function(...) { [18:41:41.374] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.374] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.374] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.374] on.exit(options(oopts), add = TRUE) [18:41:41.374] } [18:41:41.374] { [18:41:41.374] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.374] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.374] ...future.FUN(...future.X_jj, ...) [18:41:41.374] }) [18:41:41.374] } [18:41:41.374] }, args = future.call.arguments) [18:41:41.374] } [18:41:41.374] Lazy evaluation: FALSE [18:41:41.374] Asynchronous evaluation: FALSE [18:41:41.374] Local evaluation: TRUE [18:41:41.374] Environment: R_GlobalEnv [18:41:41.374] Capture standard output: TRUE [18:41:41.374] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.374] Globals: 5 objects totaling 475 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.374] Packages: [18:41:41.374] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.374] Resolved: TRUE [18:41:41.374] Value: 79 bytes of class 'list' [18:41:41.374] Early signaling: FALSE [18:41:41.374] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.374] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.375] Chunk #1 of 1 ... DONE [18:41:41.375] Launching 1 futures (chunks) ... DONE [18:41:41.375] Resolving 1 futures (chunks) ... [18:41:41.375] resolve() on list ... [18:41:41.376] recursive: 0 [18:41:41.376] length: 1 [18:41:41.376] [18:41:41.376] resolved() for 'SequentialFuture' ... [18:41:41.376] - state: 'finished' [18:41:41.376] - run: TRUE [18:41:41.377] - result: 'FutureResult' [18:41:41.377] resolved() for 'SequentialFuture' ... done [18:41:41.377] Future #1 [18:41:41.377] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.377] - nx: 1 [18:41:41.378] - relay: TRUE [18:41:41.378] - stdout: TRUE [18:41:41.378] - signal: TRUE [18:41:41.378] - resignal: FALSE [18:41:41.378] - force: TRUE [18:41:41.378] - relayed: [n=1] FALSE [18:41:41.378] - queued futures: [n=1] FALSE [18:41:41.379] - until=1 [18:41:41.379] - relaying element #1 [18:41:41.379] - relayed: [n=1] TRUE [18:41:41.379] - queued futures: [n=1] TRUE [18:41:41.379] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.380] length: 0 (resolved future 1) [18:41:41.380] Relaying remaining futures [18:41:41.380] signalConditionsASAP(NULL, pos=0) ... [18:41:41.380] - nx: 1 [18:41:41.380] - relay: TRUE [18:41:41.380] - stdout: TRUE [18:41:41.380] - signal: TRUE [18:41:41.381] - resignal: FALSE [18:41:41.381] - force: TRUE [18:41:41.381] - relayed: [n=1] TRUE [18:41:41.381] - queued futures: [n=1] TRUE - flush all [18:41:41.381] - relayed: [n=1] TRUE [18:41:41.381] - queued futures: [n=1] TRUE [18:41:41.382] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.382] resolve() on list ... DONE [18:41:41.382] - Number of value chunks collected: 1 [18:41:41.382] Resolving 1 futures (chunks) ... DONE [18:41:41.382] Reducing values from 1 chunks ... [18:41:41.382] - Number of values collected after concatenation: 3 [18:41:41.383] - Number of values expected: 3 [18:41:41.383] Reducing values from 1 chunks ... DONE [18:41:41.383] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:41.385] future_lapply() ... [18:41:41.385] Number of chunks: 1 [18:41:41.386] getGlobalsAndPackagesXApply() ... [18:41:41.386] - future.globals: TRUE [18:41:41.386] getGlobalsAndPackages() ... [18:41:41.386] Searching for globals... [18:41:41.387] - globals found: [2] 'FUN', 'UseMethod' [18:41:41.388] Searching for globals ... DONE [18:41:41.388] Resolving globals: FALSE [18:41:41.388] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:41.389] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:41.389] - globals: [1] 'FUN' [18:41:41.389] [18:41:41.389] getGlobalsAndPackages() ... DONE [18:41:41.389] - globals found/used: [n=1] 'FUN' [18:41:41.389] - needed namespaces: [n=0] [18:41:41.390] Finding globals ... DONE [18:41:41.390] - use_args: TRUE [18:41:41.390] - Getting '...' globals ... [18:41:41.390] resolve() on list ... [18:41:41.390] recursive: 0 [18:41:41.391] length: 1 [18:41:41.391] elements: '...' [18:41:41.391] length: 0 (resolved future 1) [18:41:41.391] resolve() on list ... DONE [18:41:41.391] - '...' content: [n=0] [18:41:41.391] List of 1 [18:41:41.391] $ ...: list() [18:41:41.391] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.391] - attr(*, "where")=List of 1 [18:41:41.391] ..$ ...: [18:41:41.391] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.391] - attr(*, "resolved")= logi TRUE [18:41:41.391] - attr(*, "total_size")= num NA [18:41:41.394] - Getting '...' globals ... DONE [18:41:41.395] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.395] List of 2 [18:41:41.395] $ ...future.FUN:function (x, ...) [18:41:41.395] $ ... : list() [18:41:41.395] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.395] - attr(*, "where")=List of 2 [18:41:41.395] ..$ ...future.FUN: [18:41:41.395] ..$ ... : [18:41:41.395] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.395] - attr(*, "resolved")= logi FALSE [18:41:41.395] - attr(*, "total_size")= int 5116 [18:41:41.399] Packages to be attached in all futures: [n=0] [18:41:41.399] getGlobalsAndPackagesXApply() ... DONE [18:41:41.400] Number of futures (= number of chunks): 1 [18:41:41.400] Launching 1 futures (chunks) ... [18:41:41.400] Chunk #1 of 1 ... [18:41:41.400] - Finding globals in 'X' for chunk #1 ... [18:41:41.400] getGlobalsAndPackages() ... [18:41:41.400] Searching for globals... [18:41:41.401] [18:41:41.401] Searching for globals ... DONE [18:41:41.401] - globals: [0] [18:41:41.401] getGlobalsAndPackages() ... DONE [18:41:41.402] + additional globals found: [n=0] [18:41:41.402] + additional namespaces needed: [n=0] [18:41:41.402] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.402] - seeds: [18:41:41.402] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.402] getGlobalsAndPackages() ... [18:41:41.402] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.403] Resolving globals: FALSE [18:41:41.403] Tweak future expression to call with '...' arguments ... [18:41:41.403] { [18:41:41.403] do.call(function(...) { [18:41:41.403] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.403] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.403] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.403] on.exit(options(oopts), add = TRUE) [18:41:41.403] } [18:41:41.403] { [18:41:41.403] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.403] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.403] ...future.FUN(...future.X_jj, ...) [18:41:41.403] }) [18:41:41.403] } [18:41:41.403] }, args = future.call.arguments) [18:41:41.403] } [18:41:41.404] Tweak future expression to call with '...' arguments ... DONE [18:41:41.404] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.404] [18:41:41.404] getGlobalsAndPackages() ... DONE [18:41:41.405] run() for 'Future' ... [18:41:41.405] - state: 'created' [18:41:41.405] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.406] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.406] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.406] - Field: 'label' [18:41:41.406] - Field: 'local' [18:41:41.406] - Field: 'owner' [18:41:41.406] - Field: 'envir' [18:41:41.407] - Field: 'packages' [18:41:41.407] - Field: 'gc' [18:41:41.407] - Field: 'conditions' [18:41:41.407] - Field: 'expr' [18:41:41.407] - Field: 'uuid' [18:41:41.407] - Field: 'seed' [18:41:41.408] - Field: 'version' [18:41:41.408] - Field: 'result' [18:41:41.408] - Field: 'asynchronous' [18:41:41.408] - Field: 'calls' [18:41:41.408] - Field: 'globals' [18:41:41.409] - Field: 'stdout' [18:41:41.409] - Field: 'earlySignal' [18:41:41.409] - Field: 'lazy' [18:41:41.409] - Field: 'state' [18:41:41.409] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.409] - Launch lazy future ... [18:41:41.410] Packages needed by the future expression (n = 0): [18:41:41.410] Packages needed by future strategies (n = 0): [18:41:41.410] { [18:41:41.410] { [18:41:41.410] { [18:41:41.410] ...future.startTime <- base::Sys.time() [18:41:41.410] { [18:41:41.410] { [18:41:41.410] { [18:41:41.410] base::local({ [18:41:41.410] has_future <- base::requireNamespace("future", [18:41:41.410] quietly = TRUE) [18:41:41.410] if (has_future) { [18:41:41.410] ns <- base::getNamespace("future") [18:41:41.410] version <- ns[[".package"]][["version"]] [18:41:41.410] if (is.null(version)) [18:41:41.410] version <- utils::packageVersion("future") [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] version <- NULL [18:41:41.410] } [18:41:41.410] if (!has_future || version < "1.8.0") { [18:41:41.410] info <- base::c(r_version = base::gsub("R version ", [18:41:41.410] "", base::R.version$version.string), [18:41:41.410] platform = base::sprintf("%s (%s-bit)", [18:41:41.410] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.410] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.410] "release", "version")], collapse = " "), [18:41:41.410] hostname = base::Sys.info()[["nodename"]]) [18:41:41.410] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.410] info) [18:41:41.410] info <- base::paste(info, collapse = "; ") [18:41:41.410] if (!has_future) { [18:41:41.410] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.410] info) [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.410] info, version) [18:41:41.410] } [18:41:41.410] base::stop(msg) [18:41:41.410] } [18:41:41.410] }) [18:41:41.410] } [18:41:41.410] ...future.strategy.old <- future::plan("list") [18:41:41.410] options(future.plan = NULL) [18:41:41.410] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.410] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.410] } [18:41:41.410] ...future.workdir <- getwd() [18:41:41.410] } [18:41:41.410] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.410] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.410] } [18:41:41.410] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.410] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.410] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.410] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.410] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.410] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.410] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.410] base::names(...future.oldOptions)) [18:41:41.410] } [18:41:41.410] if (FALSE) { [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] if (TRUE) { [18:41:41.410] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.410] open = "w") [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.410] windows = "NUL", "/dev/null"), open = "w") [18:41:41.410] } [18:41:41.410] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.410] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.410] base::sink(type = "output", split = FALSE) [18:41:41.410] base::close(...future.stdout) [18:41:41.410] }, add = TRUE) [18:41:41.410] } [18:41:41.410] ...future.frame <- base::sys.nframe() [18:41:41.410] ...future.conditions <- base::list() [18:41:41.410] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.410] if (FALSE) { [18:41:41.410] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.410] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.410] } [18:41:41.410] ...future.result <- base::tryCatch({ [18:41:41.410] base::withCallingHandlers({ [18:41:41.410] ...future.value <- base::withVisible(base::local({ [18:41:41.410] do.call(function(...) { [18:41:41.410] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.410] if (!identical(...future.globals.maxSize.org, [18:41:41.410] ...future.globals.maxSize)) { [18:41:41.410] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.410] on.exit(options(oopts), add = TRUE) [18:41:41.410] } [18:41:41.410] { [18:41:41.410] lapply(seq_along(...future.elements_ii), [18:41:41.410] FUN = function(jj) { [18:41:41.410] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.410] ...future.FUN(...future.X_jj, ...) [18:41:41.410] }) [18:41:41.410] } [18:41:41.410] }, args = future.call.arguments) [18:41:41.410] })) [18:41:41.410] future::FutureResult(value = ...future.value$value, [18:41:41.410] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.410] ...future.rng), globalenv = if (FALSE) [18:41:41.410] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.410] ...future.globalenv.names)) [18:41:41.410] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.410] }, condition = base::local({ [18:41:41.410] c <- base::c [18:41:41.410] inherits <- base::inherits [18:41:41.410] invokeRestart <- base::invokeRestart [18:41:41.410] length <- base::length [18:41:41.410] list <- base::list [18:41:41.410] seq.int <- base::seq.int [18:41:41.410] signalCondition <- base::signalCondition [18:41:41.410] sys.calls <- base::sys.calls [18:41:41.410] `[[` <- base::`[[` [18:41:41.410] `+` <- base::`+` [18:41:41.410] `<<-` <- base::`<<-` [18:41:41.410] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.410] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.410] 3L)] [18:41:41.410] } [18:41:41.410] function(cond) { [18:41:41.410] is_error <- inherits(cond, "error") [18:41:41.410] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.410] NULL) [18:41:41.410] if (is_error) { [18:41:41.410] sessionInformation <- function() { [18:41:41.410] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.410] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.410] search = base::search(), system = base::Sys.info()) [18:41:41.410] } [18:41:41.410] ...future.conditions[[length(...future.conditions) + [18:41:41.410] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.410] cond$call), session = sessionInformation(), [18:41:41.410] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.410] signalCondition(cond) [18:41:41.410] } [18:41:41.410] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.410] "immediateCondition"))) { [18:41:41.410] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.410] ...future.conditions[[length(...future.conditions) + [18:41:41.410] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.410] if (TRUE && !signal) { [18:41:41.410] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.410] { [18:41:41.410] inherits <- base::inherits [18:41:41.410] invokeRestart <- base::invokeRestart [18:41:41.410] is.null <- base::is.null [18:41:41.410] muffled <- FALSE [18:41:41.410] if (inherits(cond, "message")) { [18:41:41.410] muffled <- grepl(pattern, "muffleMessage") [18:41:41.410] if (muffled) [18:41:41.410] invokeRestart("muffleMessage") [18:41:41.410] } [18:41:41.410] else if (inherits(cond, "warning")) { [18:41:41.410] muffled <- grepl(pattern, "muffleWarning") [18:41:41.410] if (muffled) [18:41:41.410] invokeRestart("muffleWarning") [18:41:41.410] } [18:41:41.410] else if (inherits(cond, "condition")) { [18:41:41.410] if (!is.null(pattern)) { [18:41:41.410] computeRestarts <- base::computeRestarts [18:41:41.410] grepl <- base::grepl [18:41:41.410] restarts <- computeRestarts(cond) [18:41:41.410] for (restart in restarts) { [18:41:41.410] name <- restart$name [18:41:41.410] if (is.null(name)) [18:41:41.410] next [18:41:41.410] if (!grepl(pattern, name)) [18:41:41.410] next [18:41:41.410] invokeRestart(restart) [18:41:41.410] muffled <- TRUE [18:41:41.410] break [18:41:41.410] } [18:41:41.410] } [18:41:41.410] } [18:41:41.410] invisible(muffled) [18:41:41.410] } [18:41:41.410] muffleCondition(cond, pattern = "^muffle") [18:41:41.410] } [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] if (TRUE) { [18:41:41.410] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.410] { [18:41:41.410] inherits <- base::inherits [18:41:41.410] invokeRestart <- base::invokeRestart [18:41:41.410] is.null <- base::is.null [18:41:41.410] muffled <- FALSE [18:41:41.410] if (inherits(cond, "message")) { [18:41:41.410] muffled <- grepl(pattern, "muffleMessage") [18:41:41.410] if (muffled) [18:41:41.410] invokeRestart("muffleMessage") [18:41:41.410] } [18:41:41.410] else if (inherits(cond, "warning")) { [18:41:41.410] muffled <- grepl(pattern, "muffleWarning") [18:41:41.410] if (muffled) [18:41:41.410] invokeRestart("muffleWarning") [18:41:41.410] } [18:41:41.410] else if (inherits(cond, "condition")) { [18:41:41.410] if (!is.null(pattern)) { [18:41:41.410] computeRestarts <- base::computeRestarts [18:41:41.410] grepl <- base::grepl [18:41:41.410] restarts <- computeRestarts(cond) [18:41:41.410] for (restart in restarts) { [18:41:41.410] name <- restart$name [18:41:41.410] if (is.null(name)) [18:41:41.410] next [18:41:41.410] if (!grepl(pattern, name)) [18:41:41.410] next [18:41:41.410] invokeRestart(restart) [18:41:41.410] muffled <- TRUE [18:41:41.410] break [18:41:41.410] } [18:41:41.410] } [18:41:41.410] } [18:41:41.410] invisible(muffled) [18:41:41.410] } [18:41:41.410] muffleCondition(cond, pattern = "^muffle") [18:41:41.410] } [18:41:41.410] } [18:41:41.410] } [18:41:41.410] })) [18:41:41.410] }, error = function(ex) { [18:41:41.410] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.410] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.410] ...future.rng), started = ...future.startTime, [18:41:41.410] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.410] version = "1.8"), class = "FutureResult") [18:41:41.410] }, finally = { [18:41:41.410] if (!identical(...future.workdir, getwd())) [18:41:41.410] setwd(...future.workdir) [18:41:41.410] { [18:41:41.410] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.410] ...future.oldOptions$nwarnings <- NULL [18:41:41.410] } [18:41:41.410] base::options(...future.oldOptions) [18:41:41.410] if (.Platform$OS.type == "windows") { [18:41:41.410] old_names <- names(...future.oldEnvVars) [18:41:41.410] envs <- base::Sys.getenv() [18:41:41.410] names <- names(envs) [18:41:41.410] common <- intersect(names, old_names) [18:41:41.410] added <- setdiff(names, old_names) [18:41:41.410] removed <- setdiff(old_names, names) [18:41:41.410] changed <- common[...future.oldEnvVars[common] != [18:41:41.410] envs[common]] [18:41:41.410] NAMES <- toupper(changed) [18:41:41.410] args <- list() [18:41:41.410] for (kk in seq_along(NAMES)) { [18:41:41.410] name <- changed[[kk]] [18:41:41.410] NAME <- NAMES[[kk]] [18:41:41.410] if (name != NAME && is.element(NAME, old_names)) [18:41:41.410] next [18:41:41.410] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.410] } [18:41:41.410] NAMES <- toupper(added) [18:41:41.410] for (kk in seq_along(NAMES)) { [18:41:41.410] name <- added[[kk]] [18:41:41.410] NAME <- NAMES[[kk]] [18:41:41.410] if (name != NAME && is.element(NAME, old_names)) [18:41:41.410] next [18:41:41.410] args[[name]] <- "" [18:41:41.410] } [18:41:41.410] NAMES <- toupper(removed) [18:41:41.410] for (kk in seq_along(NAMES)) { [18:41:41.410] name <- removed[[kk]] [18:41:41.410] NAME <- NAMES[[kk]] [18:41:41.410] if (name != NAME && is.element(NAME, old_names)) [18:41:41.410] next [18:41:41.410] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.410] } [18:41:41.410] if (length(args) > 0) [18:41:41.410] base::do.call(base::Sys.setenv, args = args) [18:41:41.410] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.410] } [18:41:41.410] { [18:41:41.410] if (base::length(...future.futureOptionsAdded) > [18:41:41.410] 0L) { [18:41:41.410] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.410] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.410] base::options(opts) [18:41:41.410] } [18:41:41.410] { [18:41:41.410] { [18:41:41.410] NULL [18:41:41.410] RNGkind("Mersenne-Twister") [18:41:41.410] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.410] inherits = FALSE) [18:41:41.410] } [18:41:41.410] options(future.plan = NULL) [18:41:41.410] if (is.na(NA_character_)) [18:41:41.410] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.410] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.410] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.410] .init = FALSE) [18:41:41.410] } [18:41:41.410] } [18:41:41.410] } [18:41:41.410] }) [18:41:41.410] if (TRUE) { [18:41:41.410] base::sink(type = "output", split = FALSE) [18:41:41.410] if (TRUE) { [18:41:41.410] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.410] } [18:41:41.410] else { [18:41:41.410] ...future.result["stdout"] <- base::list(NULL) [18:41:41.410] } [18:41:41.410] base::close(...future.stdout) [18:41:41.410] ...future.stdout <- NULL [18:41:41.410] } [18:41:41.410] ...future.result$conditions <- ...future.conditions [18:41:41.410] ...future.result$finished <- base::Sys.time() [18:41:41.410] ...future.result [18:41:41.410] } [18:41:41.414] assign_globals() ... [18:41:41.414] List of 5 [18:41:41.414] $ ...future.FUN :function (x, ...) [18:41:41.414] $ future.call.arguments : list() [18:41:41.414] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.414] $ ...future.elements_ii :List of 3 [18:41:41.414] ..$ a: num 1 [18:41:41.414] ..$ b: num 2 [18:41:41.414] ..$ c: num 3 [18:41:41.414] $ ...future.seeds_ii : NULL [18:41:41.414] $ ...future.globals.maxSize: NULL [18:41:41.414] - attr(*, "where")=List of 5 [18:41:41.414] ..$ ...future.FUN : [18:41:41.414] ..$ future.call.arguments : [18:41:41.414] ..$ ...future.elements_ii : [18:41:41.414] ..$ ...future.seeds_ii : [18:41:41.414] ..$ ...future.globals.maxSize: [18:41:41.414] - attr(*, "resolved")= logi FALSE [18:41:41.414] - attr(*, "total_size")= num 5116 [18:41:41.414] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.414] - attr(*, "already-done")= logi TRUE [18:41:41.421] - copied '...future.FUN' to environment [18:41:41.421] - copied 'future.call.arguments' to environment [18:41:41.421] - copied '...future.elements_ii' to environment [18:41:41.421] - copied '...future.seeds_ii' to environment [18:41:41.421] - copied '...future.globals.maxSize' to environment [18:41:41.422] assign_globals() ... done [18:41:41.422] plan(): Setting new future strategy stack: [18:41:41.422] List of future strategies: [18:41:41.422] 1. sequential: [18:41:41.422] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.422] - tweaked: FALSE [18:41:41.422] - call: NULL [18:41:41.423] plan(): nbrOfWorkers() = 1 [18:41:41.425] plan(): Setting new future strategy stack: [18:41:41.425] List of future strategies: [18:41:41.425] 1. sequential: [18:41:41.425] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.425] - tweaked: FALSE [18:41:41.425] - call: plan(strategy) [18:41:41.426] plan(): nbrOfWorkers() = 1 [18:41:41.427] SequentialFuture started (and completed) [18:41:41.427] - Launch lazy future ... done [18:41:41.427] run() for 'SequentialFuture' ... done [18:41:41.427] Created future: [18:41:41.427] SequentialFuture: [18:41:41.427] Label: 'future_sapply-1' [18:41:41.427] Expression: [18:41:41.427] { [18:41:41.427] do.call(function(...) { [18:41:41.427] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.427] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.427] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.427] on.exit(options(oopts), add = TRUE) [18:41:41.427] } [18:41:41.427] { [18:41:41.427] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.427] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.427] ...future.FUN(...future.X_jj, ...) [18:41:41.427] }) [18:41:41.427] } [18:41:41.427] }, args = future.call.arguments) [18:41:41.427] } [18:41:41.427] Lazy evaluation: FALSE [18:41:41.427] Asynchronous evaluation: FALSE [18:41:41.427] Local evaluation: TRUE [18:41:41.427] Environment: R_GlobalEnv [18:41:41.427] Capture standard output: TRUE [18:41:41.427] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.427] Globals: 5 objects totaling 568 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.427] Packages: [18:41:41.427] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.427] Resolved: TRUE [18:41:41.427] Value: 174 bytes of class 'list' [18:41:41.427] Early signaling: FALSE [18:41:41.427] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.427] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.428] Chunk #1 of 1 ... DONE [18:41:41.429] Launching 1 futures (chunks) ... DONE [18:41:41.429] Resolving 1 futures (chunks) ... [18:41:41.429] resolve() on list ... [18:41:41.429] recursive: 0 [18:41:41.429] length: 1 [18:41:41.429] [18:41:41.430] resolved() for 'SequentialFuture' ... [18:41:41.430] - state: 'finished' [18:41:41.430] - run: TRUE [18:41:41.430] - result: 'FutureResult' [18:41:41.430] resolved() for 'SequentialFuture' ... done [18:41:41.431] Future #1 [18:41:41.431] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.431] - nx: 1 [18:41:41.431] - relay: TRUE [18:41:41.431] - stdout: TRUE [18:41:41.431] - signal: TRUE [18:41:41.431] - resignal: FALSE [18:41:41.432] - force: TRUE [18:41:41.432] - relayed: [n=1] FALSE [18:41:41.432] - queued futures: [n=1] FALSE [18:41:41.432] - until=1 [18:41:41.432] - relaying element #1 [18:41:41.433] - relayed: [n=1] TRUE [18:41:41.433] - queued futures: [n=1] TRUE [18:41:41.433] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.433] length: 0 (resolved future 1) [18:41:41.433] Relaying remaining futures [18:41:41.433] signalConditionsASAP(NULL, pos=0) ... [18:41:41.433] - nx: 1 [18:41:41.434] - relay: TRUE [18:41:41.434] - stdout: TRUE [18:41:41.434] - signal: TRUE [18:41:41.434] - resignal: FALSE [18:41:41.434] - force: TRUE [18:41:41.434] - relayed: [n=1] TRUE [18:41:41.434] - queued futures: [n=1] TRUE - flush all [18:41:41.435] - relayed: [n=1] TRUE [18:41:41.435] - queued futures: [n=1] TRUE [18:41:41.435] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.435] resolve() on list ... DONE [18:41:41.435] - Number of value chunks collected: 1 [18:41:41.436] Resolving 1 futures (chunks) ... DONE [18:41:41.436] Reducing values from 1 chunks ... [18:41:41.436] - Number of values collected after concatenation: 3 [18:41:41.436] - Number of values expected: 3 [18:41:41.436] Reducing values from 1 chunks ... DONE [18:41:41.436] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:41.438] future_lapply() ... [18:41:41.439] Number of chunks: 1 [18:41:41.440] getGlobalsAndPackagesXApply() ... [18:41:41.440] - future.globals: TRUE [18:41:41.440] getGlobalsAndPackages() ... [18:41:41.440] Searching for globals... [18:41:41.442] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:41.442] Searching for globals ... DONE [18:41:41.442] Resolving globals: FALSE [18:41:41.443] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:41.443] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:41.443] - globals: [1] 'FUN' [18:41:41.444] [18:41:41.444] getGlobalsAndPackages() ... DONE [18:41:41.444] - globals found/used: [n=1] 'FUN' [18:41:41.444] - needed namespaces: [n=0] [18:41:41.444] Finding globals ... DONE [18:41:41.444] - use_args: TRUE [18:41:41.444] - Getting '...' globals ... [18:41:41.445] resolve() on list ... [18:41:41.445] recursive: 0 [18:41:41.445] length: 1 [18:41:41.445] elements: '...' [18:41:41.446] length: 0 (resolved future 1) [18:41:41.446] resolve() on list ... DONE [18:41:41.446] - '...' content: [n=0] [18:41:41.446] List of 1 [18:41:41.446] $ ...: list() [18:41:41.446] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.446] - attr(*, "where")=List of 1 [18:41:41.446] ..$ ...: [18:41:41.446] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.446] - attr(*, "resolved")= logi TRUE [18:41:41.446] - attr(*, "total_size")= num NA [18:41:41.450] - Getting '...' globals ... DONE [18:41:41.450] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.450] List of 2 [18:41:41.450] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:41.450] $ ... : list() [18:41:41.450] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.450] - attr(*, "where")=List of 2 [18:41:41.450] ..$ ...future.FUN: [18:41:41.450] ..$ ... : [18:41:41.450] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.450] - attr(*, "resolved")= logi FALSE [18:41:41.450] - attr(*, "total_size")= int 6598 [18:41:41.454] Packages to be attached in all futures: [n=0] [18:41:41.454] getGlobalsAndPackagesXApply() ... DONE [18:41:41.454] Number of futures (= number of chunks): 1 [18:41:41.454] Launching 1 futures (chunks) ... [18:41:41.455] Chunk #1 of 1 ... [18:41:41.455] - Finding globals in 'X' for chunk #1 ... [18:41:41.455] getGlobalsAndPackages() ... [18:41:41.455] Searching for globals... [18:41:41.455] [18:41:41.456] Searching for globals ... DONE [18:41:41.456] - globals: [0] [18:41:41.456] getGlobalsAndPackages() ... DONE [18:41:41.456] + additional globals found: [n=0] [18:41:41.456] + additional namespaces needed: [n=0] [18:41:41.456] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.456] - seeds: [18:41:41.457] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.457] getGlobalsAndPackages() ... [18:41:41.457] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.457] Resolving globals: FALSE [18:41:41.457] Tweak future expression to call with '...' arguments ... [18:41:41.457] { [18:41:41.457] do.call(function(...) { [18:41:41.457] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.457] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.457] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.457] on.exit(options(oopts), add = TRUE) [18:41:41.457] } [18:41:41.457] { [18:41:41.457] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.457] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.457] ...future.FUN(...future.X_jj, ...) [18:41:41.457] }) [18:41:41.457] } [18:41:41.457] }, args = future.call.arguments) [18:41:41.457] } [18:41:41.458] Tweak future expression to call with '...' arguments ... DONE [18:41:41.458] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.459] [18:41:41.459] getGlobalsAndPackages() ... DONE [18:41:41.459] run() for 'Future' ... [18:41:41.459] - state: 'created' [18:41:41.460] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.460] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.460] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.460] - Field: 'label' [18:41:41.460] - Field: 'local' [18:41:41.461] - Field: 'owner' [18:41:41.461] - Field: 'envir' [18:41:41.461] - Field: 'packages' [18:41:41.461] - Field: 'gc' [18:41:41.461] - Field: 'conditions' [18:41:41.461] - Field: 'expr' [18:41:41.462] - Field: 'uuid' [18:41:41.462] - Field: 'seed' [18:41:41.462] - Field: 'version' [18:41:41.462] - Field: 'result' [18:41:41.462] - Field: 'asynchronous' [18:41:41.463] - Field: 'calls' [18:41:41.463] - Field: 'globals' [18:41:41.463] - Field: 'stdout' [18:41:41.463] - Field: 'earlySignal' [18:41:41.463] - Field: 'lazy' [18:41:41.463] - Field: 'state' [18:41:41.464] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.464] - Launch lazy future ... [18:41:41.464] Packages needed by the future expression (n = 0): [18:41:41.464] Packages needed by future strategies (n = 0): [18:41:41.465] { [18:41:41.465] { [18:41:41.465] { [18:41:41.465] ...future.startTime <- base::Sys.time() [18:41:41.465] { [18:41:41.465] { [18:41:41.465] { [18:41:41.465] base::local({ [18:41:41.465] has_future <- base::requireNamespace("future", [18:41:41.465] quietly = TRUE) [18:41:41.465] if (has_future) { [18:41:41.465] ns <- base::getNamespace("future") [18:41:41.465] version <- ns[[".package"]][["version"]] [18:41:41.465] if (is.null(version)) [18:41:41.465] version <- utils::packageVersion("future") [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] version <- NULL [18:41:41.465] } [18:41:41.465] if (!has_future || version < "1.8.0") { [18:41:41.465] info <- base::c(r_version = base::gsub("R version ", [18:41:41.465] "", base::R.version$version.string), [18:41:41.465] platform = base::sprintf("%s (%s-bit)", [18:41:41.465] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.465] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.465] "release", "version")], collapse = " "), [18:41:41.465] hostname = base::Sys.info()[["nodename"]]) [18:41:41.465] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.465] info) [18:41:41.465] info <- base::paste(info, collapse = "; ") [18:41:41.465] if (!has_future) { [18:41:41.465] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.465] info) [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.465] info, version) [18:41:41.465] } [18:41:41.465] base::stop(msg) [18:41:41.465] } [18:41:41.465] }) [18:41:41.465] } [18:41:41.465] ...future.strategy.old <- future::plan("list") [18:41:41.465] options(future.plan = NULL) [18:41:41.465] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.465] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.465] } [18:41:41.465] ...future.workdir <- getwd() [18:41:41.465] } [18:41:41.465] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.465] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.465] } [18:41:41.465] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.465] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.465] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.465] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.465] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.465] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.465] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.465] base::names(...future.oldOptions)) [18:41:41.465] } [18:41:41.465] if (FALSE) { [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] if (TRUE) { [18:41:41.465] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.465] open = "w") [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.465] windows = "NUL", "/dev/null"), open = "w") [18:41:41.465] } [18:41:41.465] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.465] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.465] base::sink(type = "output", split = FALSE) [18:41:41.465] base::close(...future.stdout) [18:41:41.465] }, add = TRUE) [18:41:41.465] } [18:41:41.465] ...future.frame <- base::sys.nframe() [18:41:41.465] ...future.conditions <- base::list() [18:41:41.465] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.465] if (FALSE) { [18:41:41.465] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.465] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.465] } [18:41:41.465] ...future.result <- base::tryCatch({ [18:41:41.465] base::withCallingHandlers({ [18:41:41.465] ...future.value <- base::withVisible(base::local({ [18:41:41.465] do.call(function(...) { [18:41:41.465] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.465] if (!identical(...future.globals.maxSize.org, [18:41:41.465] ...future.globals.maxSize)) { [18:41:41.465] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.465] on.exit(options(oopts), add = TRUE) [18:41:41.465] } [18:41:41.465] { [18:41:41.465] lapply(seq_along(...future.elements_ii), [18:41:41.465] FUN = function(jj) { [18:41:41.465] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.465] ...future.FUN(...future.X_jj, ...) [18:41:41.465] }) [18:41:41.465] } [18:41:41.465] }, args = future.call.arguments) [18:41:41.465] })) [18:41:41.465] future::FutureResult(value = ...future.value$value, [18:41:41.465] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.465] ...future.rng), globalenv = if (FALSE) [18:41:41.465] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.465] ...future.globalenv.names)) [18:41:41.465] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.465] }, condition = base::local({ [18:41:41.465] c <- base::c [18:41:41.465] inherits <- base::inherits [18:41:41.465] invokeRestart <- base::invokeRestart [18:41:41.465] length <- base::length [18:41:41.465] list <- base::list [18:41:41.465] seq.int <- base::seq.int [18:41:41.465] signalCondition <- base::signalCondition [18:41:41.465] sys.calls <- base::sys.calls [18:41:41.465] `[[` <- base::`[[` [18:41:41.465] `+` <- base::`+` [18:41:41.465] `<<-` <- base::`<<-` [18:41:41.465] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.465] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.465] 3L)] [18:41:41.465] } [18:41:41.465] function(cond) { [18:41:41.465] is_error <- inherits(cond, "error") [18:41:41.465] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.465] NULL) [18:41:41.465] if (is_error) { [18:41:41.465] sessionInformation <- function() { [18:41:41.465] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.465] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.465] search = base::search(), system = base::Sys.info()) [18:41:41.465] } [18:41:41.465] ...future.conditions[[length(...future.conditions) + [18:41:41.465] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.465] cond$call), session = sessionInformation(), [18:41:41.465] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.465] signalCondition(cond) [18:41:41.465] } [18:41:41.465] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.465] "immediateCondition"))) { [18:41:41.465] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.465] ...future.conditions[[length(...future.conditions) + [18:41:41.465] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.465] if (TRUE && !signal) { [18:41:41.465] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.465] { [18:41:41.465] inherits <- base::inherits [18:41:41.465] invokeRestart <- base::invokeRestart [18:41:41.465] is.null <- base::is.null [18:41:41.465] muffled <- FALSE [18:41:41.465] if (inherits(cond, "message")) { [18:41:41.465] muffled <- grepl(pattern, "muffleMessage") [18:41:41.465] if (muffled) [18:41:41.465] invokeRestart("muffleMessage") [18:41:41.465] } [18:41:41.465] else if (inherits(cond, "warning")) { [18:41:41.465] muffled <- grepl(pattern, "muffleWarning") [18:41:41.465] if (muffled) [18:41:41.465] invokeRestart("muffleWarning") [18:41:41.465] } [18:41:41.465] else if (inherits(cond, "condition")) { [18:41:41.465] if (!is.null(pattern)) { [18:41:41.465] computeRestarts <- base::computeRestarts [18:41:41.465] grepl <- base::grepl [18:41:41.465] restarts <- computeRestarts(cond) [18:41:41.465] for (restart in restarts) { [18:41:41.465] name <- restart$name [18:41:41.465] if (is.null(name)) [18:41:41.465] next [18:41:41.465] if (!grepl(pattern, name)) [18:41:41.465] next [18:41:41.465] invokeRestart(restart) [18:41:41.465] muffled <- TRUE [18:41:41.465] break [18:41:41.465] } [18:41:41.465] } [18:41:41.465] } [18:41:41.465] invisible(muffled) [18:41:41.465] } [18:41:41.465] muffleCondition(cond, pattern = "^muffle") [18:41:41.465] } [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] if (TRUE) { [18:41:41.465] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.465] { [18:41:41.465] inherits <- base::inherits [18:41:41.465] invokeRestart <- base::invokeRestart [18:41:41.465] is.null <- base::is.null [18:41:41.465] muffled <- FALSE [18:41:41.465] if (inherits(cond, "message")) { [18:41:41.465] muffled <- grepl(pattern, "muffleMessage") [18:41:41.465] if (muffled) [18:41:41.465] invokeRestart("muffleMessage") [18:41:41.465] } [18:41:41.465] else if (inherits(cond, "warning")) { [18:41:41.465] muffled <- grepl(pattern, "muffleWarning") [18:41:41.465] if (muffled) [18:41:41.465] invokeRestart("muffleWarning") [18:41:41.465] } [18:41:41.465] else if (inherits(cond, "condition")) { [18:41:41.465] if (!is.null(pattern)) { [18:41:41.465] computeRestarts <- base::computeRestarts [18:41:41.465] grepl <- base::grepl [18:41:41.465] restarts <- computeRestarts(cond) [18:41:41.465] for (restart in restarts) { [18:41:41.465] name <- restart$name [18:41:41.465] if (is.null(name)) [18:41:41.465] next [18:41:41.465] if (!grepl(pattern, name)) [18:41:41.465] next [18:41:41.465] invokeRestart(restart) [18:41:41.465] muffled <- TRUE [18:41:41.465] break [18:41:41.465] } [18:41:41.465] } [18:41:41.465] } [18:41:41.465] invisible(muffled) [18:41:41.465] } [18:41:41.465] muffleCondition(cond, pattern = "^muffle") [18:41:41.465] } [18:41:41.465] } [18:41:41.465] } [18:41:41.465] })) [18:41:41.465] }, error = function(ex) { [18:41:41.465] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.465] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.465] ...future.rng), started = ...future.startTime, [18:41:41.465] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.465] version = "1.8"), class = "FutureResult") [18:41:41.465] }, finally = { [18:41:41.465] if (!identical(...future.workdir, getwd())) [18:41:41.465] setwd(...future.workdir) [18:41:41.465] { [18:41:41.465] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.465] ...future.oldOptions$nwarnings <- NULL [18:41:41.465] } [18:41:41.465] base::options(...future.oldOptions) [18:41:41.465] if (.Platform$OS.type == "windows") { [18:41:41.465] old_names <- names(...future.oldEnvVars) [18:41:41.465] envs <- base::Sys.getenv() [18:41:41.465] names <- names(envs) [18:41:41.465] common <- intersect(names, old_names) [18:41:41.465] added <- setdiff(names, old_names) [18:41:41.465] removed <- setdiff(old_names, names) [18:41:41.465] changed <- common[...future.oldEnvVars[common] != [18:41:41.465] envs[common]] [18:41:41.465] NAMES <- toupper(changed) [18:41:41.465] args <- list() [18:41:41.465] for (kk in seq_along(NAMES)) { [18:41:41.465] name <- changed[[kk]] [18:41:41.465] NAME <- NAMES[[kk]] [18:41:41.465] if (name != NAME && is.element(NAME, old_names)) [18:41:41.465] next [18:41:41.465] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.465] } [18:41:41.465] NAMES <- toupper(added) [18:41:41.465] for (kk in seq_along(NAMES)) { [18:41:41.465] name <- added[[kk]] [18:41:41.465] NAME <- NAMES[[kk]] [18:41:41.465] if (name != NAME && is.element(NAME, old_names)) [18:41:41.465] next [18:41:41.465] args[[name]] <- "" [18:41:41.465] } [18:41:41.465] NAMES <- toupper(removed) [18:41:41.465] for (kk in seq_along(NAMES)) { [18:41:41.465] name <- removed[[kk]] [18:41:41.465] NAME <- NAMES[[kk]] [18:41:41.465] if (name != NAME && is.element(NAME, old_names)) [18:41:41.465] next [18:41:41.465] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.465] } [18:41:41.465] if (length(args) > 0) [18:41:41.465] base::do.call(base::Sys.setenv, args = args) [18:41:41.465] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.465] } [18:41:41.465] { [18:41:41.465] if (base::length(...future.futureOptionsAdded) > [18:41:41.465] 0L) { [18:41:41.465] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.465] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.465] base::options(opts) [18:41:41.465] } [18:41:41.465] { [18:41:41.465] { [18:41:41.465] NULL [18:41:41.465] RNGkind("Mersenne-Twister") [18:41:41.465] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.465] inherits = FALSE) [18:41:41.465] } [18:41:41.465] options(future.plan = NULL) [18:41:41.465] if (is.na(NA_character_)) [18:41:41.465] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.465] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.465] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.465] .init = FALSE) [18:41:41.465] } [18:41:41.465] } [18:41:41.465] } [18:41:41.465] }) [18:41:41.465] if (TRUE) { [18:41:41.465] base::sink(type = "output", split = FALSE) [18:41:41.465] if (TRUE) { [18:41:41.465] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.465] } [18:41:41.465] else { [18:41:41.465] ...future.result["stdout"] <- base::list(NULL) [18:41:41.465] } [18:41:41.465] base::close(...future.stdout) [18:41:41.465] ...future.stdout <- NULL [18:41:41.465] } [18:41:41.465] ...future.result$conditions <- ...future.conditions [18:41:41.465] ...future.result$finished <- base::Sys.time() [18:41:41.465] ...future.result [18:41:41.465] } [18:41:41.468] assign_globals() ... [18:41:41.469] List of 5 [18:41:41.469] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:41.469] $ future.call.arguments : list() [18:41:41.469] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.469] $ ...future.elements_ii :List of 3 [18:41:41.469] ..$ a: num 1 [18:41:41.469] ..$ b: num 2 [18:41:41.469] ..$ c: num 3 [18:41:41.469] $ ...future.seeds_ii : NULL [18:41:41.469] $ ...future.globals.maxSize: NULL [18:41:41.469] - attr(*, "where")=List of 5 [18:41:41.469] ..$ ...future.FUN : [18:41:41.469] ..$ future.call.arguments : [18:41:41.469] ..$ ...future.elements_ii : [18:41:41.469] ..$ ...future.seeds_ii : [18:41:41.469] ..$ ...future.globals.maxSize: [18:41:41.469] - attr(*, "resolved")= logi FALSE [18:41:41.469] - attr(*, "total_size")= num 6598 [18:41:41.469] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.469] - attr(*, "already-done")= logi TRUE [18:41:41.476] - reassign environment for '...future.FUN' [18:41:41.476] - copied '...future.FUN' to environment [18:41:41.476] - copied 'future.call.arguments' to environment [18:41:41.477] - copied '...future.elements_ii' to environment [18:41:41.477] - copied '...future.seeds_ii' to environment [18:41:41.477] - copied '...future.globals.maxSize' to environment [18:41:41.477] assign_globals() ... done [18:41:41.478] plan(): Setting new future strategy stack: [18:41:41.478] List of future strategies: [18:41:41.478] 1. sequential: [18:41:41.478] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.478] - tweaked: FALSE [18:41:41.478] - call: NULL [18:41:41.478] plan(): nbrOfWorkers() = 1 [18:41:41.480] plan(): Setting new future strategy stack: [18:41:41.480] List of future strategies: [18:41:41.480] 1. sequential: [18:41:41.480] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.480] - tweaked: FALSE [18:41:41.480] - call: plan(strategy) [18:41:41.480] plan(): nbrOfWorkers() = 1 [18:41:41.481] SequentialFuture started (and completed) [18:41:41.481] - Launch lazy future ... done [18:41:41.481] run() for 'SequentialFuture' ... done [18:41:41.481] Created future: [18:41:41.481] SequentialFuture: [18:41:41.481] Label: 'future_sapply-1' [18:41:41.481] Expression: [18:41:41.481] { [18:41:41.481] do.call(function(...) { [18:41:41.481] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.481] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.481] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.481] on.exit(options(oopts), add = TRUE) [18:41:41.481] } [18:41:41.481] { [18:41:41.481] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.481] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.481] ...future.FUN(...future.X_jj, ...) [18:41:41.481] }) [18:41:41.481] } [18:41:41.481] }, args = future.call.arguments) [18:41:41.481] } [18:41:41.481] Lazy evaluation: FALSE [18:41:41.481] Asynchronous evaluation: FALSE [18:41:41.481] Local evaluation: TRUE [18:41:41.481] Environment: R_GlobalEnv [18:41:41.481] Capture standard output: TRUE [18:41:41.481] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.481] Globals: 5 objects totaling 1.05 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.481] Packages: [18:41:41.481] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.481] Resolved: TRUE [18:41:41.481] Value: 510 bytes of class 'list' [18:41:41.481] Early signaling: FALSE [18:41:41.481] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.481] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.482] Chunk #1 of 1 ... DONE [18:41:41.483] Launching 1 futures (chunks) ... DONE [18:41:41.483] Resolving 1 futures (chunks) ... [18:41:41.483] resolve() on list ... [18:41:41.483] recursive: 0 [18:41:41.483] length: 1 [18:41:41.483] [18:41:41.484] resolved() for 'SequentialFuture' ... [18:41:41.484] - state: 'finished' [18:41:41.484] - run: TRUE [18:41:41.484] - result: 'FutureResult' [18:41:41.484] resolved() for 'SequentialFuture' ... done [18:41:41.485] Future #1 [18:41:41.485] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.485] - nx: 1 [18:41:41.485] - relay: TRUE [18:41:41.485] - stdout: TRUE [18:41:41.485] - signal: TRUE [18:41:41.485] - resignal: FALSE [18:41:41.486] - force: TRUE [18:41:41.486] - relayed: [n=1] FALSE [18:41:41.486] - queued futures: [n=1] FALSE [18:41:41.486] - until=1 [18:41:41.486] - relaying element #1 [18:41:41.487] - relayed: [n=1] TRUE [18:41:41.487] - queued futures: [n=1] TRUE [18:41:41.487] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.487] length: 0 (resolved future 1) [18:41:41.487] Relaying remaining futures [18:41:41.487] signalConditionsASAP(NULL, pos=0) ... [18:41:41.487] - nx: 1 [18:41:41.488] - relay: TRUE [18:41:41.488] - stdout: TRUE [18:41:41.488] - signal: TRUE [18:41:41.488] - resignal: FALSE [18:41:41.488] - force: TRUE [18:41:41.488] - relayed: [n=1] TRUE [18:41:41.488] - queued futures: [n=1] TRUE - flush all [18:41:41.489] - relayed: [n=1] TRUE [18:41:41.489] - queued futures: [n=1] TRUE [18:41:41.489] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.489] resolve() on list ... DONE [18:41:41.489] - Number of value chunks collected: 1 [18:41:41.490] Resolving 1 futures (chunks) ... DONE [18:41:41.490] Reducing values from 1 chunks ... [18:41:41.490] - Number of values collected after concatenation: 3 [18:41:41.490] - Number of values expected: 3 [18:41:41.490] Reducing values from 1 chunks ... DONE [18:41:41.490] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:41.494] future_lapply() ... [18:41:41.494] Number of chunks: 1 [18:41:41.495] getGlobalsAndPackagesXApply() ... [18:41:41.495] - future.globals: TRUE [18:41:41.495] getGlobalsAndPackages() ... [18:41:41.495] Searching for globals... [18:41:41.496] - globals found: [1] 'FUN' [18:41:41.496] Searching for globals ... DONE [18:41:41.497] Resolving globals: FALSE [18:41:41.497] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:41.497] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:41.498] - globals: [1] 'FUN' [18:41:41.498] [18:41:41.498] getGlobalsAndPackages() ... DONE [18:41:41.498] - globals found/used: [n=1] 'FUN' [18:41:41.499] - needed namespaces: [n=0] [18:41:41.500] Finding globals ... DONE [18:41:41.500] - use_args: TRUE [18:41:41.500] - Getting '...' globals ... [18:41:41.500] resolve() on list ... [18:41:41.501] recursive: 0 [18:41:41.501] length: 1 [18:41:41.501] elements: '...' [18:41:41.501] length: 0 (resolved future 1) [18:41:41.501] resolve() on list ... DONE [18:41:41.501] - '...' content: [n=0] [18:41:41.502] List of 1 [18:41:41.502] $ ...: list() [18:41:41.502] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.502] - attr(*, "where")=List of 1 [18:41:41.502] ..$ ...: [18:41:41.502] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.502] - attr(*, "resolved")= logi TRUE [18:41:41.502] - attr(*, "total_size")= num NA [18:41:41.505] - Getting '...' globals ... DONE [18:41:41.505] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.505] List of 2 [18:41:41.505] $ ...future.FUN:function (x) [18:41:41.505] $ ... : list() [18:41:41.505] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.505] - attr(*, "where")=List of 2 [18:41:41.505] ..$ ...future.FUN: [18:41:41.505] ..$ ... : [18:41:41.505] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.505] - attr(*, "resolved")= logi FALSE [18:41:41.505] - attr(*, "total_size")= int 4942 [18:41:41.508] Packages to be attached in all futures: [n=0] [18:41:41.508] getGlobalsAndPackagesXApply() ... DONE [18:41:41.509] Number of futures (= number of chunks): 1 [18:41:41.509] Launching 1 futures (chunks) ... [18:41:41.509] Chunk #1 of 1 ... [18:41:41.509] - Finding globals in 'X' for chunk #1 ... [18:41:41.509] getGlobalsAndPackages() ... [18:41:41.509] Searching for globals... [18:41:41.510] [18:41:41.510] Searching for globals ... DONE [18:41:41.510] - globals: [0] [18:41:41.510] getGlobalsAndPackages() ... DONE [18:41:41.510] + additional globals found: [n=0] [18:41:41.511] + additional namespaces needed: [n=0] [18:41:41.511] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.511] - seeds: [18:41:41.511] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.511] getGlobalsAndPackages() ... [18:41:41.511] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.512] Resolving globals: FALSE [18:41:41.512] Tweak future expression to call with '...' arguments ... [18:41:41.512] { [18:41:41.512] do.call(function(...) { [18:41:41.512] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.512] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.512] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.512] on.exit(options(oopts), add = TRUE) [18:41:41.512] } [18:41:41.512] { [18:41:41.512] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.512] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.512] ...future.FUN(...future.X_jj, ...) [18:41:41.512] }) [18:41:41.512] } [18:41:41.512] }, args = future.call.arguments) [18:41:41.512] } [18:41:41.512] Tweak future expression to call with '...' arguments ... DONE [18:41:41.513] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.513] [18:41:41.513] getGlobalsAndPackages() ... DONE [18:41:41.514] run() for 'Future' ... [18:41:41.514] - state: 'created' [18:41:41.514] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.514] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.515] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.515] - Field: 'label' [18:41:41.515] - Field: 'local' [18:41:41.515] - Field: 'owner' [18:41:41.515] - Field: 'envir' [18:41:41.515] - Field: 'packages' [18:41:41.516] - Field: 'gc' [18:41:41.516] - Field: 'conditions' [18:41:41.516] - Field: 'expr' [18:41:41.516] - Field: 'uuid' [18:41:41.516] - Field: 'seed' [18:41:41.516] - Field: 'version' [18:41:41.517] - Field: 'result' [18:41:41.517] - Field: 'asynchronous' [18:41:41.517] - Field: 'calls' [18:41:41.517] - Field: 'globals' [18:41:41.517] - Field: 'stdout' [18:41:41.517] - Field: 'earlySignal' [18:41:41.518] - Field: 'lazy' [18:41:41.518] - Field: 'state' [18:41:41.518] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.518] - Launch lazy future ... [18:41:41.518] Packages needed by the future expression (n = 0): [18:41:41.519] Packages needed by future strategies (n = 0): [18:41:41.519] { [18:41:41.519] { [18:41:41.519] { [18:41:41.519] ...future.startTime <- base::Sys.time() [18:41:41.519] { [18:41:41.519] { [18:41:41.519] { [18:41:41.519] base::local({ [18:41:41.519] has_future <- base::requireNamespace("future", [18:41:41.519] quietly = TRUE) [18:41:41.519] if (has_future) { [18:41:41.519] ns <- base::getNamespace("future") [18:41:41.519] version <- ns[[".package"]][["version"]] [18:41:41.519] if (is.null(version)) [18:41:41.519] version <- utils::packageVersion("future") [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] version <- NULL [18:41:41.519] } [18:41:41.519] if (!has_future || version < "1.8.0") { [18:41:41.519] info <- base::c(r_version = base::gsub("R version ", [18:41:41.519] "", base::R.version$version.string), [18:41:41.519] platform = base::sprintf("%s (%s-bit)", [18:41:41.519] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.519] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.519] "release", "version")], collapse = " "), [18:41:41.519] hostname = base::Sys.info()[["nodename"]]) [18:41:41.519] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.519] info) [18:41:41.519] info <- base::paste(info, collapse = "; ") [18:41:41.519] if (!has_future) { [18:41:41.519] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.519] info) [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.519] info, version) [18:41:41.519] } [18:41:41.519] base::stop(msg) [18:41:41.519] } [18:41:41.519] }) [18:41:41.519] } [18:41:41.519] ...future.strategy.old <- future::plan("list") [18:41:41.519] options(future.plan = NULL) [18:41:41.519] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.519] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.519] } [18:41:41.519] ...future.workdir <- getwd() [18:41:41.519] } [18:41:41.519] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.519] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.519] } [18:41:41.519] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.519] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.519] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.519] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.519] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.519] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.519] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.519] base::names(...future.oldOptions)) [18:41:41.519] } [18:41:41.519] if (FALSE) { [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] if (TRUE) { [18:41:41.519] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.519] open = "w") [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.519] windows = "NUL", "/dev/null"), open = "w") [18:41:41.519] } [18:41:41.519] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.519] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.519] base::sink(type = "output", split = FALSE) [18:41:41.519] base::close(...future.stdout) [18:41:41.519] }, add = TRUE) [18:41:41.519] } [18:41:41.519] ...future.frame <- base::sys.nframe() [18:41:41.519] ...future.conditions <- base::list() [18:41:41.519] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.519] if (FALSE) { [18:41:41.519] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.519] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.519] } [18:41:41.519] ...future.result <- base::tryCatch({ [18:41:41.519] base::withCallingHandlers({ [18:41:41.519] ...future.value <- base::withVisible(base::local({ [18:41:41.519] do.call(function(...) { [18:41:41.519] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.519] if (!identical(...future.globals.maxSize.org, [18:41:41.519] ...future.globals.maxSize)) { [18:41:41.519] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.519] on.exit(options(oopts), add = TRUE) [18:41:41.519] } [18:41:41.519] { [18:41:41.519] lapply(seq_along(...future.elements_ii), [18:41:41.519] FUN = function(jj) { [18:41:41.519] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.519] ...future.FUN(...future.X_jj, ...) [18:41:41.519] }) [18:41:41.519] } [18:41:41.519] }, args = future.call.arguments) [18:41:41.519] })) [18:41:41.519] future::FutureResult(value = ...future.value$value, [18:41:41.519] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.519] ...future.rng), globalenv = if (FALSE) [18:41:41.519] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.519] ...future.globalenv.names)) [18:41:41.519] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.519] }, condition = base::local({ [18:41:41.519] c <- base::c [18:41:41.519] inherits <- base::inherits [18:41:41.519] invokeRestart <- base::invokeRestart [18:41:41.519] length <- base::length [18:41:41.519] list <- base::list [18:41:41.519] seq.int <- base::seq.int [18:41:41.519] signalCondition <- base::signalCondition [18:41:41.519] sys.calls <- base::sys.calls [18:41:41.519] `[[` <- base::`[[` [18:41:41.519] `+` <- base::`+` [18:41:41.519] `<<-` <- base::`<<-` [18:41:41.519] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.519] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.519] 3L)] [18:41:41.519] } [18:41:41.519] function(cond) { [18:41:41.519] is_error <- inherits(cond, "error") [18:41:41.519] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.519] NULL) [18:41:41.519] if (is_error) { [18:41:41.519] sessionInformation <- function() { [18:41:41.519] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.519] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.519] search = base::search(), system = base::Sys.info()) [18:41:41.519] } [18:41:41.519] ...future.conditions[[length(...future.conditions) + [18:41:41.519] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.519] cond$call), session = sessionInformation(), [18:41:41.519] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.519] signalCondition(cond) [18:41:41.519] } [18:41:41.519] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.519] "immediateCondition"))) { [18:41:41.519] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.519] ...future.conditions[[length(...future.conditions) + [18:41:41.519] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.519] if (TRUE && !signal) { [18:41:41.519] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.519] { [18:41:41.519] inherits <- base::inherits [18:41:41.519] invokeRestart <- base::invokeRestart [18:41:41.519] is.null <- base::is.null [18:41:41.519] muffled <- FALSE [18:41:41.519] if (inherits(cond, "message")) { [18:41:41.519] muffled <- grepl(pattern, "muffleMessage") [18:41:41.519] if (muffled) [18:41:41.519] invokeRestart("muffleMessage") [18:41:41.519] } [18:41:41.519] else if (inherits(cond, "warning")) { [18:41:41.519] muffled <- grepl(pattern, "muffleWarning") [18:41:41.519] if (muffled) [18:41:41.519] invokeRestart("muffleWarning") [18:41:41.519] } [18:41:41.519] else if (inherits(cond, "condition")) { [18:41:41.519] if (!is.null(pattern)) { [18:41:41.519] computeRestarts <- base::computeRestarts [18:41:41.519] grepl <- base::grepl [18:41:41.519] restarts <- computeRestarts(cond) [18:41:41.519] for (restart in restarts) { [18:41:41.519] name <- restart$name [18:41:41.519] if (is.null(name)) [18:41:41.519] next [18:41:41.519] if (!grepl(pattern, name)) [18:41:41.519] next [18:41:41.519] invokeRestart(restart) [18:41:41.519] muffled <- TRUE [18:41:41.519] break [18:41:41.519] } [18:41:41.519] } [18:41:41.519] } [18:41:41.519] invisible(muffled) [18:41:41.519] } [18:41:41.519] muffleCondition(cond, pattern = "^muffle") [18:41:41.519] } [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] if (TRUE) { [18:41:41.519] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.519] { [18:41:41.519] inherits <- base::inherits [18:41:41.519] invokeRestart <- base::invokeRestart [18:41:41.519] is.null <- base::is.null [18:41:41.519] muffled <- FALSE [18:41:41.519] if (inherits(cond, "message")) { [18:41:41.519] muffled <- grepl(pattern, "muffleMessage") [18:41:41.519] if (muffled) [18:41:41.519] invokeRestart("muffleMessage") [18:41:41.519] } [18:41:41.519] else if (inherits(cond, "warning")) { [18:41:41.519] muffled <- grepl(pattern, "muffleWarning") [18:41:41.519] if (muffled) [18:41:41.519] invokeRestart("muffleWarning") [18:41:41.519] } [18:41:41.519] else if (inherits(cond, "condition")) { [18:41:41.519] if (!is.null(pattern)) { [18:41:41.519] computeRestarts <- base::computeRestarts [18:41:41.519] grepl <- base::grepl [18:41:41.519] restarts <- computeRestarts(cond) [18:41:41.519] for (restart in restarts) { [18:41:41.519] name <- restart$name [18:41:41.519] if (is.null(name)) [18:41:41.519] next [18:41:41.519] if (!grepl(pattern, name)) [18:41:41.519] next [18:41:41.519] invokeRestart(restart) [18:41:41.519] muffled <- TRUE [18:41:41.519] break [18:41:41.519] } [18:41:41.519] } [18:41:41.519] } [18:41:41.519] invisible(muffled) [18:41:41.519] } [18:41:41.519] muffleCondition(cond, pattern = "^muffle") [18:41:41.519] } [18:41:41.519] } [18:41:41.519] } [18:41:41.519] })) [18:41:41.519] }, error = function(ex) { [18:41:41.519] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.519] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.519] ...future.rng), started = ...future.startTime, [18:41:41.519] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.519] version = "1.8"), class = "FutureResult") [18:41:41.519] }, finally = { [18:41:41.519] if (!identical(...future.workdir, getwd())) [18:41:41.519] setwd(...future.workdir) [18:41:41.519] { [18:41:41.519] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.519] ...future.oldOptions$nwarnings <- NULL [18:41:41.519] } [18:41:41.519] base::options(...future.oldOptions) [18:41:41.519] if (.Platform$OS.type == "windows") { [18:41:41.519] old_names <- names(...future.oldEnvVars) [18:41:41.519] envs <- base::Sys.getenv() [18:41:41.519] names <- names(envs) [18:41:41.519] common <- intersect(names, old_names) [18:41:41.519] added <- setdiff(names, old_names) [18:41:41.519] removed <- setdiff(old_names, names) [18:41:41.519] changed <- common[...future.oldEnvVars[common] != [18:41:41.519] envs[common]] [18:41:41.519] NAMES <- toupper(changed) [18:41:41.519] args <- list() [18:41:41.519] for (kk in seq_along(NAMES)) { [18:41:41.519] name <- changed[[kk]] [18:41:41.519] NAME <- NAMES[[kk]] [18:41:41.519] if (name != NAME && is.element(NAME, old_names)) [18:41:41.519] next [18:41:41.519] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.519] } [18:41:41.519] NAMES <- toupper(added) [18:41:41.519] for (kk in seq_along(NAMES)) { [18:41:41.519] name <- added[[kk]] [18:41:41.519] NAME <- NAMES[[kk]] [18:41:41.519] if (name != NAME && is.element(NAME, old_names)) [18:41:41.519] next [18:41:41.519] args[[name]] <- "" [18:41:41.519] } [18:41:41.519] NAMES <- toupper(removed) [18:41:41.519] for (kk in seq_along(NAMES)) { [18:41:41.519] name <- removed[[kk]] [18:41:41.519] NAME <- NAMES[[kk]] [18:41:41.519] if (name != NAME && is.element(NAME, old_names)) [18:41:41.519] next [18:41:41.519] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.519] } [18:41:41.519] if (length(args) > 0) [18:41:41.519] base::do.call(base::Sys.setenv, args = args) [18:41:41.519] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.519] } [18:41:41.519] { [18:41:41.519] if (base::length(...future.futureOptionsAdded) > [18:41:41.519] 0L) { [18:41:41.519] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.519] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.519] base::options(opts) [18:41:41.519] } [18:41:41.519] { [18:41:41.519] { [18:41:41.519] NULL [18:41:41.519] RNGkind("Mersenne-Twister") [18:41:41.519] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.519] inherits = FALSE) [18:41:41.519] } [18:41:41.519] options(future.plan = NULL) [18:41:41.519] if (is.na(NA_character_)) [18:41:41.519] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.519] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.519] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.519] .init = FALSE) [18:41:41.519] } [18:41:41.519] } [18:41:41.519] } [18:41:41.519] }) [18:41:41.519] if (TRUE) { [18:41:41.519] base::sink(type = "output", split = FALSE) [18:41:41.519] if (TRUE) { [18:41:41.519] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.519] } [18:41:41.519] else { [18:41:41.519] ...future.result["stdout"] <- base::list(NULL) [18:41:41.519] } [18:41:41.519] base::close(...future.stdout) [18:41:41.519] ...future.stdout <- NULL [18:41:41.519] } [18:41:41.519] ...future.result$conditions <- ...future.conditions [18:41:41.519] ...future.result$finished <- base::Sys.time() [18:41:41.519] ...future.result [18:41:41.519] } [18:41:41.523] assign_globals() ... [18:41:41.523] List of 5 [18:41:41.523] $ ...future.FUN :function (x) [18:41:41.523] $ future.call.arguments : list() [18:41:41.523] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.523] $ ...future.elements_ii :List of 6 [18:41:41.523] ..$ a1: int 1 [18:41:41.523] ..$ a2: int 2 [18:41:41.523] ..$ b1: int 2 [18:41:41.523] ..$ b2: int 3 [18:41:41.523] ..$ c1: int 3 [18:41:41.523] ..$ c2: int 4 [18:41:41.523] $ ...future.seeds_ii : NULL [18:41:41.523] $ ...future.globals.maxSize: NULL [18:41:41.523] - attr(*, "where")=List of 5 [18:41:41.523] ..$ ...future.FUN : [18:41:41.523] ..$ future.call.arguments : [18:41:41.523] ..$ ...future.elements_ii : [18:41:41.523] ..$ ...future.seeds_ii : [18:41:41.523] ..$ ...future.globals.maxSize: [18:41:41.523] - attr(*, "resolved")= logi FALSE [18:41:41.523] - attr(*, "total_size")= num 4942 [18:41:41.523] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.523] - attr(*, "already-done")= logi TRUE [18:41:41.532] - copied '...future.FUN' to environment [18:41:41.533] - copied 'future.call.arguments' to environment [18:41:41.533] - copied '...future.elements_ii' to environment [18:41:41.533] - copied '...future.seeds_ii' to environment [18:41:41.533] - copied '...future.globals.maxSize' to environment [18:41:41.533] assign_globals() ... done [18:41:41.534] plan(): Setting new future strategy stack: [18:41:41.534] List of future strategies: [18:41:41.534] 1. sequential: [18:41:41.534] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.534] - tweaked: FALSE [18:41:41.534] - call: NULL [18:41:41.534] plan(): nbrOfWorkers() = 1 [18:41:41.536] plan(): Setting new future strategy stack: [18:41:41.536] List of future strategies: [18:41:41.536] 1. sequential: [18:41:41.536] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.536] - tweaked: FALSE [18:41:41.536] - call: plan(strategy) [18:41:41.537] plan(): nbrOfWorkers() = 1 [18:41:41.537] SequentialFuture started (and completed) [18:41:41.537] - Launch lazy future ... done [18:41:41.537] run() for 'SequentialFuture' ... done [18:41:41.538] Created future: [18:41:41.538] SequentialFuture: [18:41:41.538] Label: 'future_sapply-1' [18:41:41.538] Expression: [18:41:41.538] { [18:41:41.538] do.call(function(...) { [18:41:41.538] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.538] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.538] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.538] on.exit(options(oopts), add = TRUE) [18:41:41.538] } [18:41:41.538] { [18:41:41.538] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.538] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.538] ...future.FUN(...future.X_jj, ...) [18:41:41.538] }) [18:41:41.538] } [18:41:41.538] }, args = future.call.arguments) [18:41:41.538] } [18:41:41.538] Lazy evaluation: FALSE [18:41:41.538] Asynchronous evaluation: FALSE [18:41:41.538] Local evaluation: TRUE [18:41:41.538] Environment: R_GlobalEnv [18:41:41.538] Capture standard output: TRUE [18:41:41.538] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.538] Globals: 5 objects totaling 532 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.538] Packages: [18:41:41.538] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.538] Resolved: TRUE [18:41:41.538] Value: 103 bytes of class 'list' [18:41:41.538] Early signaling: FALSE [18:41:41.538] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.538] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.539] Chunk #1 of 1 ... DONE [18:41:41.539] Launching 1 futures (chunks) ... DONE [18:41:41.539] Resolving 1 futures (chunks) ... [18:41:41.540] resolve() on list ... [18:41:41.540] recursive: 0 [18:41:41.540] length: 1 [18:41:41.540] [18:41:41.540] resolved() for 'SequentialFuture' ... [18:41:41.541] - state: 'finished' [18:41:41.541] - run: TRUE [18:41:41.541] - result: 'FutureResult' [18:41:41.541] resolved() for 'SequentialFuture' ... done [18:41:41.541] Future #1 [18:41:41.542] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.542] - nx: 1 [18:41:41.542] - relay: TRUE [18:41:41.542] - stdout: TRUE [18:41:41.542] - signal: TRUE [18:41:41.543] - resignal: FALSE [18:41:41.543] - force: TRUE [18:41:41.543] - relayed: [n=1] FALSE [18:41:41.543] - queued futures: [n=1] FALSE [18:41:41.543] - until=1 [18:41:41.543] - relaying element #1 [18:41:41.544] - relayed: [n=1] TRUE [18:41:41.544] - queued futures: [n=1] TRUE [18:41:41.544] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.544] length: 0 (resolved future 1) [18:41:41.545] Relaying remaining futures [18:41:41.545] signalConditionsASAP(NULL, pos=0) ... [18:41:41.545] - nx: 1 [18:41:41.545] - relay: TRUE [18:41:41.545] - stdout: TRUE [18:41:41.545] - signal: TRUE [18:41:41.546] - resignal: FALSE [18:41:41.546] - force: TRUE [18:41:41.546] - relayed: [n=1] TRUE [18:41:41.546] - queued futures: [n=1] TRUE - flush all [18:41:41.546] - relayed: [n=1] TRUE [18:41:41.547] - queued futures: [n=1] TRUE [18:41:41.547] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.547] resolve() on list ... DONE [18:41:41.547] - Number of value chunks collected: 1 [18:41:41.547] Resolving 1 futures (chunks) ... DONE [18:41:41.548] Reducing values from 1 chunks ... [18:41:41.548] - Number of values collected after concatenation: 6 [18:41:41.548] - Number of values expected: 6 [18:41:41.548] Reducing values from 1 chunks ... DONE [18:41:41.548] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y1:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y2:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 [18:41:41.563] future_lapply() ... [18:41:41.564] Number of chunks: 1 [18:41:41.564] getGlobalsAndPackagesXApply() ... [18:41:41.564] - future.globals: TRUE [18:41:41.564] getGlobalsAndPackages() ... [18:41:41.564] Searching for globals... [18:41:41.566] - globals found: [2] 'FUN', 'UseMethod' [18:41:41.566] Searching for globals ... DONE [18:41:41.566] Resolving globals: FALSE [18:41:41.567] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:41.567] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:41.568] - globals: [1] 'FUN' [18:41:41.568] [18:41:41.568] getGlobalsAndPackages() ... DONE [18:41:41.568] - globals found/used: [n=1] 'FUN' [18:41:41.569] - needed namespaces: [n=0] [18:41:41.569] Finding globals ... DONE [18:41:41.569] - use_args: TRUE [18:41:41.569] - Getting '...' globals ... [18:41:41.570] resolve() on list ... [18:41:41.570] recursive: 0 [18:41:41.570] length: 1 [18:41:41.570] elements: '...' [18:41:41.571] length: 0 (resolved future 1) [18:41:41.571] resolve() on list ... DONE [18:41:41.571] - '...' content: [n=0] [18:41:41.571] List of 1 [18:41:41.571] $ ...: list() [18:41:41.571] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.571] - attr(*, "where")=List of 1 [18:41:41.571] ..$ ...: [18:41:41.571] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.571] - attr(*, "resolved")= logi TRUE [18:41:41.571] - attr(*, "total_size")= num NA [18:41:41.574] - Getting '...' globals ... DONE [18:41:41.575] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.575] List of 2 [18:41:41.575] $ ...future.FUN:function (x, ...) [18:41:41.575] $ ... : list() [18:41:41.575] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.575] - attr(*, "where")=List of 2 [18:41:41.575] ..$ ...future.FUN: [18:41:41.575] ..$ ... : [18:41:41.575] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.575] - attr(*, "resolved")= logi FALSE [18:41:41.575] - attr(*, "total_size")= int 5182 [18:41:41.581] Packages to be attached in all futures: [n=0] [18:41:41.581] getGlobalsAndPackagesXApply() ... DONE [18:41:41.582] Number of futures (= number of chunks): 1 [18:41:41.582] Launching 1 futures (chunks) ... [18:41:41.582] Chunk #1 of 1 ... [18:41:41.582] - Finding globals in 'X' for chunk #1 ... [18:41:41.583] getGlobalsAndPackages() ... [18:41:41.583] Searching for globals... [18:41:41.583] [18:41:41.583] Searching for globals ... DONE [18:41:41.584] - globals: [0] [18:41:41.584] getGlobalsAndPackages() ... DONE [18:41:41.584] + additional globals found: [n=0] [18:41:41.584] + additional namespaces needed: [n=0] [18:41:41.584] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.585] - seeds: [18:41:41.585] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.585] getGlobalsAndPackages() ... [18:41:41.585] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.585] Resolving globals: FALSE [18:41:41.586] Tweak future expression to call with '...' arguments ... [18:41:41.586] { [18:41:41.586] do.call(function(...) { [18:41:41.586] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.586] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.586] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.586] on.exit(options(oopts), add = TRUE) [18:41:41.586] } [18:41:41.586] { [18:41:41.586] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.586] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.586] ...future.FUN(...future.X_jj, ...) [18:41:41.586] }) [18:41:41.586] } [18:41:41.586] }, args = future.call.arguments) [18:41:41.586] } [18:41:41.586] Tweak future expression to call with '...' arguments ... DONE [18:41:41.587] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.587] [18:41:41.588] getGlobalsAndPackages() ... DONE [18:41:41.588] run() for 'Future' ... [18:41:41.588] - state: 'created' [18:41:41.589] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.589] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.589] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.590] - Field: 'label' [18:41:41.590] - Field: 'local' [18:41:41.590] - Field: 'owner' [18:41:41.590] - Field: 'envir' [18:41:41.590] - Field: 'packages' [18:41:41.591] - Field: 'gc' [18:41:41.591] - Field: 'conditions' [18:41:41.591] - Field: 'expr' [18:41:41.591] - Field: 'uuid' [18:41:41.591] - Field: 'seed' [18:41:41.592] - Field: 'version' [18:41:41.592] - Field: 'result' [18:41:41.592] - Field: 'asynchronous' [18:41:41.592] - Field: 'calls' [18:41:41.592] - Field: 'globals' [18:41:41.593] - Field: 'stdout' [18:41:41.593] - Field: 'earlySignal' [18:41:41.593] - Field: 'lazy' [18:41:41.593] - Field: 'state' [18:41:41.593] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.594] - Launch lazy future ... [18:41:41.594] Packages needed by the future expression (n = 0): [18:41:41.594] Packages needed by future strategies (n = 0): [18:41:41.595] { [18:41:41.595] { [18:41:41.595] { [18:41:41.595] ...future.startTime <- base::Sys.time() [18:41:41.595] { [18:41:41.595] { [18:41:41.595] { [18:41:41.595] base::local({ [18:41:41.595] has_future <- base::requireNamespace("future", [18:41:41.595] quietly = TRUE) [18:41:41.595] if (has_future) { [18:41:41.595] ns <- base::getNamespace("future") [18:41:41.595] version <- ns[[".package"]][["version"]] [18:41:41.595] if (is.null(version)) [18:41:41.595] version <- utils::packageVersion("future") [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] version <- NULL [18:41:41.595] } [18:41:41.595] if (!has_future || version < "1.8.0") { [18:41:41.595] info <- base::c(r_version = base::gsub("R version ", [18:41:41.595] "", base::R.version$version.string), [18:41:41.595] platform = base::sprintf("%s (%s-bit)", [18:41:41.595] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.595] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.595] "release", "version")], collapse = " "), [18:41:41.595] hostname = base::Sys.info()[["nodename"]]) [18:41:41.595] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.595] info) [18:41:41.595] info <- base::paste(info, collapse = "; ") [18:41:41.595] if (!has_future) { [18:41:41.595] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.595] info) [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.595] info, version) [18:41:41.595] } [18:41:41.595] base::stop(msg) [18:41:41.595] } [18:41:41.595] }) [18:41:41.595] } [18:41:41.595] ...future.strategy.old <- future::plan("list") [18:41:41.595] options(future.plan = NULL) [18:41:41.595] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.595] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.595] } [18:41:41.595] ...future.workdir <- getwd() [18:41:41.595] } [18:41:41.595] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.595] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.595] } [18:41:41.595] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.595] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.595] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.595] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.595] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.595] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.595] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.595] base::names(...future.oldOptions)) [18:41:41.595] } [18:41:41.595] if (FALSE) { [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] if (TRUE) { [18:41:41.595] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.595] open = "w") [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.595] windows = "NUL", "/dev/null"), open = "w") [18:41:41.595] } [18:41:41.595] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.595] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.595] base::sink(type = "output", split = FALSE) [18:41:41.595] base::close(...future.stdout) [18:41:41.595] }, add = TRUE) [18:41:41.595] } [18:41:41.595] ...future.frame <- base::sys.nframe() [18:41:41.595] ...future.conditions <- base::list() [18:41:41.595] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.595] if (FALSE) { [18:41:41.595] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.595] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.595] } [18:41:41.595] ...future.result <- base::tryCatch({ [18:41:41.595] base::withCallingHandlers({ [18:41:41.595] ...future.value <- base::withVisible(base::local({ [18:41:41.595] do.call(function(...) { [18:41:41.595] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.595] if (!identical(...future.globals.maxSize.org, [18:41:41.595] ...future.globals.maxSize)) { [18:41:41.595] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.595] on.exit(options(oopts), add = TRUE) [18:41:41.595] } [18:41:41.595] { [18:41:41.595] lapply(seq_along(...future.elements_ii), [18:41:41.595] FUN = function(jj) { [18:41:41.595] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.595] ...future.FUN(...future.X_jj, ...) [18:41:41.595] }) [18:41:41.595] } [18:41:41.595] }, args = future.call.arguments) [18:41:41.595] })) [18:41:41.595] future::FutureResult(value = ...future.value$value, [18:41:41.595] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.595] ...future.rng), globalenv = if (FALSE) [18:41:41.595] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.595] ...future.globalenv.names)) [18:41:41.595] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.595] }, condition = base::local({ [18:41:41.595] c <- base::c [18:41:41.595] inherits <- base::inherits [18:41:41.595] invokeRestart <- base::invokeRestart [18:41:41.595] length <- base::length [18:41:41.595] list <- base::list [18:41:41.595] seq.int <- base::seq.int [18:41:41.595] signalCondition <- base::signalCondition [18:41:41.595] sys.calls <- base::sys.calls [18:41:41.595] `[[` <- base::`[[` [18:41:41.595] `+` <- base::`+` [18:41:41.595] `<<-` <- base::`<<-` [18:41:41.595] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.595] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.595] 3L)] [18:41:41.595] } [18:41:41.595] function(cond) { [18:41:41.595] is_error <- inherits(cond, "error") [18:41:41.595] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.595] NULL) [18:41:41.595] if (is_error) { [18:41:41.595] sessionInformation <- function() { [18:41:41.595] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.595] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.595] search = base::search(), system = base::Sys.info()) [18:41:41.595] } [18:41:41.595] ...future.conditions[[length(...future.conditions) + [18:41:41.595] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.595] cond$call), session = sessionInformation(), [18:41:41.595] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.595] signalCondition(cond) [18:41:41.595] } [18:41:41.595] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.595] "immediateCondition"))) { [18:41:41.595] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.595] ...future.conditions[[length(...future.conditions) + [18:41:41.595] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.595] if (TRUE && !signal) { [18:41:41.595] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.595] { [18:41:41.595] inherits <- base::inherits [18:41:41.595] invokeRestart <- base::invokeRestart [18:41:41.595] is.null <- base::is.null [18:41:41.595] muffled <- FALSE [18:41:41.595] if (inherits(cond, "message")) { [18:41:41.595] muffled <- grepl(pattern, "muffleMessage") [18:41:41.595] if (muffled) [18:41:41.595] invokeRestart("muffleMessage") [18:41:41.595] } [18:41:41.595] else if (inherits(cond, "warning")) { [18:41:41.595] muffled <- grepl(pattern, "muffleWarning") [18:41:41.595] if (muffled) [18:41:41.595] invokeRestart("muffleWarning") [18:41:41.595] } [18:41:41.595] else if (inherits(cond, "condition")) { [18:41:41.595] if (!is.null(pattern)) { [18:41:41.595] computeRestarts <- base::computeRestarts [18:41:41.595] grepl <- base::grepl [18:41:41.595] restarts <- computeRestarts(cond) [18:41:41.595] for (restart in restarts) { [18:41:41.595] name <- restart$name [18:41:41.595] if (is.null(name)) [18:41:41.595] next [18:41:41.595] if (!grepl(pattern, name)) [18:41:41.595] next [18:41:41.595] invokeRestart(restart) [18:41:41.595] muffled <- TRUE [18:41:41.595] break [18:41:41.595] } [18:41:41.595] } [18:41:41.595] } [18:41:41.595] invisible(muffled) [18:41:41.595] } [18:41:41.595] muffleCondition(cond, pattern = "^muffle") [18:41:41.595] } [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] if (TRUE) { [18:41:41.595] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.595] { [18:41:41.595] inherits <- base::inherits [18:41:41.595] invokeRestart <- base::invokeRestart [18:41:41.595] is.null <- base::is.null [18:41:41.595] muffled <- FALSE [18:41:41.595] if (inherits(cond, "message")) { [18:41:41.595] muffled <- grepl(pattern, "muffleMessage") [18:41:41.595] if (muffled) [18:41:41.595] invokeRestart("muffleMessage") [18:41:41.595] } [18:41:41.595] else if (inherits(cond, "warning")) { [18:41:41.595] muffled <- grepl(pattern, "muffleWarning") [18:41:41.595] if (muffled) [18:41:41.595] invokeRestart("muffleWarning") [18:41:41.595] } [18:41:41.595] else if (inherits(cond, "condition")) { [18:41:41.595] if (!is.null(pattern)) { [18:41:41.595] computeRestarts <- base::computeRestarts [18:41:41.595] grepl <- base::grepl [18:41:41.595] restarts <- computeRestarts(cond) [18:41:41.595] for (restart in restarts) { [18:41:41.595] name <- restart$name [18:41:41.595] if (is.null(name)) [18:41:41.595] next [18:41:41.595] if (!grepl(pattern, name)) [18:41:41.595] next [18:41:41.595] invokeRestart(restart) [18:41:41.595] muffled <- TRUE [18:41:41.595] break [18:41:41.595] } [18:41:41.595] } [18:41:41.595] } [18:41:41.595] invisible(muffled) [18:41:41.595] } [18:41:41.595] muffleCondition(cond, pattern = "^muffle") [18:41:41.595] } [18:41:41.595] } [18:41:41.595] } [18:41:41.595] })) [18:41:41.595] }, error = function(ex) { [18:41:41.595] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.595] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.595] ...future.rng), started = ...future.startTime, [18:41:41.595] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.595] version = "1.8"), class = "FutureResult") [18:41:41.595] }, finally = { [18:41:41.595] if (!identical(...future.workdir, getwd())) [18:41:41.595] setwd(...future.workdir) [18:41:41.595] { [18:41:41.595] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.595] ...future.oldOptions$nwarnings <- NULL [18:41:41.595] } [18:41:41.595] base::options(...future.oldOptions) [18:41:41.595] if (.Platform$OS.type == "windows") { [18:41:41.595] old_names <- names(...future.oldEnvVars) [18:41:41.595] envs <- base::Sys.getenv() [18:41:41.595] names <- names(envs) [18:41:41.595] common <- intersect(names, old_names) [18:41:41.595] added <- setdiff(names, old_names) [18:41:41.595] removed <- setdiff(old_names, names) [18:41:41.595] changed <- common[...future.oldEnvVars[common] != [18:41:41.595] envs[common]] [18:41:41.595] NAMES <- toupper(changed) [18:41:41.595] args <- list() [18:41:41.595] for (kk in seq_along(NAMES)) { [18:41:41.595] name <- changed[[kk]] [18:41:41.595] NAME <- NAMES[[kk]] [18:41:41.595] if (name != NAME && is.element(NAME, old_names)) [18:41:41.595] next [18:41:41.595] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.595] } [18:41:41.595] NAMES <- toupper(added) [18:41:41.595] for (kk in seq_along(NAMES)) { [18:41:41.595] name <- added[[kk]] [18:41:41.595] NAME <- NAMES[[kk]] [18:41:41.595] if (name != NAME && is.element(NAME, old_names)) [18:41:41.595] next [18:41:41.595] args[[name]] <- "" [18:41:41.595] } [18:41:41.595] NAMES <- toupper(removed) [18:41:41.595] for (kk in seq_along(NAMES)) { [18:41:41.595] name <- removed[[kk]] [18:41:41.595] NAME <- NAMES[[kk]] [18:41:41.595] if (name != NAME && is.element(NAME, old_names)) [18:41:41.595] next [18:41:41.595] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.595] } [18:41:41.595] if (length(args) > 0) [18:41:41.595] base::do.call(base::Sys.setenv, args = args) [18:41:41.595] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.595] } [18:41:41.595] { [18:41:41.595] if (base::length(...future.futureOptionsAdded) > [18:41:41.595] 0L) { [18:41:41.595] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.595] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.595] base::options(opts) [18:41:41.595] } [18:41:41.595] { [18:41:41.595] { [18:41:41.595] NULL [18:41:41.595] RNGkind("Mersenne-Twister") [18:41:41.595] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.595] inherits = FALSE) [18:41:41.595] } [18:41:41.595] options(future.plan = NULL) [18:41:41.595] if (is.na(NA_character_)) [18:41:41.595] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.595] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.595] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.595] .init = FALSE) [18:41:41.595] } [18:41:41.595] } [18:41:41.595] } [18:41:41.595] }) [18:41:41.595] if (TRUE) { [18:41:41.595] base::sink(type = "output", split = FALSE) [18:41:41.595] if (TRUE) { [18:41:41.595] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.595] } [18:41:41.595] else { [18:41:41.595] ...future.result["stdout"] <- base::list(NULL) [18:41:41.595] } [18:41:41.595] base::close(...future.stdout) [18:41:41.595] ...future.stdout <- NULL [18:41:41.595] } [18:41:41.595] ...future.result$conditions <- ...future.conditions [18:41:41.595] ...future.result$finished <- base::Sys.time() [18:41:41.595] ...future.result [18:41:41.595] } [18:41:41.599] assign_globals() ... [18:41:41.600] List of 5 [18:41:41.600] $ ...future.FUN :function (x, ...) [18:41:41.600] $ future.call.arguments : list() [18:41:41.600] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.600] $ ...future.elements_ii :List of 6 [18:41:41.600] ..$ a1: int 1 [18:41:41.600] ..$ a2: int 2 [18:41:41.600] ..$ b1: int 2 [18:41:41.600] ..$ b2: int 3 [18:41:41.600] ..$ c1: int 3 [18:41:41.600] ..$ c2: int 4 [18:41:41.600] $ ...future.seeds_ii : NULL [18:41:41.600] $ ...future.globals.maxSize: NULL [18:41:41.600] - attr(*, "where")=List of 5 [18:41:41.600] ..$ ...future.FUN : [18:41:41.600] ..$ future.call.arguments : [18:41:41.600] ..$ ...future.elements_ii : [18:41:41.600] ..$ ...future.seeds_ii : [18:41:41.600] ..$ ...future.globals.maxSize: [18:41:41.600] - attr(*, "resolved")= logi FALSE [18:41:41.600] - attr(*, "total_size")= num 5182 [18:41:41.600] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.600] - attr(*, "already-done")= logi TRUE [18:41:41.607] - copied '...future.FUN' to environment [18:41:41.608] - copied 'future.call.arguments' to environment [18:41:41.608] - copied '...future.elements_ii' to environment [18:41:41.610] - copied '...future.seeds_ii' to environment [18:41:41.610] - copied '...future.globals.maxSize' to environment [18:41:41.610] assign_globals() ... done [18:41:41.611] plan(): Setting new future strategy stack: [18:41:41.611] List of future strategies: [18:41:41.611] 1. sequential: [18:41:41.611] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.611] - tweaked: FALSE [18:41:41.611] - call: NULL [18:41:41.611] plan(): nbrOfWorkers() = 1 [18:41:41.613] plan(): Setting new future strategy stack: [18:41:41.613] List of future strategies: [18:41:41.613] 1. sequential: [18:41:41.613] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.613] - tweaked: FALSE [18:41:41.613] - call: plan(strategy) [18:41:41.614] plan(): nbrOfWorkers() = 1 [18:41:41.614] SequentialFuture started (and completed) [18:41:41.614] - Launch lazy future ... done [18:41:41.615] run() for 'SequentialFuture' ... done [18:41:41.615] Created future: [18:41:41.615] SequentialFuture: [18:41:41.615] Label: 'future_sapply-1' [18:41:41.615] Expression: [18:41:41.615] { [18:41:41.615] do.call(function(...) { [18:41:41.615] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.615] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.615] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.615] on.exit(options(oopts), add = TRUE) [18:41:41.615] } [18:41:41.615] { [18:41:41.615] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.615] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.615] ...future.FUN(...future.X_jj, ...) [18:41:41.615] }) [18:41:41.615] } [18:41:41.615] }, args = future.call.arguments) [18:41:41.615] } [18:41:41.615] Lazy evaluation: FALSE [18:41:41.615] Asynchronous evaluation: FALSE [18:41:41.615] Local evaluation: TRUE [18:41:41.615] Environment: R_GlobalEnv [18:41:41.615] Capture standard output: TRUE [18:41:41.615] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.615] Globals: 5 objects totaling 625 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.615] Packages: [18:41:41.615] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.615] Resolved: TRUE [18:41:41.615] Value: 282 bytes of class 'list' [18:41:41.615] Early signaling: FALSE [18:41:41.615] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.615] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.616] Chunk #1 of 1 ... DONE [18:41:41.616] Launching 1 futures (chunks) ... DONE [18:41:41.617] Resolving 1 futures (chunks) ... [18:41:41.617] resolve() on list ... [18:41:41.617] recursive: 0 [18:41:41.617] length: 1 [18:41:41.617] [18:41:41.617] resolved() for 'SequentialFuture' ... [18:41:41.618] - state: 'finished' [18:41:41.618] - run: TRUE [18:41:41.618] - result: 'FutureResult' [18:41:41.618] resolved() for 'SequentialFuture' ... done [18:41:41.618] Future #1 [18:41:41.619] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.619] - nx: 1 [18:41:41.619] - relay: TRUE [18:41:41.619] - stdout: TRUE [18:41:41.619] - signal: TRUE [18:41:41.619] - resignal: FALSE [18:41:41.619] - force: TRUE [18:41:41.620] - relayed: [n=1] FALSE [18:41:41.620] - queued futures: [n=1] FALSE [18:41:41.620] - until=1 [18:41:41.620] - relaying element #1 [18:41:41.620] - relayed: [n=1] TRUE [18:41:41.621] - queued futures: [n=1] TRUE [18:41:41.621] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.621] length: 0 (resolved future 1) [18:41:41.621] Relaying remaining futures [18:41:41.621] signalConditionsASAP(NULL, pos=0) ... [18:41:41.621] - nx: 1 [18:41:41.622] - relay: TRUE [18:41:41.622] - stdout: TRUE [18:41:41.622] - signal: TRUE [18:41:41.622] - resignal: FALSE [18:41:41.622] - force: TRUE [18:41:41.622] - relayed: [n=1] TRUE [18:41:41.622] - queued futures: [n=1] TRUE - flush all [18:41:41.623] - relayed: [n=1] TRUE [18:41:41.623] - queued futures: [n=1] TRUE [18:41:41.623] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.623] resolve() on list ... DONE [18:41:41.623] - Number of value chunks collected: 1 [18:41:41.624] Resolving 1 futures (chunks) ... DONE [18:41:41.624] Reducing values from 1 chunks ... [18:41:41.624] - Number of values collected after concatenation: 6 [18:41:41.624] - Number of values expected: 6 [18:41:41.624] Reducing values from 1 chunks ... DONE [18:41:41.624] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y1:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y2:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 [18:41:41.638] future_lapply() ... [18:41:41.639] Number of chunks: 1 [18:41:41.640] getGlobalsAndPackagesXApply() ... [18:41:41.640] - future.globals: TRUE [18:41:41.640] getGlobalsAndPackages() ... [18:41:41.640] Searching for globals... [18:41:41.642] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:41.642] Searching for globals ... DONE [18:41:41.642] Resolving globals: FALSE [18:41:41.643] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:41.643] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:41.644] - globals: [1] 'FUN' [18:41:41.644] [18:41:41.644] getGlobalsAndPackages() ... DONE [18:41:41.644] - globals found/used: [n=1] 'FUN' [18:41:41.644] - needed namespaces: [n=0] [18:41:41.645] Finding globals ... DONE [18:41:41.645] - use_args: TRUE [18:41:41.645] - Getting '...' globals ... [18:41:41.645] resolve() on list ... [18:41:41.646] recursive: 0 [18:41:41.646] length: 1 [18:41:41.646] elements: '...' [18:41:41.646] length: 0 (resolved future 1) [18:41:41.646] resolve() on list ... DONE [18:41:41.646] - '...' content: [n=0] [18:41:41.647] List of 1 [18:41:41.647] $ ...: list() [18:41:41.647] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.647] - attr(*, "where")=List of 1 [18:41:41.647] ..$ ...: [18:41:41.647] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.647] - attr(*, "resolved")= logi TRUE [18:41:41.647] - attr(*, "total_size")= num NA [18:41:41.650] - Getting '...' globals ... DONE [18:41:41.650] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.651] List of 2 [18:41:41.651] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:41.651] $ ... : list() [18:41:41.651] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.651] - attr(*, "where")=List of 2 [18:41:41.651] ..$ ...future.FUN: [18:41:41.651] ..$ ... : [18:41:41.651] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.651] - attr(*, "resolved")= logi FALSE [18:41:41.651] - attr(*, "total_size")= int 6664 [18:41:41.655] Packages to be attached in all futures: [n=0] [18:41:41.655] getGlobalsAndPackagesXApply() ... DONE [18:41:41.656] Number of futures (= number of chunks): 1 [18:41:41.656] Launching 1 futures (chunks) ... [18:41:41.656] Chunk #1 of 1 ... [18:41:41.656] - Finding globals in 'X' for chunk #1 ... [18:41:41.656] getGlobalsAndPackages() ... [18:41:41.656] Searching for globals... [18:41:41.657] [18:41:41.658] Searching for globals ... DONE [18:41:41.659] - globals: [0] [18:41:41.659] getGlobalsAndPackages() ... DONE [18:41:41.659] + additional globals found: [n=0] [18:41:41.659] + additional namespaces needed: [n=0] [18:41:41.659] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.659] - seeds: [18:41:41.660] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.660] getGlobalsAndPackages() ... [18:41:41.660] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.660] Resolving globals: FALSE [18:41:41.661] Tweak future expression to call with '...' arguments ... [18:41:41.661] { [18:41:41.661] do.call(function(...) { [18:41:41.661] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.661] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.661] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.661] on.exit(options(oopts), add = TRUE) [18:41:41.661] } [18:41:41.661] { [18:41:41.661] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.661] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.661] ...future.FUN(...future.X_jj, ...) [18:41:41.661] }) [18:41:41.661] } [18:41:41.661] }, args = future.call.arguments) [18:41:41.661] } [18:41:41.662] Tweak future expression to call with '...' arguments ... DONE [18:41:41.662] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.663] [18:41:41.663] getGlobalsAndPackages() ... DONE [18:41:41.663] run() for 'Future' ... [18:41:41.664] - state: 'created' [18:41:41.664] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.665] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.665] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.665] - Field: 'label' [18:41:41.666] - Field: 'local' [18:41:41.666] - Field: 'owner' [18:41:41.666] - Field: 'envir' [18:41:41.666] - Field: 'packages' [18:41:41.667] - Field: 'gc' [18:41:41.667] - Field: 'conditions' [18:41:41.667] - Field: 'expr' [18:41:41.668] - Field: 'uuid' [18:41:41.668] - Field: 'seed' [18:41:41.668] - Field: 'version' [18:41:41.669] - Field: 'result' [18:41:41.669] - Field: 'asynchronous' [18:41:41.669] - Field: 'calls' [18:41:41.670] - Field: 'globals' [18:41:41.670] - Field: 'stdout' [18:41:41.670] - Field: 'earlySignal' [18:41:41.671] - Field: 'lazy' [18:41:41.671] - Field: 'state' [18:41:41.671] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.672] - Launch lazy future ... [18:41:41.672] Packages needed by the future expression (n = 0): [18:41:41.672] Packages needed by future strategies (n = 0): [18:41:41.673] { [18:41:41.673] { [18:41:41.673] { [18:41:41.673] ...future.startTime <- base::Sys.time() [18:41:41.673] { [18:41:41.673] { [18:41:41.673] { [18:41:41.673] base::local({ [18:41:41.673] has_future <- base::requireNamespace("future", [18:41:41.673] quietly = TRUE) [18:41:41.673] if (has_future) { [18:41:41.673] ns <- base::getNamespace("future") [18:41:41.673] version <- ns[[".package"]][["version"]] [18:41:41.673] if (is.null(version)) [18:41:41.673] version <- utils::packageVersion("future") [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] version <- NULL [18:41:41.673] } [18:41:41.673] if (!has_future || version < "1.8.0") { [18:41:41.673] info <- base::c(r_version = base::gsub("R version ", [18:41:41.673] "", base::R.version$version.string), [18:41:41.673] platform = base::sprintf("%s (%s-bit)", [18:41:41.673] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.673] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.673] "release", "version")], collapse = " "), [18:41:41.673] hostname = base::Sys.info()[["nodename"]]) [18:41:41.673] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.673] info) [18:41:41.673] info <- base::paste(info, collapse = "; ") [18:41:41.673] if (!has_future) { [18:41:41.673] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.673] info) [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.673] info, version) [18:41:41.673] } [18:41:41.673] base::stop(msg) [18:41:41.673] } [18:41:41.673] }) [18:41:41.673] } [18:41:41.673] ...future.strategy.old <- future::plan("list") [18:41:41.673] options(future.plan = NULL) [18:41:41.673] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.673] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.673] } [18:41:41.673] ...future.workdir <- getwd() [18:41:41.673] } [18:41:41.673] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.673] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.673] } [18:41:41.673] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.673] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.673] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.673] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.673] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.673] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.673] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.673] base::names(...future.oldOptions)) [18:41:41.673] } [18:41:41.673] if (FALSE) { [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] if (TRUE) { [18:41:41.673] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.673] open = "w") [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.673] windows = "NUL", "/dev/null"), open = "w") [18:41:41.673] } [18:41:41.673] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.673] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.673] base::sink(type = "output", split = FALSE) [18:41:41.673] base::close(...future.stdout) [18:41:41.673] }, add = TRUE) [18:41:41.673] } [18:41:41.673] ...future.frame <- base::sys.nframe() [18:41:41.673] ...future.conditions <- base::list() [18:41:41.673] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.673] if (FALSE) { [18:41:41.673] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.673] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.673] } [18:41:41.673] ...future.result <- base::tryCatch({ [18:41:41.673] base::withCallingHandlers({ [18:41:41.673] ...future.value <- base::withVisible(base::local({ [18:41:41.673] do.call(function(...) { [18:41:41.673] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.673] if (!identical(...future.globals.maxSize.org, [18:41:41.673] ...future.globals.maxSize)) { [18:41:41.673] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.673] on.exit(options(oopts), add = TRUE) [18:41:41.673] } [18:41:41.673] { [18:41:41.673] lapply(seq_along(...future.elements_ii), [18:41:41.673] FUN = function(jj) { [18:41:41.673] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.673] ...future.FUN(...future.X_jj, ...) [18:41:41.673] }) [18:41:41.673] } [18:41:41.673] }, args = future.call.arguments) [18:41:41.673] })) [18:41:41.673] future::FutureResult(value = ...future.value$value, [18:41:41.673] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.673] ...future.rng), globalenv = if (FALSE) [18:41:41.673] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.673] ...future.globalenv.names)) [18:41:41.673] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.673] }, condition = base::local({ [18:41:41.673] c <- base::c [18:41:41.673] inherits <- base::inherits [18:41:41.673] invokeRestart <- base::invokeRestart [18:41:41.673] length <- base::length [18:41:41.673] list <- base::list [18:41:41.673] seq.int <- base::seq.int [18:41:41.673] signalCondition <- base::signalCondition [18:41:41.673] sys.calls <- base::sys.calls [18:41:41.673] `[[` <- base::`[[` [18:41:41.673] `+` <- base::`+` [18:41:41.673] `<<-` <- base::`<<-` [18:41:41.673] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.673] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.673] 3L)] [18:41:41.673] } [18:41:41.673] function(cond) { [18:41:41.673] is_error <- inherits(cond, "error") [18:41:41.673] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.673] NULL) [18:41:41.673] if (is_error) { [18:41:41.673] sessionInformation <- function() { [18:41:41.673] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.673] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.673] search = base::search(), system = base::Sys.info()) [18:41:41.673] } [18:41:41.673] ...future.conditions[[length(...future.conditions) + [18:41:41.673] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.673] cond$call), session = sessionInformation(), [18:41:41.673] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.673] signalCondition(cond) [18:41:41.673] } [18:41:41.673] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.673] "immediateCondition"))) { [18:41:41.673] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.673] ...future.conditions[[length(...future.conditions) + [18:41:41.673] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.673] if (TRUE && !signal) { [18:41:41.673] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.673] { [18:41:41.673] inherits <- base::inherits [18:41:41.673] invokeRestart <- base::invokeRestart [18:41:41.673] is.null <- base::is.null [18:41:41.673] muffled <- FALSE [18:41:41.673] if (inherits(cond, "message")) { [18:41:41.673] muffled <- grepl(pattern, "muffleMessage") [18:41:41.673] if (muffled) [18:41:41.673] invokeRestart("muffleMessage") [18:41:41.673] } [18:41:41.673] else if (inherits(cond, "warning")) { [18:41:41.673] muffled <- grepl(pattern, "muffleWarning") [18:41:41.673] if (muffled) [18:41:41.673] invokeRestart("muffleWarning") [18:41:41.673] } [18:41:41.673] else if (inherits(cond, "condition")) { [18:41:41.673] if (!is.null(pattern)) { [18:41:41.673] computeRestarts <- base::computeRestarts [18:41:41.673] grepl <- base::grepl [18:41:41.673] restarts <- computeRestarts(cond) [18:41:41.673] for (restart in restarts) { [18:41:41.673] name <- restart$name [18:41:41.673] if (is.null(name)) [18:41:41.673] next [18:41:41.673] if (!grepl(pattern, name)) [18:41:41.673] next [18:41:41.673] invokeRestart(restart) [18:41:41.673] muffled <- TRUE [18:41:41.673] break [18:41:41.673] } [18:41:41.673] } [18:41:41.673] } [18:41:41.673] invisible(muffled) [18:41:41.673] } [18:41:41.673] muffleCondition(cond, pattern = "^muffle") [18:41:41.673] } [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] if (TRUE) { [18:41:41.673] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.673] { [18:41:41.673] inherits <- base::inherits [18:41:41.673] invokeRestart <- base::invokeRestart [18:41:41.673] is.null <- base::is.null [18:41:41.673] muffled <- FALSE [18:41:41.673] if (inherits(cond, "message")) { [18:41:41.673] muffled <- grepl(pattern, "muffleMessage") [18:41:41.673] if (muffled) [18:41:41.673] invokeRestart("muffleMessage") [18:41:41.673] } [18:41:41.673] else if (inherits(cond, "warning")) { [18:41:41.673] muffled <- grepl(pattern, "muffleWarning") [18:41:41.673] if (muffled) [18:41:41.673] invokeRestart("muffleWarning") [18:41:41.673] } [18:41:41.673] else if (inherits(cond, "condition")) { [18:41:41.673] if (!is.null(pattern)) { [18:41:41.673] computeRestarts <- base::computeRestarts [18:41:41.673] grepl <- base::grepl [18:41:41.673] restarts <- computeRestarts(cond) [18:41:41.673] for (restart in restarts) { [18:41:41.673] name <- restart$name [18:41:41.673] if (is.null(name)) [18:41:41.673] next [18:41:41.673] if (!grepl(pattern, name)) [18:41:41.673] next [18:41:41.673] invokeRestart(restart) [18:41:41.673] muffled <- TRUE [18:41:41.673] break [18:41:41.673] } [18:41:41.673] } [18:41:41.673] } [18:41:41.673] invisible(muffled) [18:41:41.673] } [18:41:41.673] muffleCondition(cond, pattern = "^muffle") [18:41:41.673] } [18:41:41.673] } [18:41:41.673] } [18:41:41.673] })) [18:41:41.673] }, error = function(ex) { [18:41:41.673] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.673] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.673] ...future.rng), started = ...future.startTime, [18:41:41.673] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.673] version = "1.8"), class = "FutureResult") [18:41:41.673] }, finally = { [18:41:41.673] if (!identical(...future.workdir, getwd())) [18:41:41.673] setwd(...future.workdir) [18:41:41.673] { [18:41:41.673] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.673] ...future.oldOptions$nwarnings <- NULL [18:41:41.673] } [18:41:41.673] base::options(...future.oldOptions) [18:41:41.673] if (.Platform$OS.type == "windows") { [18:41:41.673] old_names <- names(...future.oldEnvVars) [18:41:41.673] envs <- base::Sys.getenv() [18:41:41.673] names <- names(envs) [18:41:41.673] common <- intersect(names, old_names) [18:41:41.673] added <- setdiff(names, old_names) [18:41:41.673] removed <- setdiff(old_names, names) [18:41:41.673] changed <- common[...future.oldEnvVars[common] != [18:41:41.673] envs[common]] [18:41:41.673] NAMES <- toupper(changed) [18:41:41.673] args <- list() [18:41:41.673] for (kk in seq_along(NAMES)) { [18:41:41.673] name <- changed[[kk]] [18:41:41.673] NAME <- NAMES[[kk]] [18:41:41.673] if (name != NAME && is.element(NAME, old_names)) [18:41:41.673] next [18:41:41.673] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.673] } [18:41:41.673] NAMES <- toupper(added) [18:41:41.673] for (kk in seq_along(NAMES)) { [18:41:41.673] name <- added[[kk]] [18:41:41.673] NAME <- NAMES[[kk]] [18:41:41.673] if (name != NAME && is.element(NAME, old_names)) [18:41:41.673] next [18:41:41.673] args[[name]] <- "" [18:41:41.673] } [18:41:41.673] NAMES <- toupper(removed) [18:41:41.673] for (kk in seq_along(NAMES)) { [18:41:41.673] name <- removed[[kk]] [18:41:41.673] NAME <- NAMES[[kk]] [18:41:41.673] if (name != NAME && is.element(NAME, old_names)) [18:41:41.673] next [18:41:41.673] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.673] } [18:41:41.673] if (length(args) > 0) [18:41:41.673] base::do.call(base::Sys.setenv, args = args) [18:41:41.673] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.673] } [18:41:41.673] { [18:41:41.673] if (base::length(...future.futureOptionsAdded) > [18:41:41.673] 0L) { [18:41:41.673] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.673] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.673] base::options(opts) [18:41:41.673] } [18:41:41.673] { [18:41:41.673] { [18:41:41.673] NULL [18:41:41.673] RNGkind("Mersenne-Twister") [18:41:41.673] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.673] inherits = FALSE) [18:41:41.673] } [18:41:41.673] options(future.plan = NULL) [18:41:41.673] if (is.na(NA_character_)) [18:41:41.673] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.673] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.673] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.673] .init = FALSE) [18:41:41.673] } [18:41:41.673] } [18:41:41.673] } [18:41:41.673] }) [18:41:41.673] if (TRUE) { [18:41:41.673] base::sink(type = "output", split = FALSE) [18:41:41.673] if (TRUE) { [18:41:41.673] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.673] } [18:41:41.673] else { [18:41:41.673] ...future.result["stdout"] <- base::list(NULL) [18:41:41.673] } [18:41:41.673] base::close(...future.stdout) [18:41:41.673] ...future.stdout <- NULL [18:41:41.673] } [18:41:41.673] ...future.result$conditions <- ...future.conditions [18:41:41.673] ...future.result$finished <- base::Sys.time() [18:41:41.673] ...future.result [18:41:41.673] } [18:41:41.679] assign_globals() ... [18:41:41.679] List of 5 [18:41:41.679] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:41.679] $ future.call.arguments : list() [18:41:41.679] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.679] $ ...future.elements_ii :List of 6 [18:41:41.679] ..$ a1: int 1 [18:41:41.679] ..$ a2: int 2 [18:41:41.679] ..$ b1: int 2 [18:41:41.679] ..$ b2: int 3 [18:41:41.679] ..$ c1: int 3 [18:41:41.679] ..$ c2: int 4 [18:41:41.679] $ ...future.seeds_ii : NULL [18:41:41.679] $ ...future.globals.maxSize: NULL [18:41:41.679] - attr(*, "where")=List of 5 [18:41:41.679] ..$ ...future.FUN : [18:41:41.679] ..$ future.call.arguments : [18:41:41.679] ..$ ...future.elements_ii : [18:41:41.679] ..$ ...future.seeds_ii : [18:41:41.679] ..$ ...future.globals.maxSize: [18:41:41.679] - attr(*, "resolved")= logi FALSE [18:41:41.679] - attr(*, "total_size")= num 6664 [18:41:41.679] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.679] - attr(*, "already-done")= logi TRUE [18:41:41.690] - reassign environment for '...future.FUN' [18:41:41.690] - copied '...future.FUN' to environment [18:41:41.691] - copied 'future.call.arguments' to environment [18:41:41.691] - copied '...future.elements_ii' to environment [18:41:41.691] - copied '...future.seeds_ii' to environment [18:41:41.691] - copied '...future.globals.maxSize' to environment [18:41:41.691] assign_globals() ... done [18:41:41.692] plan(): Setting new future strategy stack: [18:41:41.692] List of future strategies: [18:41:41.692] 1. sequential: [18:41:41.692] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.692] - tweaked: FALSE [18:41:41.692] - call: NULL [18:41:41.693] plan(): nbrOfWorkers() = 1 [18:41:41.694] plan(): Setting new future strategy stack: [18:41:41.694] List of future strategies: [18:41:41.694] 1. sequential: [18:41:41.694] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.694] - tweaked: FALSE [18:41:41.694] - call: plan(strategy) [18:41:41.695] plan(): nbrOfWorkers() = 1 [18:41:41.697] SequentialFuture started (and completed) [18:41:41.698] - Launch lazy future ... done [18:41:41.698] run() for 'SequentialFuture' ... done [18:41:41.698] Created future: [18:41:41.698] SequentialFuture: [18:41:41.698] Label: 'future_sapply-1' [18:41:41.698] Expression: [18:41:41.698] { [18:41:41.698] do.call(function(...) { [18:41:41.698] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.698] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.698] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.698] on.exit(options(oopts), add = TRUE) [18:41:41.698] } [18:41:41.698] { [18:41:41.698] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.698] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.698] ...future.FUN(...future.X_jj, ...) [18:41:41.698] }) [18:41:41.698] } [18:41:41.698] }, args = future.call.arguments) [18:41:41.698] } [18:41:41.698] Lazy evaluation: FALSE [18:41:41.698] Asynchronous evaluation: FALSE [18:41:41.698] Local evaluation: TRUE [18:41:41.698] Environment: R_GlobalEnv [18:41:41.698] Capture standard output: TRUE [18:41:41.698] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.698] Globals: 5 objects totaling 1.10 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.698] Packages: [18:41:41.698] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.698] Resolved: TRUE [18:41:41.698] Value: 978 bytes of class 'list' [18:41:41.698] Early signaling: FALSE [18:41:41.698] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.698] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.699] Chunk #1 of 1 ... DONE [18:41:41.700] Launching 1 futures (chunks) ... DONE [18:41:41.700] Resolving 1 futures (chunks) ... [18:41:41.700] resolve() on list ... [18:41:41.700] recursive: 0 [18:41:41.700] length: 1 [18:41:41.700] [18:41:41.701] resolved() for 'SequentialFuture' ... [18:41:41.701] - state: 'finished' [18:41:41.701] - run: TRUE [18:41:41.701] - result: 'FutureResult' [18:41:41.701] resolved() for 'SequentialFuture' ... done [18:41:41.702] Future #1 [18:41:41.702] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.702] - nx: 1 [18:41:41.702] - relay: TRUE [18:41:41.702] - stdout: TRUE [18:41:41.703] - signal: TRUE [18:41:41.703] - resignal: FALSE [18:41:41.703] - force: TRUE [18:41:41.703] - relayed: [n=1] FALSE [18:41:41.703] - queued futures: [n=1] FALSE [18:41:41.703] - until=1 [18:41:41.704] - relaying element #1 [18:41:41.704] - relayed: [n=1] TRUE [18:41:41.704] - queued futures: [n=1] TRUE [18:41:41.704] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.704] length: 0 (resolved future 1) [18:41:41.705] Relaying remaining futures [18:41:41.705] signalConditionsASAP(NULL, pos=0) ... [18:41:41.705] - nx: 1 [18:41:41.705] - relay: TRUE [18:41:41.705] - stdout: TRUE [18:41:41.705] - signal: TRUE [18:41:41.706] - resignal: FALSE [18:41:41.706] - force: TRUE [18:41:41.706] - relayed: [n=1] TRUE [18:41:41.706] - queued futures: [n=1] TRUE - flush all [18:41:41.706] - relayed: [n=1] TRUE [18:41:41.706] - queued futures: [n=1] TRUE [18:41:41.707] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.707] resolve() on list ... DONE [18:41:41.707] - Number of value chunks collected: 1 [18:41:41.707] Resolving 1 futures (chunks) ... DONE [18:41:41.707] Reducing values from 1 chunks ... [18:41:41.707] - Number of values collected after concatenation: 6 [18:41:41.708] - Number of values expected: 6 [18:41:41.708] Reducing values from 1 chunks ... DONE [18:41:41.708] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y1:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y2:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... [18:41:41.723] future_lapply() ... [18:41:41.723] Number of chunks: 1 [18:41:41.724] getGlobalsAndPackagesXApply() ... [18:41:41.724] - future.globals: TRUE [18:41:41.724] getGlobalsAndPackages() ... [18:41:41.724] Searching for globals... [18:41:41.725] - globals found: [1] 'FUN' [18:41:41.726] Searching for globals ... DONE [18:41:41.726] Resolving globals: FALSE [18:41:41.726] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:41.727] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:41.727] - globals: [1] 'FUN' [18:41:41.727] [18:41:41.727] getGlobalsAndPackages() ... DONE [18:41:41.727] - globals found/used: [n=1] 'FUN' [18:41:41.728] - needed namespaces: [n=0] [18:41:41.728] Finding globals ... DONE [18:41:41.728] - use_args: TRUE [18:41:41.728] - Getting '...' globals ... [18:41:41.729] resolve() on list ... [18:41:41.729] recursive: 0 [18:41:41.729] length: 1 [18:41:41.729] elements: '...' [18:41:41.729] length: 0 (resolved future 1) [18:41:41.729] resolve() on list ... DONE [18:41:41.730] - '...' content: [n=0] [18:41:41.730] List of 1 [18:41:41.730] $ ...: list() [18:41:41.730] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.730] - attr(*, "where")=List of 1 [18:41:41.730] ..$ ...: [18:41:41.730] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.730] - attr(*, "resolved")= logi TRUE [18:41:41.730] - attr(*, "total_size")= num NA [18:41:41.733] - Getting '...' globals ... DONE [18:41:41.733] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.733] List of 2 [18:41:41.733] $ ...future.FUN:function (x) [18:41:41.733] $ ... : list() [18:41:41.733] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.733] - attr(*, "where")=List of 2 [18:41:41.733] ..$ ...future.FUN: [18:41:41.733] ..$ ... : [18:41:41.733] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.733] - attr(*, "resolved")= logi FALSE [18:41:41.733] - attr(*, "total_size")= int 4942 [18:41:41.736] Packages to be attached in all futures: [n=0] [18:41:41.736] getGlobalsAndPackagesXApply() ... DONE [18:41:41.737] Number of futures (= number of chunks): 1 [18:41:41.737] Launching 1 futures (chunks) ... [18:41:41.737] Chunk #1 of 1 ... [18:41:41.737] - Finding globals in 'X' for chunk #1 ... [18:41:41.737] getGlobalsAndPackages() ... [18:41:41.738] Searching for globals... [18:41:41.738] [18:41:41.738] Searching for globals ... DONE [18:41:41.739] - globals: [0] [18:41:41.739] getGlobalsAndPackages() ... DONE [18:41:41.739] + additional globals found: [n=0] [18:41:41.739] + additional namespaces needed: [n=0] [18:41:41.740] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.740] - seeds: [18:41:41.740] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.740] getGlobalsAndPackages() ... [18:41:41.741] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.741] Resolving globals: FALSE [18:41:41.741] Tweak future expression to call with '...' arguments ... [18:41:41.742] { [18:41:41.742] do.call(function(...) { [18:41:41.742] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.742] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.742] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.742] on.exit(options(oopts), add = TRUE) [18:41:41.742] } [18:41:41.742] { [18:41:41.742] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.742] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.742] ...future.FUN(...future.X_jj, ...) [18:41:41.742] }) [18:41:41.742] } [18:41:41.742] }, args = future.call.arguments) [18:41:41.742] } [18:41:41.742] Tweak future expression to call with '...' arguments ... DONE [18:41:41.743] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.743] [18:41:41.744] getGlobalsAndPackages() ... DONE [18:41:41.744] run() for 'Future' ... [18:41:41.744] - state: 'created' [18:41:41.745] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.745] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.746] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.746] - Field: 'label' [18:41:41.746] - Field: 'local' [18:41:41.747] - Field: 'owner' [18:41:41.747] - Field: 'envir' [18:41:41.747] - Field: 'packages' [18:41:41.749] - Field: 'gc' [18:41:41.750] - Field: 'conditions' [18:41:41.750] - Field: 'expr' [18:41:41.750] - Field: 'uuid' [18:41:41.750] - Field: 'seed' [18:41:41.751] - Field: 'version' [18:41:41.751] - Field: 'result' [18:41:41.751] - Field: 'asynchronous' [18:41:41.752] - Field: 'calls' [18:41:41.752] - Field: 'globals' [18:41:41.752] - Field: 'stdout' [18:41:41.752] - Field: 'earlySignal' [18:41:41.753] - Field: 'lazy' [18:41:41.753] - Field: 'state' [18:41:41.753] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.754] - Launch lazy future ... [18:41:41.754] Packages needed by the future expression (n = 0): [18:41:41.754] Packages needed by future strategies (n = 0): [18:41:41.755] { [18:41:41.755] { [18:41:41.755] { [18:41:41.755] ...future.startTime <- base::Sys.time() [18:41:41.755] { [18:41:41.755] { [18:41:41.755] { [18:41:41.755] base::local({ [18:41:41.755] has_future <- base::requireNamespace("future", [18:41:41.755] quietly = TRUE) [18:41:41.755] if (has_future) { [18:41:41.755] ns <- base::getNamespace("future") [18:41:41.755] version <- ns[[".package"]][["version"]] [18:41:41.755] if (is.null(version)) [18:41:41.755] version <- utils::packageVersion("future") [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] version <- NULL [18:41:41.755] } [18:41:41.755] if (!has_future || version < "1.8.0") { [18:41:41.755] info <- base::c(r_version = base::gsub("R version ", [18:41:41.755] "", base::R.version$version.string), [18:41:41.755] platform = base::sprintf("%s (%s-bit)", [18:41:41.755] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.755] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.755] "release", "version")], collapse = " "), [18:41:41.755] hostname = base::Sys.info()[["nodename"]]) [18:41:41.755] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.755] info) [18:41:41.755] info <- base::paste(info, collapse = "; ") [18:41:41.755] if (!has_future) { [18:41:41.755] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.755] info) [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.755] info, version) [18:41:41.755] } [18:41:41.755] base::stop(msg) [18:41:41.755] } [18:41:41.755] }) [18:41:41.755] } [18:41:41.755] ...future.strategy.old <- future::plan("list") [18:41:41.755] options(future.plan = NULL) [18:41:41.755] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.755] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.755] } [18:41:41.755] ...future.workdir <- getwd() [18:41:41.755] } [18:41:41.755] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.755] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.755] } [18:41:41.755] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.755] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.755] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.755] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.755] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.755] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.755] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.755] base::names(...future.oldOptions)) [18:41:41.755] } [18:41:41.755] if (FALSE) { [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] if (TRUE) { [18:41:41.755] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.755] open = "w") [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.755] windows = "NUL", "/dev/null"), open = "w") [18:41:41.755] } [18:41:41.755] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.755] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.755] base::sink(type = "output", split = FALSE) [18:41:41.755] base::close(...future.stdout) [18:41:41.755] }, add = TRUE) [18:41:41.755] } [18:41:41.755] ...future.frame <- base::sys.nframe() [18:41:41.755] ...future.conditions <- base::list() [18:41:41.755] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.755] if (FALSE) { [18:41:41.755] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.755] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.755] } [18:41:41.755] ...future.result <- base::tryCatch({ [18:41:41.755] base::withCallingHandlers({ [18:41:41.755] ...future.value <- base::withVisible(base::local({ [18:41:41.755] do.call(function(...) { [18:41:41.755] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.755] if (!identical(...future.globals.maxSize.org, [18:41:41.755] ...future.globals.maxSize)) { [18:41:41.755] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.755] on.exit(options(oopts), add = TRUE) [18:41:41.755] } [18:41:41.755] { [18:41:41.755] lapply(seq_along(...future.elements_ii), [18:41:41.755] FUN = function(jj) { [18:41:41.755] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.755] ...future.FUN(...future.X_jj, ...) [18:41:41.755] }) [18:41:41.755] } [18:41:41.755] }, args = future.call.arguments) [18:41:41.755] })) [18:41:41.755] future::FutureResult(value = ...future.value$value, [18:41:41.755] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.755] ...future.rng), globalenv = if (FALSE) [18:41:41.755] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.755] ...future.globalenv.names)) [18:41:41.755] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.755] }, condition = base::local({ [18:41:41.755] c <- base::c [18:41:41.755] inherits <- base::inherits [18:41:41.755] invokeRestart <- base::invokeRestart [18:41:41.755] length <- base::length [18:41:41.755] list <- base::list [18:41:41.755] seq.int <- base::seq.int [18:41:41.755] signalCondition <- base::signalCondition [18:41:41.755] sys.calls <- base::sys.calls [18:41:41.755] `[[` <- base::`[[` [18:41:41.755] `+` <- base::`+` [18:41:41.755] `<<-` <- base::`<<-` [18:41:41.755] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.755] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.755] 3L)] [18:41:41.755] } [18:41:41.755] function(cond) { [18:41:41.755] is_error <- inherits(cond, "error") [18:41:41.755] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.755] NULL) [18:41:41.755] if (is_error) { [18:41:41.755] sessionInformation <- function() { [18:41:41.755] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.755] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.755] search = base::search(), system = base::Sys.info()) [18:41:41.755] } [18:41:41.755] ...future.conditions[[length(...future.conditions) + [18:41:41.755] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.755] cond$call), session = sessionInformation(), [18:41:41.755] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.755] signalCondition(cond) [18:41:41.755] } [18:41:41.755] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.755] "immediateCondition"))) { [18:41:41.755] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.755] ...future.conditions[[length(...future.conditions) + [18:41:41.755] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.755] if (TRUE && !signal) { [18:41:41.755] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.755] { [18:41:41.755] inherits <- base::inherits [18:41:41.755] invokeRestart <- base::invokeRestart [18:41:41.755] is.null <- base::is.null [18:41:41.755] muffled <- FALSE [18:41:41.755] if (inherits(cond, "message")) { [18:41:41.755] muffled <- grepl(pattern, "muffleMessage") [18:41:41.755] if (muffled) [18:41:41.755] invokeRestart("muffleMessage") [18:41:41.755] } [18:41:41.755] else if (inherits(cond, "warning")) { [18:41:41.755] muffled <- grepl(pattern, "muffleWarning") [18:41:41.755] if (muffled) [18:41:41.755] invokeRestart("muffleWarning") [18:41:41.755] } [18:41:41.755] else if (inherits(cond, "condition")) { [18:41:41.755] if (!is.null(pattern)) { [18:41:41.755] computeRestarts <- base::computeRestarts [18:41:41.755] grepl <- base::grepl [18:41:41.755] restarts <- computeRestarts(cond) [18:41:41.755] for (restart in restarts) { [18:41:41.755] name <- restart$name [18:41:41.755] if (is.null(name)) [18:41:41.755] next [18:41:41.755] if (!grepl(pattern, name)) [18:41:41.755] next [18:41:41.755] invokeRestart(restart) [18:41:41.755] muffled <- TRUE [18:41:41.755] break [18:41:41.755] } [18:41:41.755] } [18:41:41.755] } [18:41:41.755] invisible(muffled) [18:41:41.755] } [18:41:41.755] muffleCondition(cond, pattern = "^muffle") [18:41:41.755] } [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] if (TRUE) { [18:41:41.755] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.755] { [18:41:41.755] inherits <- base::inherits [18:41:41.755] invokeRestart <- base::invokeRestart [18:41:41.755] is.null <- base::is.null [18:41:41.755] muffled <- FALSE [18:41:41.755] if (inherits(cond, "message")) { [18:41:41.755] muffled <- grepl(pattern, "muffleMessage") [18:41:41.755] if (muffled) [18:41:41.755] invokeRestart("muffleMessage") [18:41:41.755] } [18:41:41.755] else if (inherits(cond, "warning")) { [18:41:41.755] muffled <- grepl(pattern, "muffleWarning") [18:41:41.755] if (muffled) [18:41:41.755] invokeRestart("muffleWarning") [18:41:41.755] } [18:41:41.755] else if (inherits(cond, "condition")) { [18:41:41.755] if (!is.null(pattern)) { [18:41:41.755] computeRestarts <- base::computeRestarts [18:41:41.755] grepl <- base::grepl [18:41:41.755] restarts <- computeRestarts(cond) [18:41:41.755] for (restart in restarts) { [18:41:41.755] name <- restart$name [18:41:41.755] if (is.null(name)) [18:41:41.755] next [18:41:41.755] if (!grepl(pattern, name)) [18:41:41.755] next [18:41:41.755] invokeRestart(restart) [18:41:41.755] muffled <- TRUE [18:41:41.755] break [18:41:41.755] } [18:41:41.755] } [18:41:41.755] } [18:41:41.755] invisible(muffled) [18:41:41.755] } [18:41:41.755] muffleCondition(cond, pattern = "^muffle") [18:41:41.755] } [18:41:41.755] } [18:41:41.755] } [18:41:41.755] })) [18:41:41.755] }, error = function(ex) { [18:41:41.755] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.755] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.755] ...future.rng), started = ...future.startTime, [18:41:41.755] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.755] version = "1.8"), class = "FutureResult") [18:41:41.755] }, finally = { [18:41:41.755] if (!identical(...future.workdir, getwd())) [18:41:41.755] setwd(...future.workdir) [18:41:41.755] { [18:41:41.755] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.755] ...future.oldOptions$nwarnings <- NULL [18:41:41.755] } [18:41:41.755] base::options(...future.oldOptions) [18:41:41.755] if (.Platform$OS.type == "windows") { [18:41:41.755] old_names <- names(...future.oldEnvVars) [18:41:41.755] envs <- base::Sys.getenv() [18:41:41.755] names <- names(envs) [18:41:41.755] common <- intersect(names, old_names) [18:41:41.755] added <- setdiff(names, old_names) [18:41:41.755] removed <- setdiff(old_names, names) [18:41:41.755] changed <- common[...future.oldEnvVars[common] != [18:41:41.755] envs[common]] [18:41:41.755] NAMES <- toupper(changed) [18:41:41.755] args <- list() [18:41:41.755] for (kk in seq_along(NAMES)) { [18:41:41.755] name <- changed[[kk]] [18:41:41.755] NAME <- NAMES[[kk]] [18:41:41.755] if (name != NAME && is.element(NAME, old_names)) [18:41:41.755] next [18:41:41.755] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.755] } [18:41:41.755] NAMES <- toupper(added) [18:41:41.755] for (kk in seq_along(NAMES)) { [18:41:41.755] name <- added[[kk]] [18:41:41.755] NAME <- NAMES[[kk]] [18:41:41.755] if (name != NAME && is.element(NAME, old_names)) [18:41:41.755] next [18:41:41.755] args[[name]] <- "" [18:41:41.755] } [18:41:41.755] NAMES <- toupper(removed) [18:41:41.755] for (kk in seq_along(NAMES)) { [18:41:41.755] name <- removed[[kk]] [18:41:41.755] NAME <- NAMES[[kk]] [18:41:41.755] if (name != NAME && is.element(NAME, old_names)) [18:41:41.755] next [18:41:41.755] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.755] } [18:41:41.755] if (length(args) > 0) [18:41:41.755] base::do.call(base::Sys.setenv, args = args) [18:41:41.755] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.755] } [18:41:41.755] { [18:41:41.755] if (base::length(...future.futureOptionsAdded) > [18:41:41.755] 0L) { [18:41:41.755] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.755] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.755] base::options(opts) [18:41:41.755] } [18:41:41.755] { [18:41:41.755] { [18:41:41.755] NULL [18:41:41.755] RNGkind("Mersenne-Twister") [18:41:41.755] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.755] inherits = FALSE) [18:41:41.755] } [18:41:41.755] options(future.plan = NULL) [18:41:41.755] if (is.na(NA_character_)) [18:41:41.755] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.755] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.755] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.755] .init = FALSE) [18:41:41.755] } [18:41:41.755] } [18:41:41.755] } [18:41:41.755] }) [18:41:41.755] if (TRUE) { [18:41:41.755] base::sink(type = "output", split = FALSE) [18:41:41.755] if (TRUE) { [18:41:41.755] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.755] } [18:41:41.755] else { [18:41:41.755] ...future.result["stdout"] <- base::list(NULL) [18:41:41.755] } [18:41:41.755] base::close(...future.stdout) [18:41:41.755] ...future.stdout <- NULL [18:41:41.755] } [18:41:41.755] ...future.result$conditions <- ...future.conditions [18:41:41.755] ...future.result$finished <- base::Sys.time() [18:41:41.755] ...future.result [18:41:41.755] } [18:41:41.762] assign_globals() ... [18:41:41.762] List of 5 [18:41:41.762] $ ...future.FUN :function (x) [18:41:41.762] $ future.call.arguments : list() [18:41:41.762] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.762] $ ...future.elements_ii :List of 6 [18:41:41.762] ..$ a1: int 1 [18:41:41.762] ..$ a2: int 2 [18:41:41.762] ..$ b1: int 2 [18:41:41.762] ..$ b2: int 3 [18:41:41.762] ..$ c1: int 3 [18:41:41.762] ..$ c2: int 4 [18:41:41.762] $ ...future.seeds_ii : NULL [18:41:41.762] $ ...future.globals.maxSize: NULL [18:41:41.762] - attr(*, "where")=List of 5 [18:41:41.762] ..$ ...future.FUN : [18:41:41.762] ..$ future.call.arguments : [18:41:41.762] ..$ ...future.elements_ii : [18:41:41.762] ..$ ...future.seeds_ii : [18:41:41.762] ..$ ...future.globals.maxSize: [18:41:41.762] - attr(*, "resolved")= logi FALSE [18:41:41.762] - attr(*, "total_size")= num 4942 [18:41:41.762] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.762] - attr(*, "already-done")= logi TRUE [18:41:41.774] - copied '...future.FUN' to environment [18:41:41.774] - copied 'future.call.arguments' to environment [18:41:41.775] - copied '...future.elements_ii' to environment [18:41:41.775] - copied '...future.seeds_ii' to environment [18:41:41.775] - copied '...future.globals.maxSize' to environment [18:41:41.775] assign_globals() ... done [18:41:41.776] plan(): Setting new future strategy stack: [18:41:41.776] List of future strategies: [18:41:41.776] 1. sequential: [18:41:41.776] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.776] - tweaked: FALSE [18:41:41.776] - call: NULL [18:41:41.777] plan(): nbrOfWorkers() = 1 [18:41:41.779] plan(): Setting new future strategy stack: [18:41:41.779] List of future strategies: [18:41:41.779] 1. sequential: [18:41:41.779] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.779] - tweaked: FALSE [18:41:41.779] - call: plan(strategy) [18:41:41.780] plan(): nbrOfWorkers() = 1 [18:41:41.781] SequentialFuture started (and completed) [18:41:41.781] - Launch lazy future ... done [18:41:41.781] run() for 'SequentialFuture' ... done [18:41:41.782] Created future: [18:41:41.782] SequentialFuture: [18:41:41.782] Label: 'future_sapply-1' [18:41:41.782] Expression: [18:41:41.782] { [18:41:41.782] do.call(function(...) { [18:41:41.782] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.782] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.782] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.782] on.exit(options(oopts), add = TRUE) [18:41:41.782] } [18:41:41.782] { [18:41:41.782] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.782] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.782] ...future.FUN(...future.X_jj, ...) [18:41:41.782] }) [18:41:41.782] } [18:41:41.782] }, args = future.call.arguments) [18:41:41.782] } [18:41:41.782] Lazy evaluation: FALSE [18:41:41.782] Asynchronous evaluation: FALSE [18:41:41.782] Local evaluation: TRUE [18:41:41.782] Environment: R_GlobalEnv [18:41:41.782] Capture standard output: TRUE [18:41:41.782] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.782] Globals: 5 objects totaling 532 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.782] Packages: [18:41:41.782] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.782] Resolved: TRUE [18:41:41.782] Value: 103 bytes of class 'list' [18:41:41.782] Early signaling: FALSE [18:41:41.782] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.782] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.784] Chunk #1 of 1 ... DONE [18:41:41.784] Launching 1 futures (chunks) ... DONE [18:41:41.784] Resolving 1 futures (chunks) ... [18:41:41.785] resolve() on list ... [18:41:41.785] recursive: 0 [18:41:41.785] length: 1 [18:41:41.785] [18:41:41.786] resolved() for 'SequentialFuture' ... [18:41:41.786] - state: 'finished' [18:41:41.786] - run: TRUE [18:41:41.787] - result: 'FutureResult' [18:41:41.787] resolved() for 'SequentialFuture' ... done [18:41:41.787] Future #1 [18:41:41.787] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.788] - nx: 1 [18:41:41.788] - relay: TRUE [18:41:41.788] - stdout: TRUE [18:41:41.788] - signal: TRUE [18:41:41.789] - resignal: FALSE [18:41:41.789] - force: TRUE [18:41:41.789] - relayed: [n=1] FALSE [18:41:41.789] - queued futures: [n=1] FALSE [18:41:41.790] - until=1 [18:41:41.790] - relaying element #1 [18:41:41.790] - relayed: [n=1] TRUE [18:41:41.792] - queued futures: [n=1] TRUE [18:41:41.793] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.793] length: 0 (resolved future 1) [18:41:41.793] Relaying remaining futures [18:41:41.794] signalConditionsASAP(NULL, pos=0) ... [18:41:41.794] - nx: 1 [18:41:41.794] - relay: TRUE [18:41:41.794] - stdout: TRUE [18:41:41.795] - signal: TRUE [18:41:41.795] - resignal: FALSE [18:41:41.795] - force: TRUE [18:41:41.795] - relayed: [n=1] TRUE [18:41:41.795] - queued futures: [n=1] TRUE - flush all [18:41:41.796] - relayed: [n=1] TRUE [18:41:41.796] - queued futures: [n=1] TRUE [18:41:41.796] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.797] resolve() on list ... DONE [18:41:41.797] - Number of value chunks collected: 1 [18:41:41.797] Resolving 1 futures (chunks) ... DONE [18:41:41.798] Reducing values from 1 chunks ... [18:41:41.798] - Number of values collected after concatenation: 6 [18:41:41.798] - Number of values expected: 6 [18:41:41.798] Reducing values from 1 chunks ... DONE [18:41:41.799] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:41.802] future_lapply() ... [18:41:41.803] Number of chunks: 1 [18:41:41.803] getGlobalsAndPackagesXApply() ... [18:41:41.803] - future.globals: TRUE [18:41:41.803] getGlobalsAndPackages() ... [18:41:41.804] Searching for globals... [18:41:41.806] - globals found: [2] 'FUN', 'UseMethod' [18:41:41.806] Searching for globals ... DONE [18:41:41.806] Resolving globals: FALSE [18:41:41.807] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:41.807] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:41.808] - globals: [1] 'FUN' [18:41:41.808] [18:41:41.808] getGlobalsAndPackages() ... DONE [18:41:41.809] - globals found/used: [n=1] 'FUN' [18:41:41.809] - needed namespaces: [n=0] [18:41:41.809] Finding globals ... DONE [18:41:41.809] - use_args: TRUE [18:41:41.810] - Getting '...' globals ... [18:41:41.810] resolve() on list ... [18:41:41.810] recursive: 0 [18:41:41.811] length: 1 [18:41:41.811] elements: '...' [18:41:41.811] length: 0 (resolved future 1) [18:41:41.812] resolve() on list ... DONE [18:41:41.812] - '...' content: [n=0] [18:41:41.812] List of 1 [18:41:41.812] $ ...: list() [18:41:41.812] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.812] - attr(*, "where")=List of 1 [18:41:41.812] ..$ ...: [18:41:41.812] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.812] - attr(*, "resolved")= logi TRUE [18:41:41.812] - attr(*, "total_size")= num NA [18:41:41.816] - Getting '...' globals ... DONE [18:41:41.817] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.817] List of 2 [18:41:41.817] $ ...future.FUN:function (x, ...) [18:41:41.817] $ ... : list() [18:41:41.817] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.817] - attr(*, "where")=List of 2 [18:41:41.817] ..$ ...future.FUN: [18:41:41.817] ..$ ... : [18:41:41.817] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.817] - attr(*, "resolved")= logi FALSE [18:41:41.817] - attr(*, "total_size")= int 5182 [18:41:41.822] Packages to be attached in all futures: [n=0] [18:41:41.822] getGlobalsAndPackagesXApply() ... DONE [18:41:41.823] Number of futures (= number of chunks): 1 [18:41:41.823] Launching 1 futures (chunks) ... [18:41:41.823] Chunk #1 of 1 ... [18:41:41.824] - Finding globals in 'X' for chunk #1 ... [18:41:41.824] getGlobalsAndPackages() ... [18:41:41.824] Searching for globals... [18:41:41.825] [18:41:41.825] Searching for globals ... DONE [18:41:41.825] - globals: [0] [18:41:41.827] getGlobalsAndPackages() ... DONE [18:41:41.827] + additional globals found: [n=0] [18:41:41.828] + additional namespaces needed: [n=0] [18:41:41.828] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.828] - seeds: [18:41:41.828] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.829] getGlobalsAndPackages() ... [18:41:41.829] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.829] Resolving globals: FALSE [18:41:41.830] Tweak future expression to call with '...' arguments ... [18:41:41.830] { [18:41:41.830] do.call(function(...) { [18:41:41.830] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.830] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.830] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.830] on.exit(options(oopts), add = TRUE) [18:41:41.830] } [18:41:41.830] { [18:41:41.830] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.830] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.830] ...future.FUN(...future.X_jj, ...) [18:41:41.830] }) [18:41:41.830] } [18:41:41.830] }, args = future.call.arguments) [18:41:41.830] } [18:41:41.831] Tweak future expression to call with '...' arguments ... DONE [18:41:41.831] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.832] [18:41:41.832] getGlobalsAndPackages() ... DONE [18:41:41.832] run() for 'Future' ... [18:41:41.833] - state: 'created' [18:41:41.833] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.834] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.834] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.834] - Field: 'label' [18:41:41.835] - Field: 'local' [18:41:41.835] - Field: 'owner' [18:41:41.835] - Field: 'envir' [18:41:41.835] - Field: 'packages' [18:41:41.836] - Field: 'gc' [18:41:41.836] - Field: 'conditions' [18:41:41.836] - Field: 'expr' [18:41:41.837] - Field: 'uuid' [18:41:41.837] - Field: 'seed' [18:41:41.837] - Field: 'version' [18:41:41.837] - Field: 'result' [18:41:41.838] - Field: 'asynchronous' [18:41:41.838] - Field: 'calls' [18:41:41.838] - Field: 'globals' [18:41:41.839] - Field: 'stdout' [18:41:41.839] - Field: 'earlySignal' [18:41:41.839] - Field: 'lazy' [18:41:41.839] - Field: 'state' [18:41:41.840] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.840] - Launch lazy future ... [18:41:41.840] Packages needed by the future expression (n = 0): [18:41:41.841] Packages needed by future strategies (n = 0): [18:41:41.841] { [18:41:41.841] { [18:41:41.841] { [18:41:41.841] ...future.startTime <- base::Sys.time() [18:41:41.841] { [18:41:41.841] { [18:41:41.841] { [18:41:41.841] base::local({ [18:41:41.841] has_future <- base::requireNamespace("future", [18:41:41.841] quietly = TRUE) [18:41:41.841] if (has_future) { [18:41:41.841] ns <- base::getNamespace("future") [18:41:41.841] version <- ns[[".package"]][["version"]] [18:41:41.841] if (is.null(version)) [18:41:41.841] version <- utils::packageVersion("future") [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] version <- NULL [18:41:41.841] } [18:41:41.841] if (!has_future || version < "1.8.0") { [18:41:41.841] info <- base::c(r_version = base::gsub("R version ", [18:41:41.841] "", base::R.version$version.string), [18:41:41.841] platform = base::sprintf("%s (%s-bit)", [18:41:41.841] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.841] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.841] "release", "version")], collapse = " "), [18:41:41.841] hostname = base::Sys.info()[["nodename"]]) [18:41:41.841] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.841] info) [18:41:41.841] info <- base::paste(info, collapse = "; ") [18:41:41.841] if (!has_future) { [18:41:41.841] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.841] info) [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.841] info, version) [18:41:41.841] } [18:41:41.841] base::stop(msg) [18:41:41.841] } [18:41:41.841] }) [18:41:41.841] } [18:41:41.841] ...future.strategy.old <- future::plan("list") [18:41:41.841] options(future.plan = NULL) [18:41:41.841] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.841] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.841] } [18:41:41.841] ...future.workdir <- getwd() [18:41:41.841] } [18:41:41.841] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.841] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.841] } [18:41:41.841] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.841] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.841] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.841] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.841] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.841] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.841] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.841] base::names(...future.oldOptions)) [18:41:41.841] } [18:41:41.841] if (FALSE) { [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] if (TRUE) { [18:41:41.841] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.841] open = "w") [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.841] windows = "NUL", "/dev/null"), open = "w") [18:41:41.841] } [18:41:41.841] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.841] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.841] base::sink(type = "output", split = FALSE) [18:41:41.841] base::close(...future.stdout) [18:41:41.841] }, add = TRUE) [18:41:41.841] } [18:41:41.841] ...future.frame <- base::sys.nframe() [18:41:41.841] ...future.conditions <- base::list() [18:41:41.841] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.841] if (FALSE) { [18:41:41.841] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.841] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.841] } [18:41:41.841] ...future.result <- base::tryCatch({ [18:41:41.841] base::withCallingHandlers({ [18:41:41.841] ...future.value <- base::withVisible(base::local({ [18:41:41.841] do.call(function(...) { [18:41:41.841] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.841] if (!identical(...future.globals.maxSize.org, [18:41:41.841] ...future.globals.maxSize)) { [18:41:41.841] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.841] on.exit(options(oopts), add = TRUE) [18:41:41.841] } [18:41:41.841] { [18:41:41.841] lapply(seq_along(...future.elements_ii), [18:41:41.841] FUN = function(jj) { [18:41:41.841] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.841] ...future.FUN(...future.X_jj, ...) [18:41:41.841] }) [18:41:41.841] } [18:41:41.841] }, args = future.call.arguments) [18:41:41.841] })) [18:41:41.841] future::FutureResult(value = ...future.value$value, [18:41:41.841] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.841] ...future.rng), globalenv = if (FALSE) [18:41:41.841] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.841] ...future.globalenv.names)) [18:41:41.841] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.841] }, condition = base::local({ [18:41:41.841] c <- base::c [18:41:41.841] inherits <- base::inherits [18:41:41.841] invokeRestart <- base::invokeRestart [18:41:41.841] length <- base::length [18:41:41.841] list <- base::list [18:41:41.841] seq.int <- base::seq.int [18:41:41.841] signalCondition <- base::signalCondition [18:41:41.841] sys.calls <- base::sys.calls [18:41:41.841] `[[` <- base::`[[` [18:41:41.841] `+` <- base::`+` [18:41:41.841] `<<-` <- base::`<<-` [18:41:41.841] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.841] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.841] 3L)] [18:41:41.841] } [18:41:41.841] function(cond) { [18:41:41.841] is_error <- inherits(cond, "error") [18:41:41.841] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.841] NULL) [18:41:41.841] if (is_error) { [18:41:41.841] sessionInformation <- function() { [18:41:41.841] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.841] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.841] search = base::search(), system = base::Sys.info()) [18:41:41.841] } [18:41:41.841] ...future.conditions[[length(...future.conditions) + [18:41:41.841] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.841] cond$call), session = sessionInformation(), [18:41:41.841] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.841] signalCondition(cond) [18:41:41.841] } [18:41:41.841] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.841] "immediateCondition"))) { [18:41:41.841] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.841] ...future.conditions[[length(...future.conditions) + [18:41:41.841] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.841] if (TRUE && !signal) { [18:41:41.841] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.841] { [18:41:41.841] inherits <- base::inherits [18:41:41.841] invokeRestart <- base::invokeRestart [18:41:41.841] is.null <- base::is.null [18:41:41.841] muffled <- FALSE [18:41:41.841] if (inherits(cond, "message")) { [18:41:41.841] muffled <- grepl(pattern, "muffleMessage") [18:41:41.841] if (muffled) [18:41:41.841] invokeRestart("muffleMessage") [18:41:41.841] } [18:41:41.841] else if (inherits(cond, "warning")) { [18:41:41.841] muffled <- grepl(pattern, "muffleWarning") [18:41:41.841] if (muffled) [18:41:41.841] invokeRestart("muffleWarning") [18:41:41.841] } [18:41:41.841] else if (inherits(cond, "condition")) { [18:41:41.841] if (!is.null(pattern)) { [18:41:41.841] computeRestarts <- base::computeRestarts [18:41:41.841] grepl <- base::grepl [18:41:41.841] restarts <- computeRestarts(cond) [18:41:41.841] for (restart in restarts) { [18:41:41.841] name <- restart$name [18:41:41.841] if (is.null(name)) [18:41:41.841] next [18:41:41.841] if (!grepl(pattern, name)) [18:41:41.841] next [18:41:41.841] invokeRestart(restart) [18:41:41.841] muffled <- TRUE [18:41:41.841] break [18:41:41.841] } [18:41:41.841] } [18:41:41.841] } [18:41:41.841] invisible(muffled) [18:41:41.841] } [18:41:41.841] muffleCondition(cond, pattern = "^muffle") [18:41:41.841] } [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] if (TRUE) { [18:41:41.841] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.841] { [18:41:41.841] inherits <- base::inherits [18:41:41.841] invokeRestart <- base::invokeRestart [18:41:41.841] is.null <- base::is.null [18:41:41.841] muffled <- FALSE [18:41:41.841] if (inherits(cond, "message")) { [18:41:41.841] muffled <- grepl(pattern, "muffleMessage") [18:41:41.841] if (muffled) [18:41:41.841] invokeRestart("muffleMessage") [18:41:41.841] } [18:41:41.841] else if (inherits(cond, "warning")) { [18:41:41.841] muffled <- grepl(pattern, "muffleWarning") [18:41:41.841] if (muffled) [18:41:41.841] invokeRestart("muffleWarning") [18:41:41.841] } [18:41:41.841] else if (inherits(cond, "condition")) { [18:41:41.841] if (!is.null(pattern)) { [18:41:41.841] computeRestarts <- base::computeRestarts [18:41:41.841] grepl <- base::grepl [18:41:41.841] restarts <- computeRestarts(cond) [18:41:41.841] for (restart in restarts) { [18:41:41.841] name <- restart$name [18:41:41.841] if (is.null(name)) [18:41:41.841] next [18:41:41.841] if (!grepl(pattern, name)) [18:41:41.841] next [18:41:41.841] invokeRestart(restart) [18:41:41.841] muffled <- TRUE [18:41:41.841] break [18:41:41.841] } [18:41:41.841] } [18:41:41.841] } [18:41:41.841] invisible(muffled) [18:41:41.841] } [18:41:41.841] muffleCondition(cond, pattern = "^muffle") [18:41:41.841] } [18:41:41.841] } [18:41:41.841] } [18:41:41.841] })) [18:41:41.841] }, error = function(ex) { [18:41:41.841] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.841] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.841] ...future.rng), started = ...future.startTime, [18:41:41.841] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.841] version = "1.8"), class = "FutureResult") [18:41:41.841] }, finally = { [18:41:41.841] if (!identical(...future.workdir, getwd())) [18:41:41.841] setwd(...future.workdir) [18:41:41.841] { [18:41:41.841] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.841] ...future.oldOptions$nwarnings <- NULL [18:41:41.841] } [18:41:41.841] base::options(...future.oldOptions) [18:41:41.841] if (.Platform$OS.type == "windows") { [18:41:41.841] old_names <- names(...future.oldEnvVars) [18:41:41.841] envs <- base::Sys.getenv() [18:41:41.841] names <- names(envs) [18:41:41.841] common <- intersect(names, old_names) [18:41:41.841] added <- setdiff(names, old_names) [18:41:41.841] removed <- setdiff(old_names, names) [18:41:41.841] changed <- common[...future.oldEnvVars[common] != [18:41:41.841] envs[common]] [18:41:41.841] NAMES <- toupper(changed) [18:41:41.841] args <- list() [18:41:41.841] for (kk in seq_along(NAMES)) { [18:41:41.841] name <- changed[[kk]] [18:41:41.841] NAME <- NAMES[[kk]] [18:41:41.841] if (name != NAME && is.element(NAME, old_names)) [18:41:41.841] next [18:41:41.841] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.841] } [18:41:41.841] NAMES <- toupper(added) [18:41:41.841] for (kk in seq_along(NAMES)) { [18:41:41.841] name <- added[[kk]] [18:41:41.841] NAME <- NAMES[[kk]] [18:41:41.841] if (name != NAME && is.element(NAME, old_names)) [18:41:41.841] next [18:41:41.841] args[[name]] <- "" [18:41:41.841] } [18:41:41.841] NAMES <- toupper(removed) [18:41:41.841] for (kk in seq_along(NAMES)) { [18:41:41.841] name <- removed[[kk]] [18:41:41.841] NAME <- NAMES[[kk]] [18:41:41.841] if (name != NAME && is.element(NAME, old_names)) [18:41:41.841] next [18:41:41.841] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.841] } [18:41:41.841] if (length(args) > 0) [18:41:41.841] base::do.call(base::Sys.setenv, args = args) [18:41:41.841] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.841] } [18:41:41.841] { [18:41:41.841] if (base::length(...future.futureOptionsAdded) > [18:41:41.841] 0L) { [18:41:41.841] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.841] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.841] base::options(opts) [18:41:41.841] } [18:41:41.841] { [18:41:41.841] { [18:41:41.841] NULL [18:41:41.841] RNGkind("Mersenne-Twister") [18:41:41.841] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.841] inherits = FALSE) [18:41:41.841] } [18:41:41.841] options(future.plan = NULL) [18:41:41.841] if (is.na(NA_character_)) [18:41:41.841] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.841] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.841] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.841] .init = FALSE) [18:41:41.841] } [18:41:41.841] } [18:41:41.841] } [18:41:41.841] }) [18:41:41.841] if (TRUE) { [18:41:41.841] base::sink(type = "output", split = FALSE) [18:41:41.841] if (TRUE) { [18:41:41.841] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.841] } [18:41:41.841] else { [18:41:41.841] ...future.result["stdout"] <- base::list(NULL) [18:41:41.841] } [18:41:41.841] base::close(...future.stdout) [18:41:41.841] ...future.stdout <- NULL [18:41:41.841] } [18:41:41.841] ...future.result$conditions <- ...future.conditions [18:41:41.841] ...future.result$finished <- base::Sys.time() [18:41:41.841] ...future.result [18:41:41.841] } [18:41:41.848] assign_globals() ... [18:41:41.848] List of 5 [18:41:41.848] $ ...future.FUN :function (x, ...) [18:41:41.848] $ future.call.arguments : list() [18:41:41.848] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.848] $ ...future.elements_ii :List of 6 [18:41:41.848] ..$ a1: int 1 [18:41:41.848] ..$ a2: int 2 [18:41:41.848] ..$ b1: int 2 [18:41:41.848] ..$ b2: int 3 [18:41:41.848] ..$ c1: int 3 [18:41:41.848] ..$ c2: int 4 [18:41:41.848] $ ...future.seeds_ii : NULL [18:41:41.848] $ ...future.globals.maxSize: NULL [18:41:41.848] - attr(*, "where")=List of 5 [18:41:41.848] ..$ ...future.FUN : [18:41:41.848] ..$ future.call.arguments : [18:41:41.848] ..$ ...future.elements_ii : [18:41:41.848] ..$ ...future.seeds_ii : [18:41:41.848] ..$ ...future.globals.maxSize: [18:41:41.848] - attr(*, "resolved")= logi FALSE [18:41:41.848] - attr(*, "total_size")= num 5182 [18:41:41.848] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.848] - attr(*, "already-done")= logi TRUE [18:41:41.860] - copied '...future.FUN' to environment [18:41:41.860] - copied 'future.call.arguments' to environment [18:41:41.860] - copied '...future.elements_ii' to environment [18:41:41.861] - copied '...future.seeds_ii' to environment [18:41:41.861] - copied '...future.globals.maxSize' to environment [18:41:41.861] assign_globals() ... done [18:41:41.862] plan(): Setting new future strategy stack: [18:41:41.862] List of future strategies: [18:41:41.862] 1. sequential: [18:41:41.862] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.862] - tweaked: FALSE [18:41:41.862] - call: NULL [18:41:41.863] plan(): nbrOfWorkers() = 1 [18:41:41.865] plan(): Setting new future strategy stack: [18:41:41.865] List of future strategies: [18:41:41.865] 1. sequential: [18:41:41.865] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.865] - tweaked: FALSE [18:41:41.865] - call: plan(strategy) [18:41:41.866] plan(): nbrOfWorkers() = 1 [18:41:41.867] SequentialFuture started (and completed) [18:41:41.867] - Launch lazy future ... done [18:41:41.867] run() for 'SequentialFuture' ... done [18:41:41.869] Created future: [18:41:41.870] SequentialFuture: [18:41:41.870] Label: 'future_sapply-1' [18:41:41.870] Expression: [18:41:41.870] { [18:41:41.870] do.call(function(...) { [18:41:41.870] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.870] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.870] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.870] on.exit(options(oopts), add = TRUE) [18:41:41.870] } [18:41:41.870] { [18:41:41.870] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.870] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.870] ...future.FUN(...future.X_jj, ...) [18:41:41.870] }) [18:41:41.870] } [18:41:41.870] }, args = future.call.arguments) [18:41:41.870] } [18:41:41.870] Lazy evaluation: FALSE [18:41:41.870] Asynchronous evaluation: FALSE [18:41:41.870] Local evaluation: TRUE [18:41:41.870] Environment: R_GlobalEnv [18:41:41.870] Capture standard output: TRUE [18:41:41.870] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.870] Globals: 5 objects totaling 625 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.870] Packages: [18:41:41.870] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.870] Resolved: TRUE [18:41:41.870] Value: 282 bytes of class 'list' [18:41:41.870] Early signaling: FALSE [18:41:41.870] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.870] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.871] Chunk #1 of 1 ... DONE [18:41:41.872] Launching 1 futures (chunks) ... DONE [18:41:41.872] Resolving 1 futures (chunks) ... [18:41:41.872] resolve() on list ... [18:41:41.872] recursive: 0 [18:41:41.873] length: 1 [18:41:41.873] [18:41:41.873] resolved() for 'SequentialFuture' ... [18:41:41.873] - state: 'finished' [18:41:41.874] - run: TRUE [18:41:41.874] - result: 'FutureResult' [18:41:41.874] resolved() for 'SequentialFuture' ... done [18:41:41.875] Future #1 [18:41:41.875] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.875] - nx: 1 [18:41:41.875] - relay: TRUE [18:41:41.876] - stdout: TRUE [18:41:41.876] - signal: TRUE [18:41:41.876] - resignal: FALSE [18:41:41.876] - force: TRUE [18:41:41.877] - relayed: [n=1] FALSE [18:41:41.877] - queued futures: [n=1] FALSE [18:41:41.877] - until=1 [18:41:41.877] - relaying element #1 [18:41:41.878] - relayed: [n=1] TRUE [18:41:41.878] - queued futures: [n=1] TRUE [18:41:41.878] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.879] length: 0 (resolved future 1) [18:41:41.879] Relaying remaining futures [18:41:41.879] signalConditionsASAP(NULL, pos=0) ... [18:41:41.879] - nx: 1 [18:41:41.880] - relay: TRUE [18:41:41.880] - stdout: TRUE [18:41:41.880] - signal: TRUE [18:41:41.880] - resignal: FALSE [18:41:41.881] - force: TRUE [18:41:41.881] - relayed: [n=1] TRUE [18:41:41.881] - queued futures: [n=1] TRUE - flush all [18:41:41.882] - relayed: [n=1] TRUE [18:41:41.882] - queued futures: [n=1] TRUE [18:41:41.882] signalConditionsASAP(NULL, pos=0) ... done [18:41:41.882] resolve() on list ... DONE [18:41:41.883] - Number of value chunks collected: 1 [18:41:41.883] Resolving 1 futures (chunks) ... DONE [18:41:41.883] Reducing values from 1 chunks ... [18:41:41.883] - Number of values collected after concatenation: 6 [18:41:41.884] - Number of values expected: 6 [18:41:41.884] Reducing values from 1 chunks ... DONE [18:41:41.884] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:41.887] future_lapply() ... [18:41:41.889] Number of chunks: 1 [18:41:41.889] getGlobalsAndPackagesXApply() ... [18:41:41.889] - future.globals: TRUE [18:41:41.890] getGlobalsAndPackages() ... [18:41:41.890] Searching for globals... [18:41:41.892] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:41.893] Searching for globals ... DONE [18:41:41.893] Resolving globals: FALSE [18:41:41.894] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:41.894] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:41.895] - globals: [1] 'FUN' [18:41:41.895] [18:41:41.895] getGlobalsAndPackages() ... DONE [18:41:41.896] - globals found/used: [n=1] 'FUN' [18:41:41.896] - needed namespaces: [n=0] [18:41:41.896] Finding globals ... DONE [18:41:41.896] - use_args: TRUE [18:41:41.897] - Getting '...' globals ... [18:41:41.897] resolve() on list ... [18:41:41.898] recursive: 0 [18:41:41.898] length: 1 [18:41:41.898] elements: '...' [18:41:41.898] length: 0 (resolved future 1) [18:41:41.899] resolve() on list ... DONE [18:41:41.899] - '...' content: [n=0] [18:41:41.899] List of 1 [18:41:41.899] $ ...: list() [18:41:41.899] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.899] - attr(*, "where")=List of 1 [18:41:41.899] ..$ ...: [18:41:41.899] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.899] - attr(*, "resolved")= logi TRUE [18:41:41.899] - attr(*, "total_size")= num NA [18:41:41.903] - Getting '...' globals ... DONE [18:41:41.904] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:41.940] List of 2 [18:41:41.940] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:41.940] $ ... : list() [18:41:41.940] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.940] - attr(*, "where")=List of 2 [18:41:41.940] ..$ ...future.FUN: [18:41:41.940] ..$ ... : [18:41:41.940] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.940] - attr(*, "resolved")= logi FALSE [18:41:41.940] - attr(*, "total_size")= int 6664 [18:41:41.945] Packages to be attached in all futures: [n=0] [18:41:41.946] getGlobalsAndPackagesXApply() ... DONE [18:41:41.946] Number of futures (= number of chunks): 1 [18:41:41.946] Launching 1 futures (chunks) ... [18:41:41.947] Chunk #1 of 1 ... [18:41:41.947] - Finding globals in 'X' for chunk #1 ... [18:41:41.947] getGlobalsAndPackages() ... [18:41:41.947] Searching for globals... [18:41:41.948] [18:41:41.948] Searching for globals ... DONE [18:41:41.948] - globals: [0] [18:41:41.949] getGlobalsAndPackages() ... DONE [18:41:41.949] + additional globals found: [n=0] [18:41:41.949] + additional namespaces needed: [n=0] [18:41:41.949] - Finding globals in 'X' for chunk #1 ... DONE [18:41:41.950] - seeds: [18:41:41.950] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.950] getGlobalsAndPackages() ... [18:41:41.950] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.951] Resolving globals: FALSE [18:41:41.951] Tweak future expression to call with '...' arguments ... [18:41:41.951] { [18:41:41.951] do.call(function(...) { [18:41:41.951] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.951] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.951] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.951] on.exit(options(oopts), add = TRUE) [18:41:41.951] } [18:41:41.951] { [18:41:41.951] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.951] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.951] ...future.FUN(...future.X_jj, ...) [18:41:41.951] }) [18:41:41.951] } [18:41:41.951] }, args = future.call.arguments) [18:41:41.951] } [18:41:41.952] Tweak future expression to call with '...' arguments ... DONE [18:41:41.953] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:41.953] [18:41:41.953] getGlobalsAndPackages() ... DONE [18:41:41.954] run() for 'Future' ... [18:41:41.954] - state: 'created' [18:41:41.955] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:41.955] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.955] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:41.956] - Field: 'label' [18:41:41.956] - Field: 'local' [18:41:41.956] - Field: 'owner' [18:41:41.957] - Field: 'envir' [18:41:41.957] - Field: 'packages' [18:41:41.957] - Field: 'gc' [18:41:41.957] - Field: 'conditions' [18:41:41.958] - Field: 'expr' [18:41:41.958] - Field: 'uuid' [18:41:41.958] - Field: 'seed' [18:41:41.959] - Field: 'version' [18:41:41.959] - Field: 'result' [18:41:41.959] - Field: 'asynchronous' [18:41:41.959] - Field: 'calls' [18:41:41.960] - Field: 'globals' [18:41:41.960] - Field: 'stdout' [18:41:41.960] - Field: 'earlySignal' [18:41:41.961] - Field: 'lazy' [18:41:41.961] - Field: 'state' [18:41:41.961] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:41.961] - Launch lazy future ... [18:41:41.962] Packages needed by the future expression (n = 0): [18:41:41.962] Packages needed by future strategies (n = 0): [18:41:41.963] { [18:41:41.963] { [18:41:41.963] { [18:41:41.963] ...future.startTime <- base::Sys.time() [18:41:41.963] { [18:41:41.963] { [18:41:41.963] { [18:41:41.963] base::local({ [18:41:41.963] has_future <- base::requireNamespace("future", [18:41:41.963] quietly = TRUE) [18:41:41.963] if (has_future) { [18:41:41.963] ns <- base::getNamespace("future") [18:41:41.963] version <- ns[[".package"]][["version"]] [18:41:41.963] if (is.null(version)) [18:41:41.963] version <- utils::packageVersion("future") [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] version <- NULL [18:41:41.963] } [18:41:41.963] if (!has_future || version < "1.8.0") { [18:41:41.963] info <- base::c(r_version = base::gsub("R version ", [18:41:41.963] "", base::R.version$version.string), [18:41:41.963] platform = base::sprintf("%s (%s-bit)", [18:41:41.963] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:41.963] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:41.963] "release", "version")], collapse = " "), [18:41:41.963] hostname = base::Sys.info()[["nodename"]]) [18:41:41.963] info <- base::sprintf("%s: %s", base::names(info), [18:41:41.963] info) [18:41:41.963] info <- base::paste(info, collapse = "; ") [18:41:41.963] if (!has_future) { [18:41:41.963] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:41.963] info) [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:41.963] info, version) [18:41:41.963] } [18:41:41.963] base::stop(msg) [18:41:41.963] } [18:41:41.963] }) [18:41:41.963] } [18:41:41.963] ...future.strategy.old <- future::plan("list") [18:41:41.963] options(future.plan = NULL) [18:41:41.963] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.963] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:41.963] } [18:41:41.963] ...future.workdir <- getwd() [18:41:41.963] } [18:41:41.963] ...future.oldOptions <- base::as.list(base::.Options) [18:41:41.963] ...future.oldEnvVars <- base::Sys.getenv() [18:41:41.963] } [18:41:41.963] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:41.963] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:41.963] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:41.963] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:41.963] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:41.963] future.stdout.windows.reencode = NULL, width = 80L) [18:41:41.963] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:41.963] base::names(...future.oldOptions)) [18:41:41.963] } [18:41:41.963] if (FALSE) { [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] if (TRUE) { [18:41:41.963] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:41.963] open = "w") [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:41.963] windows = "NUL", "/dev/null"), open = "w") [18:41:41.963] } [18:41:41.963] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:41.963] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:41.963] base::sink(type = "output", split = FALSE) [18:41:41.963] base::close(...future.stdout) [18:41:41.963] }, add = TRUE) [18:41:41.963] } [18:41:41.963] ...future.frame <- base::sys.nframe() [18:41:41.963] ...future.conditions <- base::list() [18:41:41.963] ...future.rng <- base::globalenv()$.Random.seed [18:41:41.963] if (FALSE) { [18:41:41.963] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:41.963] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:41.963] } [18:41:41.963] ...future.result <- base::tryCatch({ [18:41:41.963] base::withCallingHandlers({ [18:41:41.963] ...future.value <- base::withVisible(base::local({ [18:41:41.963] do.call(function(...) { [18:41:41.963] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.963] if (!identical(...future.globals.maxSize.org, [18:41:41.963] ...future.globals.maxSize)) { [18:41:41.963] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.963] on.exit(options(oopts), add = TRUE) [18:41:41.963] } [18:41:41.963] { [18:41:41.963] lapply(seq_along(...future.elements_ii), [18:41:41.963] FUN = function(jj) { [18:41:41.963] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.963] ...future.FUN(...future.X_jj, ...) [18:41:41.963] }) [18:41:41.963] } [18:41:41.963] }, args = future.call.arguments) [18:41:41.963] })) [18:41:41.963] future::FutureResult(value = ...future.value$value, [18:41:41.963] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.963] ...future.rng), globalenv = if (FALSE) [18:41:41.963] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:41.963] ...future.globalenv.names)) [18:41:41.963] else NULL, started = ...future.startTime, version = "1.8") [18:41:41.963] }, condition = base::local({ [18:41:41.963] c <- base::c [18:41:41.963] inherits <- base::inherits [18:41:41.963] invokeRestart <- base::invokeRestart [18:41:41.963] length <- base::length [18:41:41.963] list <- base::list [18:41:41.963] seq.int <- base::seq.int [18:41:41.963] signalCondition <- base::signalCondition [18:41:41.963] sys.calls <- base::sys.calls [18:41:41.963] `[[` <- base::`[[` [18:41:41.963] `+` <- base::`+` [18:41:41.963] `<<-` <- base::`<<-` [18:41:41.963] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:41.963] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:41.963] 3L)] [18:41:41.963] } [18:41:41.963] function(cond) { [18:41:41.963] is_error <- inherits(cond, "error") [18:41:41.963] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:41.963] NULL) [18:41:41.963] if (is_error) { [18:41:41.963] sessionInformation <- function() { [18:41:41.963] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:41.963] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:41.963] search = base::search(), system = base::Sys.info()) [18:41:41.963] } [18:41:41.963] ...future.conditions[[length(...future.conditions) + [18:41:41.963] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:41.963] cond$call), session = sessionInformation(), [18:41:41.963] timestamp = base::Sys.time(), signaled = 0L) [18:41:41.963] signalCondition(cond) [18:41:41.963] } [18:41:41.963] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:41.963] "immediateCondition"))) { [18:41:41.963] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:41.963] ...future.conditions[[length(...future.conditions) + [18:41:41.963] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:41.963] if (TRUE && !signal) { [18:41:41.963] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.963] { [18:41:41.963] inherits <- base::inherits [18:41:41.963] invokeRestart <- base::invokeRestart [18:41:41.963] is.null <- base::is.null [18:41:41.963] muffled <- FALSE [18:41:41.963] if (inherits(cond, "message")) { [18:41:41.963] muffled <- grepl(pattern, "muffleMessage") [18:41:41.963] if (muffled) [18:41:41.963] invokeRestart("muffleMessage") [18:41:41.963] } [18:41:41.963] else if (inherits(cond, "warning")) { [18:41:41.963] muffled <- grepl(pattern, "muffleWarning") [18:41:41.963] if (muffled) [18:41:41.963] invokeRestart("muffleWarning") [18:41:41.963] } [18:41:41.963] else if (inherits(cond, "condition")) { [18:41:41.963] if (!is.null(pattern)) { [18:41:41.963] computeRestarts <- base::computeRestarts [18:41:41.963] grepl <- base::grepl [18:41:41.963] restarts <- computeRestarts(cond) [18:41:41.963] for (restart in restarts) { [18:41:41.963] name <- restart$name [18:41:41.963] if (is.null(name)) [18:41:41.963] next [18:41:41.963] if (!grepl(pattern, name)) [18:41:41.963] next [18:41:41.963] invokeRestart(restart) [18:41:41.963] muffled <- TRUE [18:41:41.963] break [18:41:41.963] } [18:41:41.963] } [18:41:41.963] } [18:41:41.963] invisible(muffled) [18:41:41.963] } [18:41:41.963] muffleCondition(cond, pattern = "^muffle") [18:41:41.963] } [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] if (TRUE) { [18:41:41.963] muffleCondition <- function (cond, pattern = "^muffle") [18:41:41.963] { [18:41:41.963] inherits <- base::inherits [18:41:41.963] invokeRestart <- base::invokeRestart [18:41:41.963] is.null <- base::is.null [18:41:41.963] muffled <- FALSE [18:41:41.963] if (inherits(cond, "message")) { [18:41:41.963] muffled <- grepl(pattern, "muffleMessage") [18:41:41.963] if (muffled) [18:41:41.963] invokeRestart("muffleMessage") [18:41:41.963] } [18:41:41.963] else if (inherits(cond, "warning")) { [18:41:41.963] muffled <- grepl(pattern, "muffleWarning") [18:41:41.963] if (muffled) [18:41:41.963] invokeRestart("muffleWarning") [18:41:41.963] } [18:41:41.963] else if (inherits(cond, "condition")) { [18:41:41.963] if (!is.null(pattern)) { [18:41:41.963] computeRestarts <- base::computeRestarts [18:41:41.963] grepl <- base::grepl [18:41:41.963] restarts <- computeRestarts(cond) [18:41:41.963] for (restart in restarts) { [18:41:41.963] name <- restart$name [18:41:41.963] if (is.null(name)) [18:41:41.963] next [18:41:41.963] if (!grepl(pattern, name)) [18:41:41.963] next [18:41:41.963] invokeRestart(restart) [18:41:41.963] muffled <- TRUE [18:41:41.963] break [18:41:41.963] } [18:41:41.963] } [18:41:41.963] } [18:41:41.963] invisible(muffled) [18:41:41.963] } [18:41:41.963] muffleCondition(cond, pattern = "^muffle") [18:41:41.963] } [18:41:41.963] } [18:41:41.963] } [18:41:41.963] })) [18:41:41.963] }, error = function(ex) { [18:41:41.963] base::structure(base::list(value = NULL, visible = NULL, [18:41:41.963] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:41.963] ...future.rng), started = ...future.startTime, [18:41:41.963] finished = Sys.time(), session_uuid = NA_character_, [18:41:41.963] version = "1.8"), class = "FutureResult") [18:41:41.963] }, finally = { [18:41:41.963] if (!identical(...future.workdir, getwd())) [18:41:41.963] setwd(...future.workdir) [18:41:41.963] { [18:41:41.963] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:41.963] ...future.oldOptions$nwarnings <- NULL [18:41:41.963] } [18:41:41.963] base::options(...future.oldOptions) [18:41:41.963] if (.Platform$OS.type == "windows") { [18:41:41.963] old_names <- names(...future.oldEnvVars) [18:41:41.963] envs <- base::Sys.getenv() [18:41:41.963] names <- names(envs) [18:41:41.963] common <- intersect(names, old_names) [18:41:41.963] added <- setdiff(names, old_names) [18:41:41.963] removed <- setdiff(old_names, names) [18:41:41.963] changed <- common[...future.oldEnvVars[common] != [18:41:41.963] envs[common]] [18:41:41.963] NAMES <- toupper(changed) [18:41:41.963] args <- list() [18:41:41.963] for (kk in seq_along(NAMES)) { [18:41:41.963] name <- changed[[kk]] [18:41:41.963] NAME <- NAMES[[kk]] [18:41:41.963] if (name != NAME && is.element(NAME, old_names)) [18:41:41.963] next [18:41:41.963] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.963] } [18:41:41.963] NAMES <- toupper(added) [18:41:41.963] for (kk in seq_along(NAMES)) { [18:41:41.963] name <- added[[kk]] [18:41:41.963] NAME <- NAMES[[kk]] [18:41:41.963] if (name != NAME && is.element(NAME, old_names)) [18:41:41.963] next [18:41:41.963] args[[name]] <- "" [18:41:41.963] } [18:41:41.963] NAMES <- toupper(removed) [18:41:41.963] for (kk in seq_along(NAMES)) { [18:41:41.963] name <- removed[[kk]] [18:41:41.963] NAME <- NAMES[[kk]] [18:41:41.963] if (name != NAME && is.element(NAME, old_names)) [18:41:41.963] next [18:41:41.963] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:41.963] } [18:41:41.963] if (length(args) > 0) [18:41:41.963] base::do.call(base::Sys.setenv, args = args) [18:41:41.963] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:41.963] } [18:41:41.963] { [18:41:41.963] if (base::length(...future.futureOptionsAdded) > [18:41:41.963] 0L) { [18:41:41.963] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:41.963] base::names(opts) <- ...future.futureOptionsAdded [18:41:41.963] base::options(opts) [18:41:41.963] } [18:41:41.963] { [18:41:41.963] { [18:41:41.963] NULL [18:41:41.963] RNGkind("Mersenne-Twister") [18:41:41.963] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:41.963] inherits = FALSE) [18:41:41.963] } [18:41:41.963] options(future.plan = NULL) [18:41:41.963] if (is.na(NA_character_)) [18:41:41.963] Sys.unsetenv("R_FUTURE_PLAN") [18:41:41.963] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:41.963] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:41.963] .init = FALSE) [18:41:41.963] } [18:41:41.963] } [18:41:41.963] } [18:41:41.963] }) [18:41:41.963] if (TRUE) { [18:41:41.963] base::sink(type = "output", split = FALSE) [18:41:41.963] if (TRUE) { [18:41:41.963] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:41.963] } [18:41:41.963] else { [18:41:41.963] ...future.result["stdout"] <- base::list(NULL) [18:41:41.963] } [18:41:41.963] base::close(...future.stdout) [18:41:41.963] ...future.stdout <- NULL [18:41:41.963] } [18:41:41.963] ...future.result$conditions <- ...future.conditions [18:41:41.963] ...future.result$finished <- base::Sys.time() [18:41:41.963] ...future.result [18:41:41.963] } [18:41:41.969] assign_globals() ... [18:41:41.970] List of 5 [18:41:41.970] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:41.970] $ future.call.arguments : list() [18:41:41.970] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:41.970] $ ...future.elements_ii :List of 6 [18:41:41.970] ..$ a1: int 1 [18:41:41.970] ..$ a2: int 2 [18:41:41.970] ..$ b1: int 2 [18:41:41.970] ..$ b2: int 3 [18:41:41.970] ..$ c1: int 3 [18:41:41.970] ..$ c2: int 4 [18:41:41.970] $ ...future.seeds_ii : NULL [18:41:41.970] $ ...future.globals.maxSize: NULL [18:41:41.970] - attr(*, "where")=List of 5 [18:41:41.970] ..$ ...future.FUN : [18:41:41.970] ..$ future.call.arguments : [18:41:41.970] ..$ ...future.elements_ii : [18:41:41.970] ..$ ...future.seeds_ii : [18:41:41.970] ..$ ...future.globals.maxSize: [18:41:41.970] - attr(*, "resolved")= logi FALSE [18:41:41.970] - attr(*, "total_size")= num 6664 [18:41:41.970] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:41.970] - attr(*, "already-done")= logi TRUE [18:41:41.981] - reassign environment for '...future.FUN' [18:41:41.982] - copied '...future.FUN' to environment [18:41:41.982] - copied 'future.call.arguments' to environment [18:41:41.982] - copied '...future.elements_ii' to environment [18:41:41.982] - copied '...future.seeds_ii' to environment [18:41:41.983] - copied '...future.globals.maxSize' to environment [18:41:41.983] assign_globals() ... done [18:41:41.983] plan(): Setting new future strategy stack: [18:41:41.984] List of future strategies: [18:41:41.984] 1. sequential: [18:41:41.984] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.984] - tweaked: FALSE [18:41:41.984] - call: NULL [18:41:41.985] plan(): nbrOfWorkers() = 1 [18:41:41.987] plan(): Setting new future strategy stack: [18:41:41.987] List of future strategies: [18:41:41.987] 1. sequential: [18:41:41.987] - args: function (..., envir = parent.frame(), workers = "") [18:41:41.987] - tweaked: FALSE [18:41:41.987] - call: plan(strategy) [18:41:41.988] plan(): nbrOfWorkers() = 1 [18:41:41.988] SequentialFuture started (and completed) [18:41:41.989] - Launch lazy future ... done [18:41:41.989] run() for 'SequentialFuture' ... done [18:41:41.989] Created future: [18:41:41.990] SequentialFuture: [18:41:41.990] Label: 'future_sapply-1' [18:41:41.990] Expression: [18:41:41.990] { [18:41:41.990] do.call(function(...) { [18:41:41.990] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:41.990] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:41.990] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:41.990] on.exit(options(oopts), add = TRUE) [18:41:41.990] } [18:41:41.990] { [18:41:41.990] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:41.990] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:41.990] ...future.FUN(...future.X_jj, ...) [18:41:41.990] }) [18:41:41.990] } [18:41:41.990] }, args = future.call.arguments) [18:41:41.990] } [18:41:41.990] Lazy evaluation: FALSE [18:41:41.990] Asynchronous evaluation: FALSE [18:41:41.990] Local evaluation: TRUE [18:41:41.990] Environment: R_GlobalEnv [18:41:41.990] Capture standard output: TRUE [18:41:41.990] Capture condition classes: 'condition' (excluding 'nothing') [18:41:41.990] Globals: 5 objects totaling 1.10 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:41.990] Packages: [18:41:41.990] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:41.990] Resolved: TRUE [18:41:41.990] Value: 978 bytes of class 'list' [18:41:41.990] Early signaling: FALSE [18:41:41.990] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:41.990] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:41.991] Chunk #1 of 1 ... DONE [18:41:41.992] Launching 1 futures (chunks) ... DONE [18:41:41.992] Resolving 1 futures (chunks) ... [18:41:41.992] resolve() on list ... [18:41:41.992] recursive: 0 [18:41:41.993] length: 1 [18:41:41.993] [18:41:41.993] resolved() for 'SequentialFuture' ... [18:41:41.993] - state: 'finished' [18:41:41.994] - run: TRUE [18:41:41.994] - result: 'FutureResult' [18:41:41.994] resolved() for 'SequentialFuture' ... done [18:41:41.995] Future #1 [18:41:41.995] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:41.995] - nx: 1 [18:41:41.995] - relay: TRUE [18:41:41.996] - stdout: TRUE [18:41:41.996] - signal: TRUE [18:41:41.996] - resignal: FALSE [18:41:41.996] - force: TRUE [18:41:41.997] - relayed: [n=1] FALSE [18:41:41.997] - queued futures: [n=1] FALSE [18:41:41.997] - until=1 [18:41:41.997] - relaying element #1 [18:41:41.998] - relayed: [n=1] TRUE [18:41:41.998] - queued futures: [n=1] TRUE [18:41:41.998] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:41.999] length: 0 (resolved future 1) [18:41:41.999] Relaying remaining futures [18:41:41.999] signalConditionsASAP(NULL, pos=0) ... [18:41:42.000] - nx: 1 [18:41:42.000] - relay: TRUE [18:41:42.000] - stdout: TRUE [18:41:42.000] - signal: TRUE [18:41:42.001] - resignal: FALSE [18:41:42.001] - force: TRUE [18:41:42.001] - relayed: [n=1] TRUE [18:41:42.001] - queued futures: [n=1] TRUE - flush all [18:41:42.002] - relayed: [n=1] TRUE [18:41:42.002] - queued futures: [n=1] TRUE [18:41:42.003] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.003] resolve() on list ... DONE [18:41:42.003] - Number of value chunks collected: 1 [18:41:42.003] Resolving 1 futures (chunks) ... DONE [18:41:42.004] Reducing values from 1 chunks ... [18:41:42.004] - Number of values collected after concatenation: 6 [18:41:42.004] - Number of values expected: 6 [18:41:42.005] Reducing values from 1 chunks ... DONE [18:41:42.005] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.011] future_lapply() ... [18:41:42.012] Number of chunks: 1 [18:41:42.012] getGlobalsAndPackagesXApply() ... [18:41:42.012] - future.globals: TRUE [18:41:42.013] getGlobalsAndPackages() ... [18:41:42.013] Searching for globals... [18:41:42.015] - globals found: [1] 'FUN' [18:41:42.015] Searching for globals ... DONE [18:41:42.015] Resolving globals: FALSE [18:41:42.016] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:42.017] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:42.017] - globals: [1] 'FUN' [18:41:42.017] [18:41:42.018] getGlobalsAndPackages() ... DONE [18:41:42.018] - globals found/used: [n=1] 'FUN' [18:41:42.018] - needed namespaces: [n=0] [18:41:42.019] Finding globals ... DONE [18:41:42.019] - use_args: TRUE [18:41:42.019] - Getting '...' globals ... [18:41:42.020] resolve() on list ... [18:41:42.020] recursive: 0 [18:41:42.021] length: 1 [18:41:42.021] elements: '...' [18:41:42.021] length: 0 (resolved future 1) [18:41:42.021] resolve() on list ... DONE [18:41:42.022] - '...' content: [n=0] [18:41:42.022] List of 1 [18:41:42.022] $ ...: list() [18:41:42.022] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.022] - attr(*, "where")=List of 1 [18:41:42.022] ..$ ...: [18:41:42.022] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.022] - attr(*, "resolved")= logi TRUE [18:41:42.022] - attr(*, "total_size")= num NA [18:41:42.027] - Getting '...' globals ... DONE [18:41:42.027] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.028] List of 2 [18:41:42.028] $ ...future.FUN:function (x) [18:41:42.028] $ ... : list() [18:41:42.028] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.028] - attr(*, "where")=List of 2 [18:41:42.028] ..$ ...future.FUN: [18:41:42.028] ..$ ... : [18:41:42.028] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.028] - attr(*, "resolved")= logi FALSE [18:41:42.028] - attr(*, "total_size")= int 4942 [18:41:42.033] Packages to be attached in all futures: [n=0] [18:41:42.034] getGlobalsAndPackagesXApply() ... DONE [18:41:42.034] Number of futures (= number of chunks): 1 [18:41:42.035] Launching 1 futures (chunks) ... [18:41:42.035] Chunk #1 of 1 ... [18:41:42.035] - Finding globals in 'X' for chunk #1 ... [18:41:42.036] getGlobalsAndPackages() ... [18:41:42.036] Searching for globals... [18:41:42.036] [18:41:42.037] Searching for globals ... DONE [18:41:42.037] - globals: [0] [18:41:42.037] getGlobalsAndPackages() ... DONE [18:41:42.037] + additional globals found: [n=0] [18:41:42.038] + additional namespaces needed: [n=0] [18:41:42.038] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.038] - seeds: [18:41:42.039] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.039] getGlobalsAndPackages() ... [18:41:42.039] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.040] Resolving globals: FALSE [18:41:42.040] Tweak future expression to call with '...' arguments ... [18:41:42.040] { [18:41:42.040] do.call(function(...) { [18:41:42.040] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.040] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.040] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.040] on.exit(options(oopts), add = TRUE) [18:41:42.040] } [18:41:42.040] { [18:41:42.040] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.040] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.040] ...future.FUN(...future.X_jj, ...) [18:41:42.040] }) [18:41:42.040] } [18:41:42.040] }, args = future.call.arguments) [18:41:42.040] } [18:41:42.041] Tweak future expression to call with '...' arguments ... DONE [18:41:42.042] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.042] [18:41:42.042] getGlobalsAndPackages() ... DONE [18:41:42.043] run() for 'Future' ... [18:41:42.043] - state: 'created' [18:41:42.044] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.044] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.045] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.045] - Field: 'label' [18:41:42.045] - Field: 'local' [18:41:42.046] - Field: 'owner' [18:41:42.046] - Field: 'envir' [18:41:42.046] - Field: 'packages' [18:41:42.047] - Field: 'gc' [18:41:42.047] - Field: 'conditions' [18:41:42.047] - Field: 'expr' [18:41:42.048] - Field: 'uuid' [18:41:42.048] - Field: 'seed' [18:41:42.048] - Field: 'version' [18:41:42.049] - Field: 'result' [18:41:42.049] - Field: 'asynchronous' [18:41:42.049] - Field: 'calls' [18:41:42.050] - Field: 'globals' [18:41:42.050] - Field: 'stdout' [18:41:42.050] - Field: 'earlySignal' [18:41:42.050] - Field: 'lazy' [18:41:42.051] - Field: 'state' [18:41:42.051] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.051] - Launch lazy future ... [18:41:42.052] Packages needed by the future expression (n = 0): [18:41:42.052] Packages needed by future strategies (n = 0): [18:41:42.053] { [18:41:42.053] { [18:41:42.053] { [18:41:42.053] ...future.startTime <- base::Sys.time() [18:41:42.053] { [18:41:42.053] { [18:41:42.053] { [18:41:42.053] base::local({ [18:41:42.053] has_future <- base::requireNamespace("future", [18:41:42.053] quietly = TRUE) [18:41:42.053] if (has_future) { [18:41:42.053] ns <- base::getNamespace("future") [18:41:42.053] version <- ns[[".package"]][["version"]] [18:41:42.053] if (is.null(version)) [18:41:42.053] version <- utils::packageVersion("future") [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] version <- NULL [18:41:42.053] } [18:41:42.053] if (!has_future || version < "1.8.0") { [18:41:42.053] info <- base::c(r_version = base::gsub("R version ", [18:41:42.053] "", base::R.version$version.string), [18:41:42.053] platform = base::sprintf("%s (%s-bit)", [18:41:42.053] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.053] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.053] "release", "version")], collapse = " "), [18:41:42.053] hostname = base::Sys.info()[["nodename"]]) [18:41:42.053] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.053] info) [18:41:42.053] info <- base::paste(info, collapse = "; ") [18:41:42.053] if (!has_future) { [18:41:42.053] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.053] info) [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.053] info, version) [18:41:42.053] } [18:41:42.053] base::stop(msg) [18:41:42.053] } [18:41:42.053] }) [18:41:42.053] } [18:41:42.053] ...future.strategy.old <- future::plan("list") [18:41:42.053] options(future.plan = NULL) [18:41:42.053] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.053] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.053] } [18:41:42.053] ...future.workdir <- getwd() [18:41:42.053] } [18:41:42.053] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.053] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.053] } [18:41:42.053] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.053] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.053] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.053] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.053] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.053] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.053] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.053] base::names(...future.oldOptions)) [18:41:42.053] } [18:41:42.053] if (FALSE) { [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] if (TRUE) { [18:41:42.053] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.053] open = "w") [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.053] windows = "NUL", "/dev/null"), open = "w") [18:41:42.053] } [18:41:42.053] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.053] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.053] base::sink(type = "output", split = FALSE) [18:41:42.053] base::close(...future.stdout) [18:41:42.053] }, add = TRUE) [18:41:42.053] } [18:41:42.053] ...future.frame <- base::sys.nframe() [18:41:42.053] ...future.conditions <- base::list() [18:41:42.053] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.053] if (FALSE) { [18:41:42.053] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.053] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.053] } [18:41:42.053] ...future.result <- base::tryCatch({ [18:41:42.053] base::withCallingHandlers({ [18:41:42.053] ...future.value <- base::withVisible(base::local({ [18:41:42.053] do.call(function(...) { [18:41:42.053] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.053] if (!identical(...future.globals.maxSize.org, [18:41:42.053] ...future.globals.maxSize)) { [18:41:42.053] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.053] on.exit(options(oopts), add = TRUE) [18:41:42.053] } [18:41:42.053] { [18:41:42.053] lapply(seq_along(...future.elements_ii), [18:41:42.053] FUN = function(jj) { [18:41:42.053] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.053] ...future.FUN(...future.X_jj, ...) [18:41:42.053] }) [18:41:42.053] } [18:41:42.053] }, args = future.call.arguments) [18:41:42.053] })) [18:41:42.053] future::FutureResult(value = ...future.value$value, [18:41:42.053] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.053] ...future.rng), globalenv = if (FALSE) [18:41:42.053] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.053] ...future.globalenv.names)) [18:41:42.053] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.053] }, condition = base::local({ [18:41:42.053] c <- base::c [18:41:42.053] inherits <- base::inherits [18:41:42.053] invokeRestart <- base::invokeRestart [18:41:42.053] length <- base::length [18:41:42.053] list <- base::list [18:41:42.053] seq.int <- base::seq.int [18:41:42.053] signalCondition <- base::signalCondition [18:41:42.053] sys.calls <- base::sys.calls [18:41:42.053] `[[` <- base::`[[` [18:41:42.053] `+` <- base::`+` [18:41:42.053] `<<-` <- base::`<<-` [18:41:42.053] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.053] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.053] 3L)] [18:41:42.053] } [18:41:42.053] function(cond) { [18:41:42.053] is_error <- inherits(cond, "error") [18:41:42.053] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.053] NULL) [18:41:42.053] if (is_error) { [18:41:42.053] sessionInformation <- function() { [18:41:42.053] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.053] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.053] search = base::search(), system = base::Sys.info()) [18:41:42.053] } [18:41:42.053] ...future.conditions[[length(...future.conditions) + [18:41:42.053] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.053] cond$call), session = sessionInformation(), [18:41:42.053] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.053] signalCondition(cond) [18:41:42.053] } [18:41:42.053] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.053] "immediateCondition"))) { [18:41:42.053] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.053] ...future.conditions[[length(...future.conditions) + [18:41:42.053] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.053] if (TRUE && !signal) { [18:41:42.053] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.053] { [18:41:42.053] inherits <- base::inherits [18:41:42.053] invokeRestart <- base::invokeRestart [18:41:42.053] is.null <- base::is.null [18:41:42.053] muffled <- FALSE [18:41:42.053] if (inherits(cond, "message")) { [18:41:42.053] muffled <- grepl(pattern, "muffleMessage") [18:41:42.053] if (muffled) [18:41:42.053] invokeRestart("muffleMessage") [18:41:42.053] } [18:41:42.053] else if (inherits(cond, "warning")) { [18:41:42.053] muffled <- grepl(pattern, "muffleWarning") [18:41:42.053] if (muffled) [18:41:42.053] invokeRestart("muffleWarning") [18:41:42.053] } [18:41:42.053] else if (inherits(cond, "condition")) { [18:41:42.053] if (!is.null(pattern)) { [18:41:42.053] computeRestarts <- base::computeRestarts [18:41:42.053] grepl <- base::grepl [18:41:42.053] restarts <- computeRestarts(cond) [18:41:42.053] for (restart in restarts) { [18:41:42.053] name <- restart$name [18:41:42.053] if (is.null(name)) [18:41:42.053] next [18:41:42.053] if (!grepl(pattern, name)) [18:41:42.053] next [18:41:42.053] invokeRestart(restart) [18:41:42.053] muffled <- TRUE [18:41:42.053] break [18:41:42.053] } [18:41:42.053] } [18:41:42.053] } [18:41:42.053] invisible(muffled) [18:41:42.053] } [18:41:42.053] muffleCondition(cond, pattern = "^muffle") [18:41:42.053] } [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] if (TRUE) { [18:41:42.053] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.053] { [18:41:42.053] inherits <- base::inherits [18:41:42.053] invokeRestart <- base::invokeRestart [18:41:42.053] is.null <- base::is.null [18:41:42.053] muffled <- FALSE [18:41:42.053] if (inherits(cond, "message")) { [18:41:42.053] muffled <- grepl(pattern, "muffleMessage") [18:41:42.053] if (muffled) [18:41:42.053] invokeRestart("muffleMessage") [18:41:42.053] } [18:41:42.053] else if (inherits(cond, "warning")) { [18:41:42.053] muffled <- grepl(pattern, "muffleWarning") [18:41:42.053] if (muffled) [18:41:42.053] invokeRestart("muffleWarning") [18:41:42.053] } [18:41:42.053] else if (inherits(cond, "condition")) { [18:41:42.053] if (!is.null(pattern)) { [18:41:42.053] computeRestarts <- base::computeRestarts [18:41:42.053] grepl <- base::grepl [18:41:42.053] restarts <- computeRestarts(cond) [18:41:42.053] for (restart in restarts) { [18:41:42.053] name <- restart$name [18:41:42.053] if (is.null(name)) [18:41:42.053] next [18:41:42.053] if (!grepl(pattern, name)) [18:41:42.053] next [18:41:42.053] invokeRestart(restart) [18:41:42.053] muffled <- TRUE [18:41:42.053] break [18:41:42.053] } [18:41:42.053] } [18:41:42.053] } [18:41:42.053] invisible(muffled) [18:41:42.053] } [18:41:42.053] muffleCondition(cond, pattern = "^muffle") [18:41:42.053] } [18:41:42.053] } [18:41:42.053] } [18:41:42.053] })) [18:41:42.053] }, error = function(ex) { [18:41:42.053] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.053] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.053] ...future.rng), started = ...future.startTime, [18:41:42.053] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.053] version = "1.8"), class = "FutureResult") [18:41:42.053] }, finally = { [18:41:42.053] if (!identical(...future.workdir, getwd())) [18:41:42.053] setwd(...future.workdir) [18:41:42.053] { [18:41:42.053] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.053] ...future.oldOptions$nwarnings <- NULL [18:41:42.053] } [18:41:42.053] base::options(...future.oldOptions) [18:41:42.053] if (.Platform$OS.type == "windows") { [18:41:42.053] old_names <- names(...future.oldEnvVars) [18:41:42.053] envs <- base::Sys.getenv() [18:41:42.053] names <- names(envs) [18:41:42.053] common <- intersect(names, old_names) [18:41:42.053] added <- setdiff(names, old_names) [18:41:42.053] removed <- setdiff(old_names, names) [18:41:42.053] changed <- common[...future.oldEnvVars[common] != [18:41:42.053] envs[common]] [18:41:42.053] NAMES <- toupper(changed) [18:41:42.053] args <- list() [18:41:42.053] for (kk in seq_along(NAMES)) { [18:41:42.053] name <- changed[[kk]] [18:41:42.053] NAME <- NAMES[[kk]] [18:41:42.053] if (name != NAME && is.element(NAME, old_names)) [18:41:42.053] next [18:41:42.053] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.053] } [18:41:42.053] NAMES <- toupper(added) [18:41:42.053] for (kk in seq_along(NAMES)) { [18:41:42.053] name <- added[[kk]] [18:41:42.053] NAME <- NAMES[[kk]] [18:41:42.053] if (name != NAME && is.element(NAME, old_names)) [18:41:42.053] next [18:41:42.053] args[[name]] <- "" [18:41:42.053] } [18:41:42.053] NAMES <- toupper(removed) [18:41:42.053] for (kk in seq_along(NAMES)) { [18:41:42.053] name <- removed[[kk]] [18:41:42.053] NAME <- NAMES[[kk]] [18:41:42.053] if (name != NAME && is.element(NAME, old_names)) [18:41:42.053] next [18:41:42.053] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.053] } [18:41:42.053] if (length(args) > 0) [18:41:42.053] base::do.call(base::Sys.setenv, args = args) [18:41:42.053] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.053] } [18:41:42.053] { [18:41:42.053] if (base::length(...future.futureOptionsAdded) > [18:41:42.053] 0L) { [18:41:42.053] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.053] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.053] base::options(opts) [18:41:42.053] } [18:41:42.053] { [18:41:42.053] { [18:41:42.053] NULL [18:41:42.053] RNGkind("Mersenne-Twister") [18:41:42.053] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.053] inherits = FALSE) [18:41:42.053] } [18:41:42.053] options(future.plan = NULL) [18:41:42.053] if (is.na(NA_character_)) [18:41:42.053] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.053] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.053] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.053] .init = FALSE) [18:41:42.053] } [18:41:42.053] } [18:41:42.053] } [18:41:42.053] }) [18:41:42.053] if (TRUE) { [18:41:42.053] base::sink(type = "output", split = FALSE) [18:41:42.053] if (TRUE) { [18:41:42.053] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.053] } [18:41:42.053] else { [18:41:42.053] ...future.result["stdout"] <- base::list(NULL) [18:41:42.053] } [18:41:42.053] base::close(...future.stdout) [18:41:42.053] ...future.stdout <- NULL [18:41:42.053] } [18:41:42.053] ...future.result$conditions <- ...future.conditions [18:41:42.053] ...future.result$finished <- base::Sys.time() [18:41:42.053] ...future.result [18:41:42.053] } [18:41:42.060] assign_globals() ... [18:41:42.060] List of 5 [18:41:42.060] $ ...future.FUN :function (x) [18:41:42.060] $ future.call.arguments : list() [18:41:42.060] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.060] $ ...future.elements_ii :List of 6 [18:41:42.060] ..$ a1: int 1 [18:41:42.060] ..$ a2: int 2 [18:41:42.060] ..$ b1: int 2 [18:41:42.060] ..$ b2: int 3 [18:41:42.060] ..$ c1: int 3 [18:41:42.060] ..$ c2: int 4 [18:41:42.060] $ ...future.seeds_ii : NULL [18:41:42.060] $ ...future.globals.maxSize: NULL [18:41:42.060] - attr(*, "where")=List of 5 [18:41:42.060] ..$ ...future.FUN : [18:41:42.060] ..$ future.call.arguments : [18:41:42.060] ..$ ...future.elements_ii : [18:41:42.060] ..$ ...future.seeds_ii : [18:41:42.060] ..$ ...future.globals.maxSize: [18:41:42.060] - attr(*, "resolved")= logi FALSE [18:41:42.060] - attr(*, "total_size")= num 4942 [18:41:42.060] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.060] - attr(*, "already-done")= logi TRUE [18:41:42.074] - copied '...future.FUN' to environment [18:41:42.075] - copied 'future.call.arguments' to environment [18:41:42.075] - copied '...future.elements_ii' to environment [18:41:42.075] - copied '...future.seeds_ii' to environment [18:41:42.076] - copied '...future.globals.maxSize' to environment [18:41:42.076] assign_globals() ... done [18:41:42.077] plan(): Setting new future strategy stack: [18:41:42.077] List of future strategies: [18:41:42.077] 1. sequential: [18:41:42.077] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.077] - tweaked: FALSE [18:41:42.077] - call: NULL [18:41:42.078] plan(): nbrOfWorkers() = 1 [18:41:42.080] plan(): Setting new future strategy stack: [18:41:42.081] List of future strategies: [18:41:42.081] 1. sequential: [18:41:42.081] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.081] - tweaked: FALSE [18:41:42.081] - call: plan(strategy) [18:41:42.082] plan(): nbrOfWorkers() = 1 [18:41:42.082] SequentialFuture started (and completed) [18:41:42.083] - Launch lazy future ... done [18:41:42.083] run() for 'SequentialFuture' ... done [18:41:42.083] Created future: [18:41:42.084] SequentialFuture: [18:41:42.084] Label: 'future_sapply-1' [18:41:42.084] Expression: [18:41:42.084] { [18:41:42.084] do.call(function(...) { [18:41:42.084] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.084] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.084] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.084] on.exit(options(oopts), add = TRUE) [18:41:42.084] } [18:41:42.084] { [18:41:42.084] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.084] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.084] ...future.FUN(...future.X_jj, ...) [18:41:42.084] }) [18:41:42.084] } [18:41:42.084] }, args = future.call.arguments) [18:41:42.084] } [18:41:42.084] Lazy evaluation: FALSE [18:41:42.084] Asynchronous evaluation: FALSE [18:41:42.084] Local evaluation: TRUE [18:41:42.084] Environment: R_GlobalEnv [18:41:42.084] Capture standard output: TRUE [18:41:42.084] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.084] Globals: 5 objects totaling 532 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.084] Packages: [18:41:42.084] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.084] Resolved: TRUE [18:41:42.084] Value: 103 bytes of class 'list' [18:41:42.084] Early signaling: FALSE [18:41:42.084] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.084] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.085] Chunk #1 of 1 ... DONE [18:41:42.086] Launching 1 futures (chunks) ... DONE [18:41:42.086] Resolving 1 futures (chunks) ... [18:41:42.086] resolve() on list ... [18:41:42.087] recursive: 0 [18:41:42.087] length: 1 [18:41:42.087] [18:41:42.087] resolved() for 'SequentialFuture' ... [18:41:42.088] - state: 'finished' [18:41:42.088] - run: TRUE [18:41:42.088] - result: 'FutureResult' [18:41:42.089] resolved() for 'SequentialFuture' ... done [18:41:42.089] Future #1 [18:41:42.089] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.090] - nx: 1 [18:41:42.090] - relay: TRUE [18:41:42.090] - stdout: TRUE [18:41:42.091] - signal: TRUE [18:41:42.091] - resignal: FALSE [18:41:42.091] - force: TRUE [18:41:42.091] - relayed: [n=1] FALSE [18:41:42.092] - queued futures: [n=1] FALSE [18:41:42.092] - until=1 [18:41:42.092] - relaying element #1 [18:41:42.093] - relayed: [n=1] TRUE [18:41:42.093] - queued futures: [n=1] TRUE [18:41:42.093] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.094] length: 0 (resolved future 1) [18:41:42.094] Relaying remaining futures [18:41:42.094] signalConditionsASAP(NULL, pos=0) ... [18:41:42.094] - nx: 1 [18:41:42.095] - relay: TRUE [18:41:42.095] - stdout: TRUE [18:41:42.095] - signal: TRUE [18:41:42.095] - resignal: FALSE [18:41:42.096] - force: TRUE [18:41:42.096] - relayed: [n=1] TRUE [18:41:42.096] - queued futures: [n=1] TRUE - flush all [18:41:42.097] - relayed: [n=1] TRUE [18:41:42.097] - queued futures: [n=1] TRUE [18:41:42.097] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.098] resolve() on list ... DONE [18:41:42.098] - Number of value chunks collected: 1 [18:41:42.098] Resolving 1 futures (chunks) ... DONE [18:41:42.099] Reducing values from 1 chunks ... [18:41:42.099] - Number of values collected after concatenation: 6 [18:41:42.099] - Number of values expected: 6 [18:41:42.099] Reducing values from 1 chunks ... DONE [18:41:42.100] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.103] future_lapply() ... [18:41:42.104] Number of chunks: 1 [18:41:42.104] getGlobalsAndPackagesXApply() ... [18:41:42.105] - future.globals: TRUE [18:41:42.105] getGlobalsAndPackages() ... [18:41:42.105] Searching for globals... [18:41:42.107] - globals found: [2] 'FUN', 'UseMethod' [18:41:42.108] Searching for globals ... DONE [18:41:42.108] Resolving globals: FALSE [18:41:42.109] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:42.110] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:42.110] - globals: [1] 'FUN' [18:41:42.110] [18:41:42.111] getGlobalsAndPackages() ... DONE [18:41:42.111] - globals found/used: [n=1] 'FUN' [18:41:42.111] - needed namespaces: [n=0] [18:41:42.111] Finding globals ... DONE [18:41:42.112] - use_args: TRUE [18:41:42.112] - Getting '...' globals ... [18:41:42.113] resolve() on list ... [18:41:42.113] recursive: 0 [18:41:42.113] length: 1 [18:41:42.114] elements: '...' [18:41:42.114] length: 0 (resolved future 1) [18:41:42.114] resolve() on list ... DONE [18:41:42.115] - '...' content: [n=0] [18:41:42.115] List of 1 [18:41:42.115] $ ...: list() [18:41:42.115] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.115] - attr(*, "where")=List of 1 [18:41:42.115] ..$ ...: [18:41:42.115] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.115] - attr(*, "resolved")= logi TRUE [18:41:42.115] - attr(*, "total_size")= num NA [18:41:42.120] - Getting '...' globals ... DONE [18:41:42.121] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.121] List of 2 [18:41:42.121] $ ...future.FUN:function (x, ...) [18:41:42.121] $ ... : list() [18:41:42.121] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.121] - attr(*, "where")=List of 2 [18:41:42.121] ..$ ...future.FUN: [18:41:42.121] ..$ ... : [18:41:42.121] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.121] - attr(*, "resolved")= logi FALSE [18:41:42.121] - attr(*, "total_size")= int 5182 [18:41:42.129] Packages to be attached in all futures: [n=0] [18:41:42.130] getGlobalsAndPackagesXApply() ... DONE [18:41:42.130] Number of futures (= number of chunks): 1 [18:41:42.130] Launching 1 futures (chunks) ... [18:41:42.131] Chunk #1 of 1 ... [18:41:42.131] - Finding globals in 'X' for chunk #1 ... [18:41:42.131] getGlobalsAndPackages() ... [18:41:42.131] Searching for globals... [18:41:42.132] [18:41:42.132] Searching for globals ... DONE [18:41:42.132] - globals: [0] [18:41:42.133] getGlobalsAndPackages() ... DONE [18:41:42.133] + additional globals found: [n=0] [18:41:42.133] + additional namespaces needed: [n=0] [18:41:42.133] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.134] - seeds: [18:41:42.134] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.134] getGlobalsAndPackages() ... [18:41:42.134] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.135] Resolving globals: FALSE [18:41:42.135] Tweak future expression to call with '...' arguments ... [18:41:42.135] { [18:41:42.135] do.call(function(...) { [18:41:42.135] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.135] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.135] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.135] on.exit(options(oopts), add = TRUE) [18:41:42.135] } [18:41:42.135] { [18:41:42.135] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.135] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.135] ...future.FUN(...future.X_jj, ...) [18:41:42.135] }) [18:41:42.135] } [18:41:42.135] }, args = future.call.arguments) [18:41:42.135] } [18:41:42.136] Tweak future expression to call with '...' arguments ... DONE [18:41:42.137] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.137] [18:41:42.137] getGlobalsAndPackages() ... DONE [18:41:42.138] run() for 'Future' ... [18:41:42.138] - state: 'created' [18:41:42.138] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.139] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.139] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.140] - Field: 'label' [18:41:42.140] - Field: 'local' [18:41:42.140] - Field: 'owner' [18:41:42.140] - Field: 'envir' [18:41:42.141] - Field: 'packages' [18:41:42.141] - Field: 'gc' [18:41:42.141] - Field: 'conditions' [18:41:42.141] - Field: 'expr' [18:41:42.142] - Field: 'uuid' [18:41:42.142] - Field: 'seed' [18:41:42.142] - Field: 'version' [18:41:42.143] - Field: 'result' [18:41:42.143] - Field: 'asynchronous' [18:41:42.143] - Field: 'calls' [18:41:42.143] - Field: 'globals' [18:41:42.144] - Field: 'stdout' [18:41:42.144] - Field: 'earlySignal' [18:41:42.144] - Field: 'lazy' [18:41:42.145] - Field: 'state' [18:41:42.145] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.145] - Launch lazy future ... [18:41:42.146] Packages needed by the future expression (n = 0): [18:41:42.146] Packages needed by future strategies (n = 0): [18:41:42.147] { [18:41:42.147] { [18:41:42.147] { [18:41:42.147] ...future.startTime <- base::Sys.time() [18:41:42.147] { [18:41:42.147] { [18:41:42.147] { [18:41:42.147] base::local({ [18:41:42.147] has_future <- base::requireNamespace("future", [18:41:42.147] quietly = TRUE) [18:41:42.147] if (has_future) { [18:41:42.147] ns <- base::getNamespace("future") [18:41:42.147] version <- ns[[".package"]][["version"]] [18:41:42.147] if (is.null(version)) [18:41:42.147] version <- utils::packageVersion("future") [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] version <- NULL [18:41:42.147] } [18:41:42.147] if (!has_future || version < "1.8.0") { [18:41:42.147] info <- base::c(r_version = base::gsub("R version ", [18:41:42.147] "", base::R.version$version.string), [18:41:42.147] platform = base::sprintf("%s (%s-bit)", [18:41:42.147] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.147] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.147] "release", "version")], collapse = " "), [18:41:42.147] hostname = base::Sys.info()[["nodename"]]) [18:41:42.147] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.147] info) [18:41:42.147] info <- base::paste(info, collapse = "; ") [18:41:42.147] if (!has_future) { [18:41:42.147] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.147] info) [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.147] info, version) [18:41:42.147] } [18:41:42.147] base::stop(msg) [18:41:42.147] } [18:41:42.147] }) [18:41:42.147] } [18:41:42.147] ...future.strategy.old <- future::plan("list") [18:41:42.147] options(future.plan = NULL) [18:41:42.147] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.147] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.147] } [18:41:42.147] ...future.workdir <- getwd() [18:41:42.147] } [18:41:42.147] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.147] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.147] } [18:41:42.147] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.147] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.147] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.147] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.147] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.147] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.147] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.147] base::names(...future.oldOptions)) [18:41:42.147] } [18:41:42.147] if (FALSE) { [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] if (TRUE) { [18:41:42.147] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.147] open = "w") [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.147] windows = "NUL", "/dev/null"), open = "w") [18:41:42.147] } [18:41:42.147] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.147] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.147] base::sink(type = "output", split = FALSE) [18:41:42.147] base::close(...future.stdout) [18:41:42.147] }, add = TRUE) [18:41:42.147] } [18:41:42.147] ...future.frame <- base::sys.nframe() [18:41:42.147] ...future.conditions <- base::list() [18:41:42.147] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.147] if (FALSE) { [18:41:42.147] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.147] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.147] } [18:41:42.147] ...future.result <- base::tryCatch({ [18:41:42.147] base::withCallingHandlers({ [18:41:42.147] ...future.value <- base::withVisible(base::local({ [18:41:42.147] do.call(function(...) { [18:41:42.147] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.147] if (!identical(...future.globals.maxSize.org, [18:41:42.147] ...future.globals.maxSize)) { [18:41:42.147] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.147] on.exit(options(oopts), add = TRUE) [18:41:42.147] } [18:41:42.147] { [18:41:42.147] lapply(seq_along(...future.elements_ii), [18:41:42.147] FUN = function(jj) { [18:41:42.147] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.147] ...future.FUN(...future.X_jj, ...) [18:41:42.147] }) [18:41:42.147] } [18:41:42.147] }, args = future.call.arguments) [18:41:42.147] })) [18:41:42.147] future::FutureResult(value = ...future.value$value, [18:41:42.147] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.147] ...future.rng), globalenv = if (FALSE) [18:41:42.147] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.147] ...future.globalenv.names)) [18:41:42.147] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.147] }, condition = base::local({ [18:41:42.147] c <- base::c [18:41:42.147] inherits <- base::inherits [18:41:42.147] invokeRestart <- base::invokeRestart [18:41:42.147] length <- base::length [18:41:42.147] list <- base::list [18:41:42.147] seq.int <- base::seq.int [18:41:42.147] signalCondition <- base::signalCondition [18:41:42.147] sys.calls <- base::sys.calls [18:41:42.147] `[[` <- base::`[[` [18:41:42.147] `+` <- base::`+` [18:41:42.147] `<<-` <- base::`<<-` [18:41:42.147] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.147] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.147] 3L)] [18:41:42.147] } [18:41:42.147] function(cond) { [18:41:42.147] is_error <- inherits(cond, "error") [18:41:42.147] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.147] NULL) [18:41:42.147] if (is_error) { [18:41:42.147] sessionInformation <- function() { [18:41:42.147] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.147] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.147] search = base::search(), system = base::Sys.info()) [18:41:42.147] } [18:41:42.147] ...future.conditions[[length(...future.conditions) + [18:41:42.147] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.147] cond$call), session = sessionInformation(), [18:41:42.147] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.147] signalCondition(cond) [18:41:42.147] } [18:41:42.147] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.147] "immediateCondition"))) { [18:41:42.147] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.147] ...future.conditions[[length(...future.conditions) + [18:41:42.147] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.147] if (TRUE && !signal) { [18:41:42.147] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.147] { [18:41:42.147] inherits <- base::inherits [18:41:42.147] invokeRestart <- base::invokeRestart [18:41:42.147] is.null <- base::is.null [18:41:42.147] muffled <- FALSE [18:41:42.147] if (inherits(cond, "message")) { [18:41:42.147] muffled <- grepl(pattern, "muffleMessage") [18:41:42.147] if (muffled) [18:41:42.147] invokeRestart("muffleMessage") [18:41:42.147] } [18:41:42.147] else if (inherits(cond, "warning")) { [18:41:42.147] muffled <- grepl(pattern, "muffleWarning") [18:41:42.147] if (muffled) [18:41:42.147] invokeRestart("muffleWarning") [18:41:42.147] } [18:41:42.147] else if (inherits(cond, "condition")) { [18:41:42.147] if (!is.null(pattern)) { [18:41:42.147] computeRestarts <- base::computeRestarts [18:41:42.147] grepl <- base::grepl [18:41:42.147] restarts <- computeRestarts(cond) [18:41:42.147] for (restart in restarts) { [18:41:42.147] name <- restart$name [18:41:42.147] if (is.null(name)) [18:41:42.147] next [18:41:42.147] if (!grepl(pattern, name)) [18:41:42.147] next [18:41:42.147] invokeRestart(restart) [18:41:42.147] muffled <- TRUE [18:41:42.147] break [18:41:42.147] } [18:41:42.147] } [18:41:42.147] } [18:41:42.147] invisible(muffled) [18:41:42.147] } [18:41:42.147] muffleCondition(cond, pattern = "^muffle") [18:41:42.147] } [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] if (TRUE) { [18:41:42.147] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.147] { [18:41:42.147] inherits <- base::inherits [18:41:42.147] invokeRestart <- base::invokeRestart [18:41:42.147] is.null <- base::is.null [18:41:42.147] muffled <- FALSE [18:41:42.147] if (inherits(cond, "message")) { [18:41:42.147] muffled <- grepl(pattern, "muffleMessage") [18:41:42.147] if (muffled) [18:41:42.147] invokeRestart("muffleMessage") [18:41:42.147] } [18:41:42.147] else if (inherits(cond, "warning")) { [18:41:42.147] muffled <- grepl(pattern, "muffleWarning") [18:41:42.147] if (muffled) [18:41:42.147] invokeRestart("muffleWarning") [18:41:42.147] } [18:41:42.147] else if (inherits(cond, "condition")) { [18:41:42.147] if (!is.null(pattern)) { [18:41:42.147] computeRestarts <- base::computeRestarts [18:41:42.147] grepl <- base::grepl [18:41:42.147] restarts <- computeRestarts(cond) [18:41:42.147] for (restart in restarts) { [18:41:42.147] name <- restart$name [18:41:42.147] if (is.null(name)) [18:41:42.147] next [18:41:42.147] if (!grepl(pattern, name)) [18:41:42.147] next [18:41:42.147] invokeRestart(restart) [18:41:42.147] muffled <- TRUE [18:41:42.147] break [18:41:42.147] } [18:41:42.147] } [18:41:42.147] } [18:41:42.147] invisible(muffled) [18:41:42.147] } [18:41:42.147] muffleCondition(cond, pattern = "^muffle") [18:41:42.147] } [18:41:42.147] } [18:41:42.147] } [18:41:42.147] })) [18:41:42.147] }, error = function(ex) { [18:41:42.147] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.147] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.147] ...future.rng), started = ...future.startTime, [18:41:42.147] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.147] version = "1.8"), class = "FutureResult") [18:41:42.147] }, finally = { [18:41:42.147] if (!identical(...future.workdir, getwd())) [18:41:42.147] setwd(...future.workdir) [18:41:42.147] { [18:41:42.147] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.147] ...future.oldOptions$nwarnings <- NULL [18:41:42.147] } [18:41:42.147] base::options(...future.oldOptions) [18:41:42.147] if (.Platform$OS.type == "windows") { [18:41:42.147] old_names <- names(...future.oldEnvVars) [18:41:42.147] envs <- base::Sys.getenv() [18:41:42.147] names <- names(envs) [18:41:42.147] common <- intersect(names, old_names) [18:41:42.147] added <- setdiff(names, old_names) [18:41:42.147] removed <- setdiff(old_names, names) [18:41:42.147] changed <- common[...future.oldEnvVars[common] != [18:41:42.147] envs[common]] [18:41:42.147] NAMES <- toupper(changed) [18:41:42.147] args <- list() [18:41:42.147] for (kk in seq_along(NAMES)) { [18:41:42.147] name <- changed[[kk]] [18:41:42.147] NAME <- NAMES[[kk]] [18:41:42.147] if (name != NAME && is.element(NAME, old_names)) [18:41:42.147] next [18:41:42.147] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.147] } [18:41:42.147] NAMES <- toupper(added) [18:41:42.147] for (kk in seq_along(NAMES)) { [18:41:42.147] name <- added[[kk]] [18:41:42.147] NAME <- NAMES[[kk]] [18:41:42.147] if (name != NAME && is.element(NAME, old_names)) [18:41:42.147] next [18:41:42.147] args[[name]] <- "" [18:41:42.147] } [18:41:42.147] NAMES <- toupper(removed) [18:41:42.147] for (kk in seq_along(NAMES)) { [18:41:42.147] name <- removed[[kk]] [18:41:42.147] NAME <- NAMES[[kk]] [18:41:42.147] if (name != NAME && is.element(NAME, old_names)) [18:41:42.147] next [18:41:42.147] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.147] } [18:41:42.147] if (length(args) > 0) [18:41:42.147] base::do.call(base::Sys.setenv, args = args) [18:41:42.147] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.147] } [18:41:42.147] { [18:41:42.147] if (base::length(...future.futureOptionsAdded) > [18:41:42.147] 0L) { [18:41:42.147] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.147] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.147] base::options(opts) [18:41:42.147] } [18:41:42.147] { [18:41:42.147] { [18:41:42.147] NULL [18:41:42.147] RNGkind("Mersenne-Twister") [18:41:42.147] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.147] inherits = FALSE) [18:41:42.147] } [18:41:42.147] options(future.plan = NULL) [18:41:42.147] if (is.na(NA_character_)) [18:41:42.147] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.147] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.147] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.147] .init = FALSE) [18:41:42.147] } [18:41:42.147] } [18:41:42.147] } [18:41:42.147] }) [18:41:42.147] if (TRUE) { [18:41:42.147] base::sink(type = "output", split = FALSE) [18:41:42.147] if (TRUE) { [18:41:42.147] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.147] } [18:41:42.147] else { [18:41:42.147] ...future.result["stdout"] <- base::list(NULL) [18:41:42.147] } [18:41:42.147] base::close(...future.stdout) [18:41:42.147] ...future.stdout <- NULL [18:41:42.147] } [18:41:42.147] ...future.result$conditions <- ...future.conditions [18:41:42.147] ...future.result$finished <- base::Sys.time() [18:41:42.147] ...future.result [18:41:42.147] } [18:41:42.153] assign_globals() ... [18:41:42.153] List of 5 [18:41:42.153] $ ...future.FUN :function (x, ...) [18:41:42.153] $ future.call.arguments : list() [18:41:42.153] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.153] $ ...future.elements_ii :List of 6 [18:41:42.153] ..$ a1: int 1 [18:41:42.153] ..$ a2: int 2 [18:41:42.153] ..$ b1: int 2 [18:41:42.153] ..$ b2: int 3 [18:41:42.153] ..$ c1: int 3 [18:41:42.153] ..$ c2: int 4 [18:41:42.153] $ ...future.seeds_ii : NULL [18:41:42.153] $ ...future.globals.maxSize: NULL [18:41:42.153] - attr(*, "where")=List of 5 [18:41:42.153] ..$ ...future.FUN : [18:41:42.153] ..$ future.call.arguments : [18:41:42.153] ..$ ...future.elements_ii : [18:41:42.153] ..$ ...future.seeds_ii : [18:41:42.153] ..$ ...future.globals.maxSize: [18:41:42.153] - attr(*, "resolved")= logi FALSE [18:41:42.153] - attr(*, "total_size")= num 5182 [18:41:42.153] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.153] - attr(*, "already-done")= logi TRUE [18:41:42.165] - copied '...future.FUN' to environment [18:41:42.165] - copied 'future.call.arguments' to environment [18:41:42.165] - copied '...future.elements_ii' to environment [18:41:42.166] - copied '...future.seeds_ii' to environment [18:41:42.166] - copied '...future.globals.maxSize' to environment [18:41:42.166] assign_globals() ... done [18:41:42.167] plan(): Setting new future strategy stack: [18:41:42.167] List of future strategies: [18:41:42.167] 1. sequential: [18:41:42.167] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.167] - tweaked: FALSE [18:41:42.167] - call: NULL [18:41:42.168] plan(): nbrOfWorkers() = 1 [18:41:42.170] plan(): Setting new future strategy stack: [18:41:42.170] List of future strategies: [18:41:42.170] 1. sequential: [18:41:42.170] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.170] - tweaked: FALSE [18:41:42.170] - call: plan(strategy) [18:41:42.171] plan(): nbrOfWorkers() = 1 [18:41:42.172] SequentialFuture started (and completed) [18:41:42.172] - Launch lazy future ... done [18:41:42.172] run() for 'SequentialFuture' ... done [18:41:42.172] Created future: [18:41:42.173] SequentialFuture: [18:41:42.173] Label: 'future_sapply-1' [18:41:42.173] Expression: [18:41:42.173] { [18:41:42.173] do.call(function(...) { [18:41:42.173] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.173] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.173] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.173] on.exit(options(oopts), add = TRUE) [18:41:42.173] } [18:41:42.173] { [18:41:42.173] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.173] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.173] ...future.FUN(...future.X_jj, ...) [18:41:42.173] }) [18:41:42.173] } [18:41:42.173] }, args = future.call.arguments) [18:41:42.173] } [18:41:42.173] Lazy evaluation: FALSE [18:41:42.173] Asynchronous evaluation: FALSE [18:41:42.173] Local evaluation: TRUE [18:41:42.173] Environment: R_GlobalEnv [18:41:42.173] Capture standard output: TRUE [18:41:42.173] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.173] Globals: 5 objects totaling 625 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.173] Packages: [18:41:42.173] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.173] Resolved: TRUE [18:41:42.173] Value: 282 bytes of class 'list' [18:41:42.173] Early signaling: FALSE [18:41:42.173] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.173] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.174] Chunk #1 of 1 ... DONE [18:41:42.175] Launching 1 futures (chunks) ... DONE [18:41:42.175] Resolving 1 futures (chunks) ... [18:41:42.175] resolve() on list ... [18:41:42.175] recursive: 0 [18:41:42.176] length: 1 [18:41:42.176] [18:41:42.176] resolved() for 'SequentialFuture' ... [18:41:42.177] - state: 'finished' [18:41:42.177] - run: TRUE [18:41:42.177] - result: 'FutureResult' [18:41:42.177] resolved() for 'SequentialFuture' ... done [18:41:42.178] Future #1 [18:41:42.178] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.178] - nx: 1 [18:41:42.179] - relay: TRUE [18:41:42.179] - stdout: TRUE [18:41:42.179] - signal: TRUE [18:41:42.179] - resignal: FALSE [18:41:42.180] - force: TRUE [18:41:42.180] - relayed: [n=1] FALSE [18:41:42.180] - queued futures: [n=1] FALSE [18:41:42.180] - until=1 [18:41:42.181] - relaying element #1 [18:41:42.181] - relayed: [n=1] TRUE [18:41:42.181] - queued futures: [n=1] TRUE [18:41:42.182] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.182] length: 0 (resolved future 1) [18:41:42.182] Relaying remaining futures [18:41:42.182] signalConditionsASAP(NULL, pos=0) ... [18:41:42.183] - nx: 1 [18:41:42.183] - relay: TRUE [18:41:42.183] - stdout: TRUE [18:41:42.183] - signal: TRUE [18:41:42.184] - resignal: FALSE [18:41:42.184] - force: TRUE [18:41:42.184] - relayed: [n=1] TRUE [18:41:42.184] - queued futures: [n=1] TRUE - flush all [18:41:42.185] - relayed: [n=1] TRUE [18:41:42.185] - queued futures: [n=1] TRUE [18:41:42.185] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.185] resolve() on list ... DONE [18:41:42.186] - Number of value chunks collected: 1 [18:41:42.186] Resolving 1 futures (chunks) ... DONE [18:41:42.186] Reducing values from 1 chunks ... [18:41:42.187] - Number of values collected after concatenation: 6 [18:41:42.187] - Number of values expected: 6 [18:41:42.187] Reducing values from 1 chunks ... DONE [18:41:42.187] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.190] future_lapply() ... [18:41:42.192] Number of chunks: 1 [18:41:42.192] getGlobalsAndPackagesXApply() ... [18:41:42.193] - future.globals: TRUE [18:41:42.193] getGlobalsAndPackages() ... [18:41:42.193] Searching for globals... [18:41:42.196] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:42.196] Searching for globals ... DONE [18:41:42.197] Resolving globals: FALSE [18:41:42.197] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:42.198] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:42.198] - globals: [1] 'FUN' [18:41:42.199] [18:41:42.199] getGlobalsAndPackages() ... DONE [18:41:42.199] - globals found/used: [n=1] 'FUN' [18:41:42.199] - needed namespaces: [n=0] [18:41:42.200] Finding globals ... DONE [18:41:42.200] - use_args: TRUE [18:41:42.200] - Getting '...' globals ... [18:41:42.201] resolve() on list ... [18:41:42.201] recursive: 0 [18:41:42.201] length: 1 [18:41:42.202] elements: '...' [18:41:42.202] length: 0 (resolved future 1) [18:41:42.202] resolve() on list ... DONE [18:41:42.203] - '...' content: [n=0] [18:41:42.203] List of 1 [18:41:42.203] $ ...: list() [18:41:42.203] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.203] - attr(*, "where")=List of 1 [18:41:42.203] ..$ ...: [18:41:42.203] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.203] - attr(*, "resolved")= logi TRUE [18:41:42.203] - attr(*, "total_size")= num NA [18:41:42.207] - Getting '...' globals ... DONE [18:41:42.208] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.208] List of 2 [18:41:42.208] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:42.208] $ ... : list() [18:41:42.208] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.208] - attr(*, "where")=List of 2 [18:41:42.208] ..$ ...future.FUN: [18:41:42.208] ..$ ... : [18:41:42.208] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.208] - attr(*, "resolved")= logi FALSE [18:41:42.208] - attr(*, "total_size")= int 6664 [18:41:42.213] Packages to be attached in all futures: [n=0] [18:41:42.214] getGlobalsAndPackagesXApply() ... DONE [18:41:42.214] Number of futures (= number of chunks): 1 [18:41:42.214] Launching 1 futures (chunks) ... [18:41:42.215] Chunk #1 of 1 ... [18:41:42.215] - Finding globals in 'X' for chunk #1 ... [18:41:42.215] getGlobalsAndPackages() ... [18:41:42.215] Searching for globals... [18:41:42.216] [18:41:42.216] Searching for globals ... DONE [18:41:42.217] - globals: [0] [18:41:42.217] getGlobalsAndPackages() ... DONE [18:41:42.217] + additional globals found: [n=0] [18:41:42.217] + additional namespaces needed: [n=0] [18:41:42.218] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.218] - seeds: [18:41:42.218] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.218] getGlobalsAndPackages() ... [18:41:42.219] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.219] Resolving globals: FALSE [18:41:42.219] Tweak future expression to call with '...' arguments ... [18:41:42.219] { [18:41:42.219] do.call(function(...) { [18:41:42.219] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.219] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.219] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.219] on.exit(options(oopts), add = TRUE) [18:41:42.219] } [18:41:42.219] { [18:41:42.219] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.219] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.219] ...future.FUN(...future.X_jj, ...) [18:41:42.219] }) [18:41:42.219] } [18:41:42.219] }, args = future.call.arguments) [18:41:42.219] } [18:41:42.220] Tweak future expression to call with '...' arguments ... DONE [18:41:42.221] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.221] [18:41:42.221] getGlobalsAndPackages() ... DONE [18:41:42.222] run() for 'Future' ... [18:41:42.222] - state: 'created' [18:41:42.223] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.223] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.224] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.224] - Field: 'label' [18:41:42.224] - Field: 'local' [18:41:42.224] - Field: 'owner' [18:41:42.225] - Field: 'envir' [18:41:42.225] - Field: 'packages' [18:41:42.225] - Field: 'gc' [18:41:42.226] - Field: 'conditions' [18:41:42.226] - Field: 'expr' [18:41:42.226] - Field: 'uuid' [18:41:42.227] - Field: 'seed' [18:41:42.227] - Field: 'version' [18:41:42.227] - Field: 'result' [18:41:42.227] - Field: 'asynchronous' [18:41:42.228] - Field: 'calls' [18:41:42.228] - Field: 'globals' [18:41:42.228] - Field: 'stdout' [18:41:42.229] - Field: 'earlySignal' [18:41:42.229] - Field: 'lazy' [18:41:42.229] - Field: 'state' [18:41:42.229] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.230] - Launch lazy future ... [18:41:42.230] Packages needed by the future expression (n = 0): [18:41:42.230] Packages needed by future strategies (n = 0): [18:41:42.231] { [18:41:42.231] { [18:41:42.231] { [18:41:42.231] ...future.startTime <- base::Sys.time() [18:41:42.231] { [18:41:42.231] { [18:41:42.231] { [18:41:42.231] base::local({ [18:41:42.231] has_future <- base::requireNamespace("future", [18:41:42.231] quietly = TRUE) [18:41:42.231] if (has_future) { [18:41:42.231] ns <- base::getNamespace("future") [18:41:42.231] version <- ns[[".package"]][["version"]] [18:41:42.231] if (is.null(version)) [18:41:42.231] version <- utils::packageVersion("future") [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] version <- NULL [18:41:42.231] } [18:41:42.231] if (!has_future || version < "1.8.0") { [18:41:42.231] info <- base::c(r_version = base::gsub("R version ", [18:41:42.231] "", base::R.version$version.string), [18:41:42.231] platform = base::sprintf("%s (%s-bit)", [18:41:42.231] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.231] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.231] "release", "version")], collapse = " "), [18:41:42.231] hostname = base::Sys.info()[["nodename"]]) [18:41:42.231] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.231] info) [18:41:42.231] info <- base::paste(info, collapse = "; ") [18:41:42.231] if (!has_future) { [18:41:42.231] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.231] info) [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.231] info, version) [18:41:42.231] } [18:41:42.231] base::stop(msg) [18:41:42.231] } [18:41:42.231] }) [18:41:42.231] } [18:41:42.231] ...future.strategy.old <- future::plan("list") [18:41:42.231] options(future.plan = NULL) [18:41:42.231] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.231] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.231] } [18:41:42.231] ...future.workdir <- getwd() [18:41:42.231] } [18:41:42.231] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.231] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.231] } [18:41:42.231] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.231] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.231] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.231] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.231] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.231] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.231] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.231] base::names(...future.oldOptions)) [18:41:42.231] } [18:41:42.231] if (FALSE) { [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] if (TRUE) { [18:41:42.231] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.231] open = "w") [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.231] windows = "NUL", "/dev/null"), open = "w") [18:41:42.231] } [18:41:42.231] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.231] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.231] base::sink(type = "output", split = FALSE) [18:41:42.231] base::close(...future.stdout) [18:41:42.231] }, add = TRUE) [18:41:42.231] } [18:41:42.231] ...future.frame <- base::sys.nframe() [18:41:42.231] ...future.conditions <- base::list() [18:41:42.231] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.231] if (FALSE) { [18:41:42.231] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.231] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.231] } [18:41:42.231] ...future.result <- base::tryCatch({ [18:41:42.231] base::withCallingHandlers({ [18:41:42.231] ...future.value <- base::withVisible(base::local({ [18:41:42.231] do.call(function(...) { [18:41:42.231] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.231] if (!identical(...future.globals.maxSize.org, [18:41:42.231] ...future.globals.maxSize)) { [18:41:42.231] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.231] on.exit(options(oopts), add = TRUE) [18:41:42.231] } [18:41:42.231] { [18:41:42.231] lapply(seq_along(...future.elements_ii), [18:41:42.231] FUN = function(jj) { [18:41:42.231] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.231] ...future.FUN(...future.X_jj, ...) [18:41:42.231] }) [18:41:42.231] } [18:41:42.231] }, args = future.call.arguments) [18:41:42.231] })) [18:41:42.231] future::FutureResult(value = ...future.value$value, [18:41:42.231] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.231] ...future.rng), globalenv = if (FALSE) [18:41:42.231] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.231] ...future.globalenv.names)) [18:41:42.231] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.231] }, condition = base::local({ [18:41:42.231] c <- base::c [18:41:42.231] inherits <- base::inherits [18:41:42.231] invokeRestart <- base::invokeRestart [18:41:42.231] length <- base::length [18:41:42.231] list <- base::list [18:41:42.231] seq.int <- base::seq.int [18:41:42.231] signalCondition <- base::signalCondition [18:41:42.231] sys.calls <- base::sys.calls [18:41:42.231] `[[` <- base::`[[` [18:41:42.231] `+` <- base::`+` [18:41:42.231] `<<-` <- base::`<<-` [18:41:42.231] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.231] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.231] 3L)] [18:41:42.231] } [18:41:42.231] function(cond) { [18:41:42.231] is_error <- inherits(cond, "error") [18:41:42.231] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.231] NULL) [18:41:42.231] if (is_error) { [18:41:42.231] sessionInformation <- function() { [18:41:42.231] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.231] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.231] search = base::search(), system = base::Sys.info()) [18:41:42.231] } [18:41:42.231] ...future.conditions[[length(...future.conditions) + [18:41:42.231] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.231] cond$call), session = sessionInformation(), [18:41:42.231] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.231] signalCondition(cond) [18:41:42.231] } [18:41:42.231] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.231] "immediateCondition"))) { [18:41:42.231] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.231] ...future.conditions[[length(...future.conditions) + [18:41:42.231] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.231] if (TRUE && !signal) { [18:41:42.231] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.231] { [18:41:42.231] inherits <- base::inherits [18:41:42.231] invokeRestart <- base::invokeRestart [18:41:42.231] is.null <- base::is.null [18:41:42.231] muffled <- FALSE [18:41:42.231] if (inherits(cond, "message")) { [18:41:42.231] muffled <- grepl(pattern, "muffleMessage") [18:41:42.231] if (muffled) [18:41:42.231] invokeRestart("muffleMessage") [18:41:42.231] } [18:41:42.231] else if (inherits(cond, "warning")) { [18:41:42.231] muffled <- grepl(pattern, "muffleWarning") [18:41:42.231] if (muffled) [18:41:42.231] invokeRestart("muffleWarning") [18:41:42.231] } [18:41:42.231] else if (inherits(cond, "condition")) { [18:41:42.231] if (!is.null(pattern)) { [18:41:42.231] computeRestarts <- base::computeRestarts [18:41:42.231] grepl <- base::grepl [18:41:42.231] restarts <- computeRestarts(cond) [18:41:42.231] for (restart in restarts) { [18:41:42.231] name <- restart$name [18:41:42.231] if (is.null(name)) [18:41:42.231] next [18:41:42.231] if (!grepl(pattern, name)) [18:41:42.231] next [18:41:42.231] invokeRestart(restart) [18:41:42.231] muffled <- TRUE [18:41:42.231] break [18:41:42.231] } [18:41:42.231] } [18:41:42.231] } [18:41:42.231] invisible(muffled) [18:41:42.231] } [18:41:42.231] muffleCondition(cond, pattern = "^muffle") [18:41:42.231] } [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] if (TRUE) { [18:41:42.231] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.231] { [18:41:42.231] inherits <- base::inherits [18:41:42.231] invokeRestart <- base::invokeRestart [18:41:42.231] is.null <- base::is.null [18:41:42.231] muffled <- FALSE [18:41:42.231] if (inherits(cond, "message")) { [18:41:42.231] muffled <- grepl(pattern, "muffleMessage") [18:41:42.231] if (muffled) [18:41:42.231] invokeRestart("muffleMessage") [18:41:42.231] } [18:41:42.231] else if (inherits(cond, "warning")) { [18:41:42.231] muffled <- grepl(pattern, "muffleWarning") [18:41:42.231] if (muffled) [18:41:42.231] invokeRestart("muffleWarning") [18:41:42.231] } [18:41:42.231] else if (inherits(cond, "condition")) { [18:41:42.231] if (!is.null(pattern)) { [18:41:42.231] computeRestarts <- base::computeRestarts [18:41:42.231] grepl <- base::grepl [18:41:42.231] restarts <- computeRestarts(cond) [18:41:42.231] for (restart in restarts) { [18:41:42.231] name <- restart$name [18:41:42.231] if (is.null(name)) [18:41:42.231] next [18:41:42.231] if (!grepl(pattern, name)) [18:41:42.231] next [18:41:42.231] invokeRestart(restart) [18:41:42.231] muffled <- TRUE [18:41:42.231] break [18:41:42.231] } [18:41:42.231] } [18:41:42.231] } [18:41:42.231] invisible(muffled) [18:41:42.231] } [18:41:42.231] muffleCondition(cond, pattern = "^muffle") [18:41:42.231] } [18:41:42.231] } [18:41:42.231] } [18:41:42.231] })) [18:41:42.231] }, error = function(ex) { [18:41:42.231] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.231] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.231] ...future.rng), started = ...future.startTime, [18:41:42.231] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.231] version = "1.8"), class = "FutureResult") [18:41:42.231] }, finally = { [18:41:42.231] if (!identical(...future.workdir, getwd())) [18:41:42.231] setwd(...future.workdir) [18:41:42.231] { [18:41:42.231] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.231] ...future.oldOptions$nwarnings <- NULL [18:41:42.231] } [18:41:42.231] base::options(...future.oldOptions) [18:41:42.231] if (.Platform$OS.type == "windows") { [18:41:42.231] old_names <- names(...future.oldEnvVars) [18:41:42.231] envs <- base::Sys.getenv() [18:41:42.231] names <- names(envs) [18:41:42.231] common <- intersect(names, old_names) [18:41:42.231] added <- setdiff(names, old_names) [18:41:42.231] removed <- setdiff(old_names, names) [18:41:42.231] changed <- common[...future.oldEnvVars[common] != [18:41:42.231] envs[common]] [18:41:42.231] NAMES <- toupper(changed) [18:41:42.231] args <- list() [18:41:42.231] for (kk in seq_along(NAMES)) { [18:41:42.231] name <- changed[[kk]] [18:41:42.231] NAME <- NAMES[[kk]] [18:41:42.231] if (name != NAME && is.element(NAME, old_names)) [18:41:42.231] next [18:41:42.231] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.231] } [18:41:42.231] NAMES <- toupper(added) [18:41:42.231] for (kk in seq_along(NAMES)) { [18:41:42.231] name <- added[[kk]] [18:41:42.231] NAME <- NAMES[[kk]] [18:41:42.231] if (name != NAME && is.element(NAME, old_names)) [18:41:42.231] next [18:41:42.231] args[[name]] <- "" [18:41:42.231] } [18:41:42.231] NAMES <- toupper(removed) [18:41:42.231] for (kk in seq_along(NAMES)) { [18:41:42.231] name <- removed[[kk]] [18:41:42.231] NAME <- NAMES[[kk]] [18:41:42.231] if (name != NAME && is.element(NAME, old_names)) [18:41:42.231] next [18:41:42.231] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.231] } [18:41:42.231] if (length(args) > 0) [18:41:42.231] base::do.call(base::Sys.setenv, args = args) [18:41:42.231] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.231] } [18:41:42.231] { [18:41:42.231] if (base::length(...future.futureOptionsAdded) > [18:41:42.231] 0L) { [18:41:42.231] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.231] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.231] base::options(opts) [18:41:42.231] } [18:41:42.231] { [18:41:42.231] { [18:41:42.231] NULL [18:41:42.231] RNGkind("Mersenne-Twister") [18:41:42.231] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.231] inherits = FALSE) [18:41:42.231] } [18:41:42.231] options(future.plan = NULL) [18:41:42.231] if (is.na(NA_character_)) [18:41:42.231] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.231] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.231] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.231] .init = FALSE) [18:41:42.231] } [18:41:42.231] } [18:41:42.231] } [18:41:42.231] }) [18:41:42.231] if (TRUE) { [18:41:42.231] base::sink(type = "output", split = FALSE) [18:41:42.231] if (TRUE) { [18:41:42.231] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.231] } [18:41:42.231] else { [18:41:42.231] ...future.result["stdout"] <- base::list(NULL) [18:41:42.231] } [18:41:42.231] base::close(...future.stdout) [18:41:42.231] ...future.stdout <- NULL [18:41:42.231] } [18:41:42.231] ...future.result$conditions <- ...future.conditions [18:41:42.231] ...future.result$finished <- base::Sys.time() [18:41:42.231] ...future.result [18:41:42.231] } [18:41:42.238] assign_globals() ... [18:41:42.238] List of 5 [18:41:42.238] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:42.238] $ future.call.arguments : list() [18:41:42.238] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.238] $ ...future.elements_ii :List of 6 [18:41:42.238] ..$ a1: int 1 [18:41:42.238] ..$ a2: int 2 [18:41:42.238] ..$ b1: int 2 [18:41:42.238] ..$ b2: int 3 [18:41:42.238] ..$ c1: int 3 [18:41:42.238] ..$ c2: int 4 [18:41:42.238] $ ...future.seeds_ii : NULL [18:41:42.238] $ ...future.globals.maxSize: NULL [18:41:42.238] - attr(*, "where")=List of 5 [18:41:42.238] ..$ ...future.FUN : [18:41:42.238] ..$ future.call.arguments : [18:41:42.238] ..$ ...future.elements_ii : [18:41:42.238] ..$ ...future.seeds_ii : [18:41:42.238] ..$ ...future.globals.maxSize: [18:41:42.238] - attr(*, "resolved")= logi FALSE [18:41:42.238] - attr(*, "total_size")= num 6664 [18:41:42.238] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.238] - attr(*, "already-done")= logi TRUE [18:41:42.250] - reassign environment for '...future.FUN' [18:41:42.251] - copied '...future.FUN' to environment [18:41:42.251] - copied 'future.call.arguments' to environment [18:41:42.251] - copied '...future.elements_ii' to environment [18:41:42.251] - copied '...future.seeds_ii' to environment [18:41:42.252] - copied '...future.globals.maxSize' to environment [18:41:42.252] assign_globals() ... done [18:41:42.253] plan(): Setting new future strategy stack: [18:41:42.253] List of future strategies: [18:41:42.253] 1. sequential: [18:41:42.253] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.253] - tweaked: FALSE [18:41:42.253] - call: NULL [18:41:42.254] plan(): nbrOfWorkers() = 1 [18:41:42.256] plan(): Setting new future strategy stack: [18:41:42.256] List of future strategies: [18:41:42.256] 1. sequential: [18:41:42.256] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.256] - tweaked: FALSE [18:41:42.256] - call: plan(strategy) [18:41:42.257] plan(): nbrOfWorkers() = 1 [18:41:42.257] SequentialFuture started (and completed) [18:41:42.258] - Launch lazy future ... done [18:41:42.258] run() for 'SequentialFuture' ... done [18:41:42.258] Created future: [18:41:42.259] SequentialFuture: [18:41:42.259] Label: 'future_sapply-1' [18:41:42.259] Expression: [18:41:42.259] { [18:41:42.259] do.call(function(...) { [18:41:42.259] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.259] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.259] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.259] on.exit(options(oopts), add = TRUE) [18:41:42.259] } [18:41:42.259] { [18:41:42.259] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.259] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.259] ...future.FUN(...future.X_jj, ...) [18:41:42.259] }) [18:41:42.259] } [18:41:42.259] }, args = future.call.arguments) [18:41:42.259] } [18:41:42.259] Lazy evaluation: FALSE [18:41:42.259] Asynchronous evaluation: FALSE [18:41:42.259] Local evaluation: TRUE [18:41:42.259] Environment: R_GlobalEnv [18:41:42.259] Capture standard output: TRUE [18:41:42.259] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.259] Globals: 5 objects totaling 1.10 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.259] Packages: [18:41:42.259] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.259] Resolved: TRUE [18:41:42.259] Value: 978 bytes of class 'list' [18:41:42.259] Early signaling: FALSE [18:41:42.259] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.259] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.260] Chunk #1 of 1 ... DONE [18:41:42.261] Launching 1 futures (chunks) ... DONE [18:41:42.261] Resolving 1 futures (chunks) ... [18:41:42.261] resolve() on list ... [18:41:42.262] recursive: 0 [18:41:42.262] length: 1 [18:41:42.262] [18:41:42.262] resolved() for 'SequentialFuture' ... [18:41:42.263] - state: 'finished' [18:41:42.263] - run: TRUE [18:41:42.263] - result: 'FutureResult' [18:41:42.263] resolved() for 'SequentialFuture' ... done [18:41:42.264] Future #1 [18:41:42.264] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.264] - nx: 1 [18:41:42.265] - relay: TRUE [18:41:42.265] - stdout: TRUE [18:41:42.265] - signal: TRUE [18:41:42.265] - resignal: FALSE [18:41:42.266] - force: TRUE [18:41:42.266] - relayed: [n=1] FALSE [18:41:42.266] - queued futures: [n=1] FALSE [18:41:42.266] - until=1 [18:41:42.267] - relaying element #1 [18:41:42.267] - relayed: [n=1] TRUE [18:41:42.267] - queued futures: [n=1] TRUE [18:41:42.268] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.268] length: 0 (resolved future 1) [18:41:42.268] Relaying remaining futures [18:41:42.268] signalConditionsASAP(NULL, pos=0) ... [18:41:42.269] - nx: 1 [18:41:42.269] - relay: TRUE [18:41:42.269] - stdout: TRUE [18:41:42.269] - signal: TRUE [18:41:42.270] - resignal: FALSE [18:41:42.270] - force: TRUE [18:41:42.270] - relayed: [n=1] TRUE [18:41:42.270] - queued futures: [n=1] TRUE - flush all [18:41:42.271] - relayed: [n=1] TRUE [18:41:42.271] - queued futures: [n=1] TRUE [18:41:42.271] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.271] resolve() on list ... DONE [18:41:42.272] - Number of value chunks collected: 1 [18:41:42.272] Resolving 1 futures (chunks) ... DONE [18:41:42.272] Reducing values from 1 chunks ... [18:41:42.273] - Number of values collected after concatenation: 6 [18:41:42.273] - Number of values expected: 6 [18:41:42.273] Reducing values from 1 chunks ... DONE [18:41:42.273] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.279] future_lapply() ... [18:41:42.280] Number of chunks: 1 [18:41:42.280] getGlobalsAndPackagesXApply() ... [18:41:42.281] - future.globals: TRUE [18:41:42.281] getGlobalsAndPackages() ... [18:41:42.281] Searching for globals... [18:41:42.283] - globals found: [1] 'FUN' [18:41:42.283] Searching for globals ... DONE [18:41:42.284] Resolving globals: FALSE [18:41:42.284] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:42.285] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:42.285] - globals: [1] 'FUN' [18:41:42.285] [18:41:42.286] getGlobalsAndPackages() ... DONE [18:41:42.286] - globals found/used: [n=1] 'FUN' [18:41:42.286] - needed namespaces: [n=0] [18:41:42.287] Finding globals ... DONE [18:41:42.287] - use_args: TRUE [18:41:42.287] - Getting '...' globals ... [18:41:42.288] resolve() on list ... [18:41:42.288] recursive: 0 [18:41:42.288] length: 1 [18:41:42.288] elements: '...' [18:41:42.289] length: 0 (resolved future 1) [18:41:42.289] resolve() on list ... DONE [18:41:42.289] - '...' content: [n=0] [18:41:42.290] List of 1 [18:41:42.290] $ ...: list() [18:41:42.290] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.290] - attr(*, "where")=List of 1 [18:41:42.290] ..$ ...: [18:41:42.290] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.290] - attr(*, "resolved")= logi TRUE [18:41:42.290] - attr(*, "total_size")= num NA [18:41:42.294] - Getting '...' globals ... DONE [18:41:42.294] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.295] List of 2 [18:41:42.295] $ ...future.FUN:function (x) [18:41:42.295] $ ... : list() [18:41:42.295] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.295] - attr(*, "where")=List of 2 [18:41:42.295] ..$ ...future.FUN: [18:41:42.295] ..$ ... : [18:41:42.295] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.295] - attr(*, "resolved")= logi FALSE [18:41:42.295] - attr(*, "total_size")= int 4942 [18:41:42.300] Packages to be attached in all futures: [n=0] [18:41:42.300] getGlobalsAndPackagesXApply() ... DONE [18:41:42.301] Number of futures (= number of chunks): 1 [18:41:42.301] Launching 1 futures (chunks) ... [18:41:42.301] Chunk #1 of 1 ... [18:41:42.302] - Finding globals in 'X' for chunk #1 ... [18:41:42.302] getGlobalsAndPackages() ... [18:41:42.302] Searching for globals... [18:41:42.305] [18:41:42.306] Searching for globals ... DONE [18:41:42.306] - globals: [0] [18:41:42.306] getGlobalsAndPackages() ... DONE [18:41:42.306] + additional globals found: [n=0] [18:41:42.307] + additional namespaces needed: [n=0] [18:41:42.307] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.307] - seeds: [18:41:42.307] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.308] getGlobalsAndPackages() ... [18:41:42.308] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.308] Resolving globals: FALSE [18:41:42.308] Tweak future expression to call with '...' arguments ... [18:41:42.309] { [18:41:42.309] do.call(function(...) { [18:41:42.309] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.309] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.309] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.309] on.exit(options(oopts), add = TRUE) [18:41:42.309] } [18:41:42.309] { [18:41:42.309] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.309] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.309] ...future.FUN(...future.X_jj, ...) [18:41:42.309] }) [18:41:42.309] } [18:41:42.309] }, args = future.call.arguments) [18:41:42.309] } [18:41:42.309] Tweak future expression to call with '...' arguments ... DONE [18:41:42.310] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.310] [18:41:42.311] getGlobalsAndPackages() ... DONE [18:41:42.311] run() for 'Future' ... [18:41:42.312] - state: 'created' [18:41:42.312] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.312] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.313] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.313] - Field: 'label' [18:41:42.313] - Field: 'local' [18:41:42.314] - Field: 'owner' [18:41:42.314] - Field: 'envir' [18:41:42.314] - Field: 'packages' [18:41:42.314] - Field: 'gc' [18:41:42.315] - Field: 'conditions' [18:41:42.315] - Field: 'expr' [18:41:42.315] - Field: 'uuid' [18:41:42.316] - Field: 'seed' [18:41:42.316] - Field: 'version' [18:41:42.316] - Field: 'result' [18:41:42.316] - Field: 'asynchronous' [18:41:42.317] - Field: 'calls' [18:41:42.317] - Field: 'globals' [18:41:42.317] - Field: 'stdout' [18:41:42.317] - Field: 'earlySignal' [18:41:42.318] - Field: 'lazy' [18:41:42.318] - Field: 'state' [18:41:42.318] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.319] - Launch lazy future ... [18:41:42.319] Packages needed by the future expression (n = 0): [18:41:42.319] Packages needed by future strategies (n = 0): [18:41:42.320] { [18:41:42.320] { [18:41:42.320] { [18:41:42.320] ...future.startTime <- base::Sys.time() [18:41:42.320] { [18:41:42.320] { [18:41:42.320] { [18:41:42.320] base::local({ [18:41:42.320] has_future <- base::requireNamespace("future", [18:41:42.320] quietly = TRUE) [18:41:42.320] if (has_future) { [18:41:42.320] ns <- base::getNamespace("future") [18:41:42.320] version <- ns[[".package"]][["version"]] [18:41:42.320] if (is.null(version)) [18:41:42.320] version <- utils::packageVersion("future") [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] version <- NULL [18:41:42.320] } [18:41:42.320] if (!has_future || version < "1.8.0") { [18:41:42.320] info <- base::c(r_version = base::gsub("R version ", [18:41:42.320] "", base::R.version$version.string), [18:41:42.320] platform = base::sprintf("%s (%s-bit)", [18:41:42.320] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.320] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.320] "release", "version")], collapse = " "), [18:41:42.320] hostname = base::Sys.info()[["nodename"]]) [18:41:42.320] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.320] info) [18:41:42.320] info <- base::paste(info, collapse = "; ") [18:41:42.320] if (!has_future) { [18:41:42.320] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.320] info) [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.320] info, version) [18:41:42.320] } [18:41:42.320] base::stop(msg) [18:41:42.320] } [18:41:42.320] }) [18:41:42.320] } [18:41:42.320] ...future.strategy.old <- future::plan("list") [18:41:42.320] options(future.plan = NULL) [18:41:42.320] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.320] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.320] } [18:41:42.320] ...future.workdir <- getwd() [18:41:42.320] } [18:41:42.320] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.320] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.320] } [18:41:42.320] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.320] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.320] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.320] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.320] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.320] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.320] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.320] base::names(...future.oldOptions)) [18:41:42.320] } [18:41:42.320] if (FALSE) { [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] if (TRUE) { [18:41:42.320] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.320] open = "w") [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.320] windows = "NUL", "/dev/null"), open = "w") [18:41:42.320] } [18:41:42.320] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.320] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.320] base::sink(type = "output", split = FALSE) [18:41:42.320] base::close(...future.stdout) [18:41:42.320] }, add = TRUE) [18:41:42.320] } [18:41:42.320] ...future.frame <- base::sys.nframe() [18:41:42.320] ...future.conditions <- base::list() [18:41:42.320] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.320] if (FALSE) { [18:41:42.320] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.320] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.320] } [18:41:42.320] ...future.result <- base::tryCatch({ [18:41:42.320] base::withCallingHandlers({ [18:41:42.320] ...future.value <- base::withVisible(base::local({ [18:41:42.320] do.call(function(...) { [18:41:42.320] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.320] if (!identical(...future.globals.maxSize.org, [18:41:42.320] ...future.globals.maxSize)) { [18:41:42.320] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.320] on.exit(options(oopts), add = TRUE) [18:41:42.320] } [18:41:42.320] { [18:41:42.320] lapply(seq_along(...future.elements_ii), [18:41:42.320] FUN = function(jj) { [18:41:42.320] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.320] ...future.FUN(...future.X_jj, ...) [18:41:42.320] }) [18:41:42.320] } [18:41:42.320] }, args = future.call.arguments) [18:41:42.320] })) [18:41:42.320] future::FutureResult(value = ...future.value$value, [18:41:42.320] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.320] ...future.rng), globalenv = if (FALSE) [18:41:42.320] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.320] ...future.globalenv.names)) [18:41:42.320] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.320] }, condition = base::local({ [18:41:42.320] c <- base::c [18:41:42.320] inherits <- base::inherits [18:41:42.320] invokeRestart <- base::invokeRestart [18:41:42.320] length <- base::length [18:41:42.320] list <- base::list [18:41:42.320] seq.int <- base::seq.int [18:41:42.320] signalCondition <- base::signalCondition [18:41:42.320] sys.calls <- base::sys.calls [18:41:42.320] `[[` <- base::`[[` [18:41:42.320] `+` <- base::`+` [18:41:42.320] `<<-` <- base::`<<-` [18:41:42.320] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.320] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.320] 3L)] [18:41:42.320] } [18:41:42.320] function(cond) { [18:41:42.320] is_error <- inherits(cond, "error") [18:41:42.320] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.320] NULL) [18:41:42.320] if (is_error) { [18:41:42.320] sessionInformation <- function() { [18:41:42.320] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.320] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.320] search = base::search(), system = base::Sys.info()) [18:41:42.320] } [18:41:42.320] ...future.conditions[[length(...future.conditions) + [18:41:42.320] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.320] cond$call), session = sessionInformation(), [18:41:42.320] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.320] signalCondition(cond) [18:41:42.320] } [18:41:42.320] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.320] "immediateCondition"))) { [18:41:42.320] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.320] ...future.conditions[[length(...future.conditions) + [18:41:42.320] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.320] if (TRUE && !signal) { [18:41:42.320] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.320] { [18:41:42.320] inherits <- base::inherits [18:41:42.320] invokeRestart <- base::invokeRestart [18:41:42.320] is.null <- base::is.null [18:41:42.320] muffled <- FALSE [18:41:42.320] if (inherits(cond, "message")) { [18:41:42.320] muffled <- grepl(pattern, "muffleMessage") [18:41:42.320] if (muffled) [18:41:42.320] invokeRestart("muffleMessage") [18:41:42.320] } [18:41:42.320] else if (inherits(cond, "warning")) { [18:41:42.320] muffled <- grepl(pattern, "muffleWarning") [18:41:42.320] if (muffled) [18:41:42.320] invokeRestart("muffleWarning") [18:41:42.320] } [18:41:42.320] else if (inherits(cond, "condition")) { [18:41:42.320] if (!is.null(pattern)) { [18:41:42.320] computeRestarts <- base::computeRestarts [18:41:42.320] grepl <- base::grepl [18:41:42.320] restarts <- computeRestarts(cond) [18:41:42.320] for (restart in restarts) { [18:41:42.320] name <- restart$name [18:41:42.320] if (is.null(name)) [18:41:42.320] next [18:41:42.320] if (!grepl(pattern, name)) [18:41:42.320] next [18:41:42.320] invokeRestart(restart) [18:41:42.320] muffled <- TRUE [18:41:42.320] break [18:41:42.320] } [18:41:42.320] } [18:41:42.320] } [18:41:42.320] invisible(muffled) [18:41:42.320] } [18:41:42.320] muffleCondition(cond, pattern = "^muffle") [18:41:42.320] } [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] if (TRUE) { [18:41:42.320] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.320] { [18:41:42.320] inherits <- base::inherits [18:41:42.320] invokeRestart <- base::invokeRestart [18:41:42.320] is.null <- base::is.null [18:41:42.320] muffled <- FALSE [18:41:42.320] if (inherits(cond, "message")) { [18:41:42.320] muffled <- grepl(pattern, "muffleMessage") [18:41:42.320] if (muffled) [18:41:42.320] invokeRestart("muffleMessage") [18:41:42.320] } [18:41:42.320] else if (inherits(cond, "warning")) { [18:41:42.320] muffled <- grepl(pattern, "muffleWarning") [18:41:42.320] if (muffled) [18:41:42.320] invokeRestart("muffleWarning") [18:41:42.320] } [18:41:42.320] else if (inherits(cond, "condition")) { [18:41:42.320] if (!is.null(pattern)) { [18:41:42.320] computeRestarts <- base::computeRestarts [18:41:42.320] grepl <- base::grepl [18:41:42.320] restarts <- computeRestarts(cond) [18:41:42.320] for (restart in restarts) { [18:41:42.320] name <- restart$name [18:41:42.320] if (is.null(name)) [18:41:42.320] next [18:41:42.320] if (!grepl(pattern, name)) [18:41:42.320] next [18:41:42.320] invokeRestart(restart) [18:41:42.320] muffled <- TRUE [18:41:42.320] break [18:41:42.320] } [18:41:42.320] } [18:41:42.320] } [18:41:42.320] invisible(muffled) [18:41:42.320] } [18:41:42.320] muffleCondition(cond, pattern = "^muffle") [18:41:42.320] } [18:41:42.320] } [18:41:42.320] } [18:41:42.320] })) [18:41:42.320] }, error = function(ex) { [18:41:42.320] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.320] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.320] ...future.rng), started = ...future.startTime, [18:41:42.320] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.320] version = "1.8"), class = "FutureResult") [18:41:42.320] }, finally = { [18:41:42.320] if (!identical(...future.workdir, getwd())) [18:41:42.320] setwd(...future.workdir) [18:41:42.320] { [18:41:42.320] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.320] ...future.oldOptions$nwarnings <- NULL [18:41:42.320] } [18:41:42.320] base::options(...future.oldOptions) [18:41:42.320] if (.Platform$OS.type == "windows") { [18:41:42.320] old_names <- names(...future.oldEnvVars) [18:41:42.320] envs <- base::Sys.getenv() [18:41:42.320] names <- names(envs) [18:41:42.320] common <- intersect(names, old_names) [18:41:42.320] added <- setdiff(names, old_names) [18:41:42.320] removed <- setdiff(old_names, names) [18:41:42.320] changed <- common[...future.oldEnvVars[common] != [18:41:42.320] envs[common]] [18:41:42.320] NAMES <- toupper(changed) [18:41:42.320] args <- list() [18:41:42.320] for (kk in seq_along(NAMES)) { [18:41:42.320] name <- changed[[kk]] [18:41:42.320] NAME <- NAMES[[kk]] [18:41:42.320] if (name != NAME && is.element(NAME, old_names)) [18:41:42.320] next [18:41:42.320] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.320] } [18:41:42.320] NAMES <- toupper(added) [18:41:42.320] for (kk in seq_along(NAMES)) { [18:41:42.320] name <- added[[kk]] [18:41:42.320] NAME <- NAMES[[kk]] [18:41:42.320] if (name != NAME && is.element(NAME, old_names)) [18:41:42.320] next [18:41:42.320] args[[name]] <- "" [18:41:42.320] } [18:41:42.320] NAMES <- toupper(removed) [18:41:42.320] for (kk in seq_along(NAMES)) { [18:41:42.320] name <- removed[[kk]] [18:41:42.320] NAME <- NAMES[[kk]] [18:41:42.320] if (name != NAME && is.element(NAME, old_names)) [18:41:42.320] next [18:41:42.320] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.320] } [18:41:42.320] if (length(args) > 0) [18:41:42.320] base::do.call(base::Sys.setenv, args = args) [18:41:42.320] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.320] } [18:41:42.320] { [18:41:42.320] if (base::length(...future.futureOptionsAdded) > [18:41:42.320] 0L) { [18:41:42.320] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.320] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.320] base::options(opts) [18:41:42.320] } [18:41:42.320] { [18:41:42.320] { [18:41:42.320] NULL [18:41:42.320] RNGkind("Mersenne-Twister") [18:41:42.320] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.320] inherits = FALSE) [18:41:42.320] } [18:41:42.320] options(future.plan = NULL) [18:41:42.320] if (is.na(NA_character_)) [18:41:42.320] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.320] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.320] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.320] .init = FALSE) [18:41:42.320] } [18:41:42.320] } [18:41:42.320] } [18:41:42.320] }) [18:41:42.320] if (TRUE) { [18:41:42.320] base::sink(type = "output", split = FALSE) [18:41:42.320] if (TRUE) { [18:41:42.320] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.320] } [18:41:42.320] else { [18:41:42.320] ...future.result["stdout"] <- base::list(NULL) [18:41:42.320] } [18:41:42.320] base::close(...future.stdout) [18:41:42.320] ...future.stdout <- NULL [18:41:42.320] } [18:41:42.320] ...future.result$conditions <- ...future.conditions [18:41:42.320] ...future.result$finished <- base::Sys.time() [18:41:42.320] ...future.result [18:41:42.320] } [18:41:42.327] assign_globals() ... [18:41:42.327] List of 5 [18:41:42.327] $ ...future.FUN :function (x) [18:41:42.327] $ future.call.arguments : list() [18:41:42.327] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.327] $ ...future.elements_ii :List of 6 [18:41:42.327] ..$ a1: int 1 [18:41:42.327] ..$ a2: int 2 [18:41:42.327] ..$ b1: int 2 [18:41:42.327] ..$ b2: int 3 [18:41:42.327] ..$ c1: int 3 [18:41:42.327] ..$ c2: int 4 [18:41:42.327] $ ...future.seeds_ii : NULL [18:41:42.327] $ ...future.globals.maxSize: NULL [18:41:42.327] - attr(*, "where")=List of 5 [18:41:42.327] ..$ ...future.FUN : [18:41:42.327] ..$ future.call.arguments : [18:41:42.327] ..$ ...future.elements_ii : [18:41:42.327] ..$ ...future.seeds_ii : [18:41:42.327] ..$ ...future.globals.maxSize: [18:41:42.327] - attr(*, "resolved")= logi FALSE [18:41:42.327] - attr(*, "total_size")= num 4942 [18:41:42.327] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.327] - attr(*, "already-done")= logi TRUE [18:41:42.339] - copied '...future.FUN' to environment [18:41:42.339] - copied 'future.call.arguments' to environment [18:41:42.339] - copied '...future.elements_ii' to environment [18:41:42.339] - copied '...future.seeds_ii' to environment [18:41:42.340] - copied '...future.globals.maxSize' to environment [18:41:42.340] assign_globals() ... done [18:41:42.340] plan(): Setting new future strategy stack: [18:41:42.341] List of future strategies: [18:41:42.341] 1. sequential: [18:41:42.341] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.341] - tweaked: FALSE [18:41:42.341] - call: NULL [18:41:42.342] plan(): nbrOfWorkers() = 1 [18:41:42.344] plan(): Setting new future strategy stack: [18:41:42.344] List of future strategies: [18:41:42.344] 1. sequential: [18:41:42.344] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.344] - tweaked: FALSE [18:41:42.344] - call: plan(strategy) [18:41:42.345] plan(): nbrOfWorkers() = 1 [18:41:42.345] SequentialFuture started (and completed) [18:41:42.345] - Launch lazy future ... done [18:41:42.346] run() for 'SequentialFuture' ... done [18:41:42.346] Created future: [18:41:42.346] SequentialFuture: [18:41:42.346] Label: 'future_sapply-1' [18:41:42.346] Expression: [18:41:42.346] { [18:41:42.346] do.call(function(...) { [18:41:42.346] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.346] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.346] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.346] on.exit(options(oopts), add = TRUE) [18:41:42.346] } [18:41:42.346] { [18:41:42.346] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.346] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.346] ...future.FUN(...future.X_jj, ...) [18:41:42.346] }) [18:41:42.346] } [18:41:42.346] }, args = future.call.arguments) [18:41:42.346] } [18:41:42.346] Lazy evaluation: FALSE [18:41:42.346] Asynchronous evaluation: FALSE [18:41:42.346] Local evaluation: TRUE [18:41:42.346] Environment: R_GlobalEnv [18:41:42.346] Capture standard output: TRUE [18:41:42.346] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.346] Globals: 5 objects totaling 532 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.346] Packages: [18:41:42.346] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.346] Resolved: TRUE [18:41:42.346] Value: 103 bytes of class 'list' [18:41:42.346] Early signaling: FALSE [18:41:42.346] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.346] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.348] Chunk #1 of 1 ... DONE [18:41:42.348] Launching 1 futures (chunks) ... DONE [18:41:42.349] Resolving 1 futures (chunks) ... [18:41:42.349] resolve() on list ... [18:41:42.349] recursive: 0 [18:41:42.349] length: 1 [18:41:42.350] [18:41:42.350] resolved() for 'SequentialFuture' ... [18:41:42.350] - state: 'finished' [18:41:42.351] - run: TRUE [18:41:42.351] - result: 'FutureResult' [18:41:42.351] resolved() for 'SequentialFuture' ... done [18:41:42.352] Future #1 [18:41:42.352] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.352] - nx: 1 [18:41:42.352] - relay: TRUE [18:41:42.353] - stdout: TRUE [18:41:42.353] - signal: TRUE [18:41:42.353] - resignal: FALSE [18:41:42.353] - force: TRUE [18:41:42.354] - relayed: [n=1] FALSE [18:41:42.354] - queued futures: [n=1] FALSE [18:41:42.354] - until=1 [18:41:42.354] - relaying element #1 [18:41:42.355] - relayed: [n=1] TRUE [18:41:42.355] - queued futures: [n=1] TRUE [18:41:42.355] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.356] length: 0 (resolved future 1) [18:41:42.356] Relaying remaining futures [18:41:42.356] signalConditionsASAP(NULL, pos=0) ... [18:41:42.356] - nx: 1 [18:41:42.357] - relay: TRUE [18:41:42.357] - stdout: TRUE [18:41:42.357] - signal: TRUE [18:41:42.357] - resignal: FALSE [18:41:42.358] - force: TRUE [18:41:42.358] - relayed: [n=1] TRUE [18:41:42.358] - queued futures: [n=1] TRUE - flush all [18:41:42.358] - relayed: [n=1] TRUE [18:41:42.359] - queued futures: [n=1] TRUE [18:41:42.359] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.359] resolve() on list ... DONE [18:41:42.360] - Number of value chunks collected: 1 [18:41:42.360] Resolving 1 futures (chunks) ... DONE [18:41:42.360] Reducing values from 1 chunks ... [18:41:42.360] - Number of values collected after concatenation: 6 [18:41:42.361] - Number of values expected: 6 [18:41:42.361] Reducing values from 1 chunks ... DONE [18:41:42.361] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y1:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y2:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 [18:41:42.378] future_lapply() ... [18:41:42.379] Number of chunks: 1 [18:41:42.380] getGlobalsAndPackagesXApply() ... [18:41:42.380] - future.globals: TRUE [18:41:42.380] getGlobalsAndPackages() ... [18:41:42.380] Searching for globals... [18:41:42.382] - globals found: [2] 'FUN', 'UseMethod' [18:41:42.383] Searching for globals ... DONE [18:41:42.383] Resolving globals: FALSE [18:41:42.384] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:42.384] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:42.385] - globals: [1] 'FUN' [18:41:42.385] [18:41:42.385] getGlobalsAndPackages() ... DONE [18:41:42.385] - globals found/used: [n=1] 'FUN' [18:41:42.386] - needed namespaces: [n=0] [18:41:42.386] Finding globals ... DONE [18:41:42.386] - use_args: TRUE [18:41:42.386] - Getting '...' globals ... [18:41:42.387] resolve() on list ... [18:41:42.387] recursive: 0 [18:41:42.388] length: 1 [18:41:42.388] elements: '...' [18:41:42.388] length: 0 (resolved future 1) [18:41:42.388] resolve() on list ... DONE [18:41:42.389] - '...' content: [n=0] [18:41:42.389] List of 1 [18:41:42.389] $ ...: list() [18:41:42.389] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.389] - attr(*, "where")=List of 1 [18:41:42.389] ..$ ...: [18:41:42.389] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.389] - attr(*, "resolved")= logi TRUE [18:41:42.389] - attr(*, "total_size")= num NA [18:41:42.393] - Getting '...' globals ... DONE [18:41:42.394] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.394] List of 2 [18:41:42.394] $ ...future.FUN:function (x, ...) [18:41:42.394] $ ... : list() [18:41:42.394] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.394] - attr(*, "where")=List of 2 [18:41:42.394] ..$ ...future.FUN: [18:41:42.394] ..$ ... : [18:41:42.394] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.394] - attr(*, "resolved")= logi FALSE [18:41:42.394] - attr(*, "total_size")= int 5182 [18:41:42.399] Packages to be attached in all futures: [n=0] [18:41:42.400] getGlobalsAndPackagesXApply() ... DONE [18:41:42.400] Number of futures (= number of chunks): 1 [18:41:42.400] Launching 1 futures (chunks) ... [18:41:42.401] Chunk #1 of 1 ... [18:41:42.401] - Finding globals in 'X' for chunk #1 ... [18:41:42.401] getGlobalsAndPackages() ... [18:41:42.401] Searching for globals... [18:41:42.402] [18:41:42.402] Searching for globals ... DONE [18:41:42.402] - globals: [0] [18:41:42.403] getGlobalsAndPackages() ... DONE [18:41:42.403] + additional globals found: [n=0] [18:41:42.403] + additional namespaces needed: [n=0] [18:41:42.403] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.404] - seeds: [18:41:42.404] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.404] getGlobalsAndPackages() ... [18:41:42.404] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.405] Resolving globals: FALSE [18:41:42.405] Tweak future expression to call with '...' arguments ... [18:41:42.405] { [18:41:42.405] do.call(function(...) { [18:41:42.405] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.405] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.405] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.405] on.exit(options(oopts), add = TRUE) [18:41:42.405] } [18:41:42.405] { [18:41:42.405] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.405] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.405] ...future.FUN(...future.X_jj, ...) [18:41:42.405] }) [18:41:42.405] } [18:41:42.405] }, args = future.call.arguments) [18:41:42.405] } [18:41:42.406] Tweak future expression to call with '...' arguments ... DONE [18:41:42.407] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.407] [18:41:42.407] getGlobalsAndPackages() ... DONE [18:41:42.408] run() for 'Future' ... [18:41:42.408] - state: 'created' [18:41:42.408] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.409] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.409] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.409] - Field: 'label' [18:41:42.410] - Field: 'local' [18:41:42.410] - Field: 'owner' [18:41:42.410] - Field: 'envir' [18:41:42.411] - Field: 'packages' [18:41:42.411] - Field: 'gc' [18:41:42.411] - Field: 'conditions' [18:41:42.411] - Field: 'expr' [18:41:42.412] - Field: 'uuid' [18:41:42.412] - Field: 'seed' [18:41:42.412] - Field: 'version' [18:41:42.413] - Field: 'result' [18:41:42.413] - Field: 'asynchronous' [18:41:42.413] - Field: 'calls' [18:41:42.413] - Field: 'globals' [18:41:42.414] - Field: 'stdout' [18:41:42.414] - Field: 'earlySignal' [18:41:42.414] - Field: 'lazy' [18:41:42.414] - Field: 'state' [18:41:42.415] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.415] - Launch lazy future ... [18:41:42.415] Packages needed by the future expression (n = 0): [18:41:42.416] Packages needed by future strategies (n = 0): [18:41:42.417] { [18:41:42.417] { [18:41:42.417] { [18:41:42.417] ...future.startTime <- base::Sys.time() [18:41:42.417] { [18:41:42.417] { [18:41:42.417] { [18:41:42.417] base::local({ [18:41:42.417] has_future <- base::requireNamespace("future", [18:41:42.417] quietly = TRUE) [18:41:42.417] if (has_future) { [18:41:42.417] ns <- base::getNamespace("future") [18:41:42.417] version <- ns[[".package"]][["version"]] [18:41:42.417] if (is.null(version)) [18:41:42.417] version <- utils::packageVersion("future") [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] version <- NULL [18:41:42.417] } [18:41:42.417] if (!has_future || version < "1.8.0") { [18:41:42.417] info <- base::c(r_version = base::gsub("R version ", [18:41:42.417] "", base::R.version$version.string), [18:41:42.417] platform = base::sprintf("%s (%s-bit)", [18:41:42.417] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.417] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.417] "release", "version")], collapse = " "), [18:41:42.417] hostname = base::Sys.info()[["nodename"]]) [18:41:42.417] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.417] info) [18:41:42.417] info <- base::paste(info, collapse = "; ") [18:41:42.417] if (!has_future) { [18:41:42.417] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.417] info) [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.417] info, version) [18:41:42.417] } [18:41:42.417] base::stop(msg) [18:41:42.417] } [18:41:42.417] }) [18:41:42.417] } [18:41:42.417] ...future.strategy.old <- future::plan("list") [18:41:42.417] options(future.plan = NULL) [18:41:42.417] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.417] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.417] } [18:41:42.417] ...future.workdir <- getwd() [18:41:42.417] } [18:41:42.417] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.417] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.417] } [18:41:42.417] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.417] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.417] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.417] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.417] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.417] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.417] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.417] base::names(...future.oldOptions)) [18:41:42.417] } [18:41:42.417] if (FALSE) { [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] if (TRUE) { [18:41:42.417] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.417] open = "w") [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.417] windows = "NUL", "/dev/null"), open = "w") [18:41:42.417] } [18:41:42.417] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.417] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.417] base::sink(type = "output", split = FALSE) [18:41:42.417] base::close(...future.stdout) [18:41:42.417] }, add = TRUE) [18:41:42.417] } [18:41:42.417] ...future.frame <- base::sys.nframe() [18:41:42.417] ...future.conditions <- base::list() [18:41:42.417] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.417] if (FALSE) { [18:41:42.417] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.417] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.417] } [18:41:42.417] ...future.result <- base::tryCatch({ [18:41:42.417] base::withCallingHandlers({ [18:41:42.417] ...future.value <- base::withVisible(base::local({ [18:41:42.417] do.call(function(...) { [18:41:42.417] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.417] if (!identical(...future.globals.maxSize.org, [18:41:42.417] ...future.globals.maxSize)) { [18:41:42.417] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.417] on.exit(options(oopts), add = TRUE) [18:41:42.417] } [18:41:42.417] { [18:41:42.417] lapply(seq_along(...future.elements_ii), [18:41:42.417] FUN = function(jj) { [18:41:42.417] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.417] ...future.FUN(...future.X_jj, ...) [18:41:42.417] }) [18:41:42.417] } [18:41:42.417] }, args = future.call.arguments) [18:41:42.417] })) [18:41:42.417] future::FutureResult(value = ...future.value$value, [18:41:42.417] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.417] ...future.rng), globalenv = if (FALSE) [18:41:42.417] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.417] ...future.globalenv.names)) [18:41:42.417] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.417] }, condition = base::local({ [18:41:42.417] c <- base::c [18:41:42.417] inherits <- base::inherits [18:41:42.417] invokeRestart <- base::invokeRestart [18:41:42.417] length <- base::length [18:41:42.417] list <- base::list [18:41:42.417] seq.int <- base::seq.int [18:41:42.417] signalCondition <- base::signalCondition [18:41:42.417] sys.calls <- base::sys.calls [18:41:42.417] `[[` <- base::`[[` [18:41:42.417] `+` <- base::`+` [18:41:42.417] `<<-` <- base::`<<-` [18:41:42.417] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.417] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.417] 3L)] [18:41:42.417] } [18:41:42.417] function(cond) { [18:41:42.417] is_error <- inherits(cond, "error") [18:41:42.417] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.417] NULL) [18:41:42.417] if (is_error) { [18:41:42.417] sessionInformation <- function() { [18:41:42.417] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.417] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.417] search = base::search(), system = base::Sys.info()) [18:41:42.417] } [18:41:42.417] ...future.conditions[[length(...future.conditions) + [18:41:42.417] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.417] cond$call), session = sessionInformation(), [18:41:42.417] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.417] signalCondition(cond) [18:41:42.417] } [18:41:42.417] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.417] "immediateCondition"))) { [18:41:42.417] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.417] ...future.conditions[[length(...future.conditions) + [18:41:42.417] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.417] if (TRUE && !signal) { [18:41:42.417] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.417] { [18:41:42.417] inherits <- base::inherits [18:41:42.417] invokeRestart <- base::invokeRestart [18:41:42.417] is.null <- base::is.null [18:41:42.417] muffled <- FALSE [18:41:42.417] if (inherits(cond, "message")) { [18:41:42.417] muffled <- grepl(pattern, "muffleMessage") [18:41:42.417] if (muffled) [18:41:42.417] invokeRestart("muffleMessage") [18:41:42.417] } [18:41:42.417] else if (inherits(cond, "warning")) { [18:41:42.417] muffled <- grepl(pattern, "muffleWarning") [18:41:42.417] if (muffled) [18:41:42.417] invokeRestart("muffleWarning") [18:41:42.417] } [18:41:42.417] else if (inherits(cond, "condition")) { [18:41:42.417] if (!is.null(pattern)) { [18:41:42.417] computeRestarts <- base::computeRestarts [18:41:42.417] grepl <- base::grepl [18:41:42.417] restarts <- computeRestarts(cond) [18:41:42.417] for (restart in restarts) { [18:41:42.417] name <- restart$name [18:41:42.417] if (is.null(name)) [18:41:42.417] next [18:41:42.417] if (!grepl(pattern, name)) [18:41:42.417] next [18:41:42.417] invokeRestart(restart) [18:41:42.417] muffled <- TRUE [18:41:42.417] break [18:41:42.417] } [18:41:42.417] } [18:41:42.417] } [18:41:42.417] invisible(muffled) [18:41:42.417] } [18:41:42.417] muffleCondition(cond, pattern = "^muffle") [18:41:42.417] } [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] if (TRUE) { [18:41:42.417] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.417] { [18:41:42.417] inherits <- base::inherits [18:41:42.417] invokeRestart <- base::invokeRestart [18:41:42.417] is.null <- base::is.null [18:41:42.417] muffled <- FALSE [18:41:42.417] if (inherits(cond, "message")) { [18:41:42.417] muffled <- grepl(pattern, "muffleMessage") [18:41:42.417] if (muffled) [18:41:42.417] invokeRestart("muffleMessage") [18:41:42.417] } [18:41:42.417] else if (inherits(cond, "warning")) { [18:41:42.417] muffled <- grepl(pattern, "muffleWarning") [18:41:42.417] if (muffled) [18:41:42.417] invokeRestart("muffleWarning") [18:41:42.417] } [18:41:42.417] else if (inherits(cond, "condition")) { [18:41:42.417] if (!is.null(pattern)) { [18:41:42.417] computeRestarts <- base::computeRestarts [18:41:42.417] grepl <- base::grepl [18:41:42.417] restarts <- computeRestarts(cond) [18:41:42.417] for (restart in restarts) { [18:41:42.417] name <- restart$name [18:41:42.417] if (is.null(name)) [18:41:42.417] next [18:41:42.417] if (!grepl(pattern, name)) [18:41:42.417] next [18:41:42.417] invokeRestart(restart) [18:41:42.417] muffled <- TRUE [18:41:42.417] break [18:41:42.417] } [18:41:42.417] } [18:41:42.417] } [18:41:42.417] invisible(muffled) [18:41:42.417] } [18:41:42.417] muffleCondition(cond, pattern = "^muffle") [18:41:42.417] } [18:41:42.417] } [18:41:42.417] } [18:41:42.417] })) [18:41:42.417] }, error = function(ex) { [18:41:42.417] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.417] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.417] ...future.rng), started = ...future.startTime, [18:41:42.417] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.417] version = "1.8"), class = "FutureResult") [18:41:42.417] }, finally = { [18:41:42.417] if (!identical(...future.workdir, getwd())) [18:41:42.417] setwd(...future.workdir) [18:41:42.417] { [18:41:42.417] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.417] ...future.oldOptions$nwarnings <- NULL [18:41:42.417] } [18:41:42.417] base::options(...future.oldOptions) [18:41:42.417] if (.Platform$OS.type == "windows") { [18:41:42.417] old_names <- names(...future.oldEnvVars) [18:41:42.417] envs <- base::Sys.getenv() [18:41:42.417] names <- names(envs) [18:41:42.417] common <- intersect(names, old_names) [18:41:42.417] added <- setdiff(names, old_names) [18:41:42.417] removed <- setdiff(old_names, names) [18:41:42.417] changed <- common[...future.oldEnvVars[common] != [18:41:42.417] envs[common]] [18:41:42.417] NAMES <- toupper(changed) [18:41:42.417] args <- list() [18:41:42.417] for (kk in seq_along(NAMES)) { [18:41:42.417] name <- changed[[kk]] [18:41:42.417] NAME <- NAMES[[kk]] [18:41:42.417] if (name != NAME && is.element(NAME, old_names)) [18:41:42.417] next [18:41:42.417] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.417] } [18:41:42.417] NAMES <- toupper(added) [18:41:42.417] for (kk in seq_along(NAMES)) { [18:41:42.417] name <- added[[kk]] [18:41:42.417] NAME <- NAMES[[kk]] [18:41:42.417] if (name != NAME && is.element(NAME, old_names)) [18:41:42.417] next [18:41:42.417] args[[name]] <- "" [18:41:42.417] } [18:41:42.417] NAMES <- toupper(removed) [18:41:42.417] for (kk in seq_along(NAMES)) { [18:41:42.417] name <- removed[[kk]] [18:41:42.417] NAME <- NAMES[[kk]] [18:41:42.417] if (name != NAME && is.element(NAME, old_names)) [18:41:42.417] next [18:41:42.417] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.417] } [18:41:42.417] if (length(args) > 0) [18:41:42.417] base::do.call(base::Sys.setenv, args = args) [18:41:42.417] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.417] } [18:41:42.417] { [18:41:42.417] if (base::length(...future.futureOptionsAdded) > [18:41:42.417] 0L) { [18:41:42.417] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.417] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.417] base::options(opts) [18:41:42.417] } [18:41:42.417] { [18:41:42.417] { [18:41:42.417] NULL [18:41:42.417] RNGkind("Mersenne-Twister") [18:41:42.417] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.417] inherits = FALSE) [18:41:42.417] } [18:41:42.417] options(future.plan = NULL) [18:41:42.417] if (is.na(NA_character_)) [18:41:42.417] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.417] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.417] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.417] .init = FALSE) [18:41:42.417] } [18:41:42.417] } [18:41:42.417] } [18:41:42.417] }) [18:41:42.417] if (TRUE) { [18:41:42.417] base::sink(type = "output", split = FALSE) [18:41:42.417] if (TRUE) { [18:41:42.417] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.417] } [18:41:42.417] else { [18:41:42.417] ...future.result["stdout"] <- base::list(NULL) [18:41:42.417] } [18:41:42.417] base::close(...future.stdout) [18:41:42.417] ...future.stdout <- NULL [18:41:42.417] } [18:41:42.417] ...future.result$conditions <- ...future.conditions [18:41:42.417] ...future.result$finished <- base::Sys.time() [18:41:42.417] ...future.result [18:41:42.417] } [18:41:42.423] assign_globals() ... [18:41:42.423] List of 5 [18:41:42.423] $ ...future.FUN :function (x, ...) [18:41:42.423] $ future.call.arguments : list() [18:41:42.423] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.423] $ ...future.elements_ii :List of 6 [18:41:42.423] ..$ a1: int 1 [18:41:42.423] ..$ a2: int 2 [18:41:42.423] ..$ b1: int 2 [18:41:42.423] ..$ b2: int 3 [18:41:42.423] ..$ c1: int 3 [18:41:42.423] ..$ c2: int 4 [18:41:42.423] $ ...future.seeds_ii : NULL [18:41:42.423] $ ...future.globals.maxSize: NULL [18:41:42.423] - attr(*, "where")=List of 5 [18:41:42.423] ..$ ...future.FUN : [18:41:42.423] ..$ future.call.arguments : [18:41:42.423] ..$ ...future.elements_ii : [18:41:42.423] ..$ ...future.seeds_ii : [18:41:42.423] ..$ ...future.globals.maxSize: [18:41:42.423] - attr(*, "resolved")= logi FALSE [18:41:42.423] - attr(*, "total_size")= num 5182 [18:41:42.423] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.423] - attr(*, "already-done")= logi TRUE [18:41:42.435] - copied '...future.FUN' to environment [18:41:42.435] - copied 'future.call.arguments' to environment [18:41:42.435] - copied '...future.elements_ii' to environment [18:41:42.436] - copied '...future.seeds_ii' to environment [18:41:42.436] - copied '...future.globals.maxSize' to environment [18:41:42.436] assign_globals() ... done [18:41:42.437] plan(): Setting new future strategy stack: [18:41:42.437] List of future strategies: [18:41:42.437] 1. sequential: [18:41:42.437] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.437] - tweaked: FALSE [18:41:42.437] - call: NULL [18:41:42.438] plan(): nbrOfWorkers() = 1 [18:41:42.440] plan(): Setting new future strategy stack: [18:41:42.440] List of future strategies: [18:41:42.440] 1. sequential: [18:41:42.440] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.440] - tweaked: FALSE [18:41:42.440] - call: plan(strategy) [18:41:42.441] plan(): nbrOfWorkers() = 1 [18:41:42.442] SequentialFuture started (and completed) [18:41:42.442] - Launch lazy future ... done [18:41:42.442] run() for 'SequentialFuture' ... done [18:41:42.443] Created future: [18:41:42.443] SequentialFuture: [18:41:42.443] Label: 'future_sapply-1' [18:41:42.443] Expression: [18:41:42.443] { [18:41:42.443] do.call(function(...) { [18:41:42.443] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.443] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.443] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.443] on.exit(options(oopts), add = TRUE) [18:41:42.443] } [18:41:42.443] { [18:41:42.443] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.443] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.443] ...future.FUN(...future.X_jj, ...) [18:41:42.443] }) [18:41:42.443] } [18:41:42.443] }, args = future.call.arguments) [18:41:42.443] } [18:41:42.443] Lazy evaluation: FALSE [18:41:42.443] Asynchronous evaluation: FALSE [18:41:42.443] Local evaluation: TRUE [18:41:42.443] Environment: R_GlobalEnv [18:41:42.443] Capture standard output: TRUE [18:41:42.443] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.443] Globals: 5 objects totaling 625 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.443] Packages: [18:41:42.443] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.443] Resolved: TRUE [18:41:42.443] Value: 282 bytes of class 'list' [18:41:42.443] Early signaling: FALSE [18:41:42.443] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.443] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.444] Chunk #1 of 1 ... DONE [18:41:42.445] Launching 1 futures (chunks) ... DONE [18:41:42.445] Resolving 1 futures (chunks) ... [18:41:42.445] resolve() on list ... [18:41:42.445] recursive: 0 [18:41:42.446] length: 1 [18:41:42.446] [18:41:42.446] resolved() for 'SequentialFuture' ... [18:41:42.446] - state: 'finished' [18:41:42.447] - run: TRUE [18:41:42.447] - result: 'FutureResult' [18:41:42.447] resolved() for 'SequentialFuture' ... done [18:41:42.447] Future #1 [18:41:42.448] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.448] - nx: 1 [18:41:42.448] - relay: TRUE [18:41:42.449] - stdout: TRUE [18:41:42.449] - signal: TRUE [18:41:42.449] - resignal: FALSE [18:41:42.449] - force: TRUE [18:41:42.449] - relayed: [n=1] FALSE [18:41:42.450] - queued futures: [n=1] FALSE [18:41:42.450] - until=1 [18:41:42.450] - relaying element #1 [18:41:42.451] - relayed: [n=1] TRUE [18:41:42.451] - queued futures: [n=1] TRUE [18:41:42.451] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.451] length: 0 (resolved future 1) [18:41:42.452] Relaying remaining futures [18:41:42.452] signalConditionsASAP(NULL, pos=0) ... [18:41:42.452] - nx: 1 [18:41:42.452] - relay: TRUE [18:41:42.452] - stdout: TRUE [18:41:42.453] - signal: TRUE [18:41:42.453] - resignal: FALSE [18:41:42.453] - force: TRUE [18:41:42.453] - relayed: [n=1] TRUE [18:41:42.454] - queued futures: [n=1] TRUE - flush all [18:41:42.454] - relayed: [n=1] TRUE [18:41:42.454] - queued futures: [n=1] TRUE [18:41:42.454] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.455] resolve() on list ... DONE [18:41:42.455] - Number of value chunks collected: 1 [18:41:42.455] Resolving 1 futures (chunks) ... DONE [18:41:42.456] Reducing values from 1 chunks ... [18:41:42.456] - Number of values collected after concatenation: 6 [18:41:42.456] - Number of values expected: 6 [18:41:42.456] Reducing values from 1 chunks ... DONE [18:41:42.457] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y1:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y2:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 [18:41:42.477] future_lapply() ... [18:41:42.479] Number of chunks: 1 [18:41:42.479] getGlobalsAndPackagesXApply() ... [18:41:42.479] - future.globals: TRUE [18:41:42.479] getGlobalsAndPackages() ... [18:41:42.480] Searching for globals... [18:41:42.482] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:42.482] Searching for globals ... DONE [18:41:42.483] Resolving globals: FALSE [18:41:42.483] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:42.484] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:42.484] - globals: [1] 'FUN' [18:41:42.485] [18:41:42.485] getGlobalsAndPackages() ... DONE [18:41:42.485] - globals found/used: [n=1] 'FUN' [18:41:42.485] - needed namespaces: [n=0] [18:41:42.486] Finding globals ... DONE [18:41:42.486] - use_args: TRUE [18:41:42.486] - Getting '...' globals ... [18:41:42.487] resolve() on list ... [18:41:42.487] recursive: 0 [18:41:42.487] length: 1 [18:41:42.487] elements: '...' [18:41:42.488] length: 0 (resolved future 1) [18:41:42.488] resolve() on list ... DONE [18:41:42.488] - '...' content: [n=0] [18:41:42.488] List of 1 [18:41:42.488] $ ...: list() [18:41:42.488] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.488] - attr(*, "where")=List of 1 [18:41:42.488] ..$ ...: [18:41:42.488] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.488] - attr(*, "resolved")= logi TRUE [18:41:42.488] - attr(*, "total_size")= num NA [18:41:42.492] - Getting '...' globals ... DONE [18:41:42.493] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.493] List of 2 [18:41:42.493] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:42.493] $ ... : list() [18:41:42.493] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.493] - attr(*, "where")=List of 2 [18:41:42.493] ..$ ...future.FUN: [18:41:42.493] ..$ ... : [18:41:42.493] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.493] - attr(*, "resolved")= logi FALSE [18:41:42.493] - attr(*, "total_size")= int 6664 [18:41:42.497] Packages to be attached in all futures: [n=0] [18:41:42.498] getGlobalsAndPackagesXApply() ... DONE [18:41:42.498] Number of futures (= number of chunks): 1 [18:41:42.498] Launching 1 futures (chunks) ... [18:41:42.499] Chunk #1 of 1 ... [18:41:42.499] - Finding globals in 'X' for chunk #1 ... [18:41:42.499] getGlobalsAndPackages() ... [18:41:42.499] Searching for globals... [18:41:42.500] [18:41:42.500] Searching for globals ... DONE [18:41:42.500] - globals: [0] [18:41:42.500] getGlobalsAndPackages() ... DONE [18:41:42.501] + additional globals found: [n=0] [18:41:42.501] + additional namespaces needed: [n=0] [18:41:42.501] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.501] - seeds: [18:41:42.501] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.502] getGlobalsAndPackages() ... [18:41:42.502] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.502] Resolving globals: FALSE [18:41:42.502] Tweak future expression to call with '...' arguments ... [18:41:42.503] { [18:41:42.503] do.call(function(...) { [18:41:42.503] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.503] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.503] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.503] on.exit(options(oopts), add = TRUE) [18:41:42.503] } [18:41:42.503] { [18:41:42.503] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.503] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.503] ...future.FUN(...future.X_jj, ...) [18:41:42.503] }) [18:41:42.503] } [18:41:42.503] }, args = future.call.arguments) [18:41:42.503] } [18:41:42.503] Tweak future expression to call with '...' arguments ... DONE [18:41:42.504] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.504] [18:41:42.504] getGlobalsAndPackages() ... DONE [18:41:42.505] run() for 'Future' ... [18:41:42.505] - state: 'created' [18:41:42.506] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.506] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.506] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.507] - Field: 'label' [18:41:42.507] - Field: 'local' [18:41:42.507] - Field: 'owner' [18:41:42.507] - Field: 'envir' [18:41:42.508] - Field: 'packages' [18:41:42.508] - Field: 'gc' [18:41:42.508] - Field: 'conditions' [18:41:42.508] - Field: 'expr' [18:41:42.509] - Field: 'uuid' [18:41:42.509] - Field: 'seed' [18:41:42.509] - Field: 'version' [18:41:42.509] - Field: 'result' [18:41:42.510] - Field: 'asynchronous' [18:41:42.510] - Field: 'calls' [18:41:42.510] - Field: 'globals' [18:41:42.510] - Field: 'stdout' [18:41:42.511] - Field: 'earlySignal' [18:41:42.511] - Field: 'lazy' [18:41:42.511] - Field: 'state' [18:41:42.511] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.512] - Launch lazy future ... [18:41:42.512] Packages needed by the future expression (n = 0): [18:41:42.512] Packages needed by future strategies (n = 0): [18:41:42.513] { [18:41:42.513] { [18:41:42.513] { [18:41:42.513] ...future.startTime <- base::Sys.time() [18:41:42.513] { [18:41:42.513] { [18:41:42.513] { [18:41:42.513] base::local({ [18:41:42.513] has_future <- base::requireNamespace("future", [18:41:42.513] quietly = TRUE) [18:41:42.513] if (has_future) { [18:41:42.513] ns <- base::getNamespace("future") [18:41:42.513] version <- ns[[".package"]][["version"]] [18:41:42.513] if (is.null(version)) [18:41:42.513] version <- utils::packageVersion("future") [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] version <- NULL [18:41:42.513] } [18:41:42.513] if (!has_future || version < "1.8.0") { [18:41:42.513] info <- base::c(r_version = base::gsub("R version ", [18:41:42.513] "", base::R.version$version.string), [18:41:42.513] platform = base::sprintf("%s (%s-bit)", [18:41:42.513] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.513] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.513] "release", "version")], collapse = " "), [18:41:42.513] hostname = base::Sys.info()[["nodename"]]) [18:41:42.513] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.513] info) [18:41:42.513] info <- base::paste(info, collapse = "; ") [18:41:42.513] if (!has_future) { [18:41:42.513] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.513] info) [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.513] info, version) [18:41:42.513] } [18:41:42.513] base::stop(msg) [18:41:42.513] } [18:41:42.513] }) [18:41:42.513] } [18:41:42.513] ...future.strategy.old <- future::plan("list") [18:41:42.513] options(future.plan = NULL) [18:41:42.513] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.513] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.513] } [18:41:42.513] ...future.workdir <- getwd() [18:41:42.513] } [18:41:42.513] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.513] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.513] } [18:41:42.513] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.513] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.513] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.513] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.513] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.513] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.513] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.513] base::names(...future.oldOptions)) [18:41:42.513] } [18:41:42.513] if (FALSE) { [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] if (TRUE) { [18:41:42.513] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.513] open = "w") [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.513] windows = "NUL", "/dev/null"), open = "w") [18:41:42.513] } [18:41:42.513] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.513] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.513] base::sink(type = "output", split = FALSE) [18:41:42.513] base::close(...future.stdout) [18:41:42.513] }, add = TRUE) [18:41:42.513] } [18:41:42.513] ...future.frame <- base::sys.nframe() [18:41:42.513] ...future.conditions <- base::list() [18:41:42.513] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.513] if (FALSE) { [18:41:42.513] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.513] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.513] } [18:41:42.513] ...future.result <- base::tryCatch({ [18:41:42.513] base::withCallingHandlers({ [18:41:42.513] ...future.value <- base::withVisible(base::local({ [18:41:42.513] do.call(function(...) { [18:41:42.513] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.513] if (!identical(...future.globals.maxSize.org, [18:41:42.513] ...future.globals.maxSize)) { [18:41:42.513] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.513] on.exit(options(oopts), add = TRUE) [18:41:42.513] } [18:41:42.513] { [18:41:42.513] lapply(seq_along(...future.elements_ii), [18:41:42.513] FUN = function(jj) { [18:41:42.513] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.513] ...future.FUN(...future.X_jj, ...) [18:41:42.513] }) [18:41:42.513] } [18:41:42.513] }, args = future.call.arguments) [18:41:42.513] })) [18:41:42.513] future::FutureResult(value = ...future.value$value, [18:41:42.513] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.513] ...future.rng), globalenv = if (FALSE) [18:41:42.513] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.513] ...future.globalenv.names)) [18:41:42.513] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.513] }, condition = base::local({ [18:41:42.513] c <- base::c [18:41:42.513] inherits <- base::inherits [18:41:42.513] invokeRestart <- base::invokeRestart [18:41:42.513] length <- base::length [18:41:42.513] list <- base::list [18:41:42.513] seq.int <- base::seq.int [18:41:42.513] signalCondition <- base::signalCondition [18:41:42.513] sys.calls <- base::sys.calls [18:41:42.513] `[[` <- base::`[[` [18:41:42.513] `+` <- base::`+` [18:41:42.513] `<<-` <- base::`<<-` [18:41:42.513] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.513] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.513] 3L)] [18:41:42.513] } [18:41:42.513] function(cond) { [18:41:42.513] is_error <- inherits(cond, "error") [18:41:42.513] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.513] NULL) [18:41:42.513] if (is_error) { [18:41:42.513] sessionInformation <- function() { [18:41:42.513] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.513] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.513] search = base::search(), system = base::Sys.info()) [18:41:42.513] } [18:41:42.513] ...future.conditions[[length(...future.conditions) + [18:41:42.513] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.513] cond$call), session = sessionInformation(), [18:41:42.513] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.513] signalCondition(cond) [18:41:42.513] } [18:41:42.513] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.513] "immediateCondition"))) { [18:41:42.513] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.513] ...future.conditions[[length(...future.conditions) + [18:41:42.513] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.513] if (TRUE && !signal) { [18:41:42.513] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.513] { [18:41:42.513] inherits <- base::inherits [18:41:42.513] invokeRestart <- base::invokeRestart [18:41:42.513] is.null <- base::is.null [18:41:42.513] muffled <- FALSE [18:41:42.513] if (inherits(cond, "message")) { [18:41:42.513] muffled <- grepl(pattern, "muffleMessage") [18:41:42.513] if (muffled) [18:41:42.513] invokeRestart("muffleMessage") [18:41:42.513] } [18:41:42.513] else if (inherits(cond, "warning")) { [18:41:42.513] muffled <- grepl(pattern, "muffleWarning") [18:41:42.513] if (muffled) [18:41:42.513] invokeRestart("muffleWarning") [18:41:42.513] } [18:41:42.513] else if (inherits(cond, "condition")) { [18:41:42.513] if (!is.null(pattern)) { [18:41:42.513] computeRestarts <- base::computeRestarts [18:41:42.513] grepl <- base::grepl [18:41:42.513] restarts <- computeRestarts(cond) [18:41:42.513] for (restart in restarts) { [18:41:42.513] name <- restart$name [18:41:42.513] if (is.null(name)) [18:41:42.513] next [18:41:42.513] if (!grepl(pattern, name)) [18:41:42.513] next [18:41:42.513] invokeRestart(restart) [18:41:42.513] muffled <- TRUE [18:41:42.513] break [18:41:42.513] } [18:41:42.513] } [18:41:42.513] } [18:41:42.513] invisible(muffled) [18:41:42.513] } [18:41:42.513] muffleCondition(cond, pattern = "^muffle") [18:41:42.513] } [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] if (TRUE) { [18:41:42.513] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.513] { [18:41:42.513] inherits <- base::inherits [18:41:42.513] invokeRestart <- base::invokeRestart [18:41:42.513] is.null <- base::is.null [18:41:42.513] muffled <- FALSE [18:41:42.513] if (inherits(cond, "message")) { [18:41:42.513] muffled <- grepl(pattern, "muffleMessage") [18:41:42.513] if (muffled) [18:41:42.513] invokeRestart("muffleMessage") [18:41:42.513] } [18:41:42.513] else if (inherits(cond, "warning")) { [18:41:42.513] muffled <- grepl(pattern, "muffleWarning") [18:41:42.513] if (muffled) [18:41:42.513] invokeRestart("muffleWarning") [18:41:42.513] } [18:41:42.513] else if (inherits(cond, "condition")) { [18:41:42.513] if (!is.null(pattern)) { [18:41:42.513] computeRestarts <- base::computeRestarts [18:41:42.513] grepl <- base::grepl [18:41:42.513] restarts <- computeRestarts(cond) [18:41:42.513] for (restart in restarts) { [18:41:42.513] name <- restart$name [18:41:42.513] if (is.null(name)) [18:41:42.513] next [18:41:42.513] if (!grepl(pattern, name)) [18:41:42.513] next [18:41:42.513] invokeRestart(restart) [18:41:42.513] muffled <- TRUE [18:41:42.513] break [18:41:42.513] } [18:41:42.513] } [18:41:42.513] } [18:41:42.513] invisible(muffled) [18:41:42.513] } [18:41:42.513] muffleCondition(cond, pattern = "^muffle") [18:41:42.513] } [18:41:42.513] } [18:41:42.513] } [18:41:42.513] })) [18:41:42.513] }, error = function(ex) { [18:41:42.513] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.513] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.513] ...future.rng), started = ...future.startTime, [18:41:42.513] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.513] version = "1.8"), class = "FutureResult") [18:41:42.513] }, finally = { [18:41:42.513] if (!identical(...future.workdir, getwd())) [18:41:42.513] setwd(...future.workdir) [18:41:42.513] { [18:41:42.513] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.513] ...future.oldOptions$nwarnings <- NULL [18:41:42.513] } [18:41:42.513] base::options(...future.oldOptions) [18:41:42.513] if (.Platform$OS.type == "windows") { [18:41:42.513] old_names <- names(...future.oldEnvVars) [18:41:42.513] envs <- base::Sys.getenv() [18:41:42.513] names <- names(envs) [18:41:42.513] common <- intersect(names, old_names) [18:41:42.513] added <- setdiff(names, old_names) [18:41:42.513] removed <- setdiff(old_names, names) [18:41:42.513] changed <- common[...future.oldEnvVars[common] != [18:41:42.513] envs[common]] [18:41:42.513] NAMES <- toupper(changed) [18:41:42.513] args <- list() [18:41:42.513] for (kk in seq_along(NAMES)) { [18:41:42.513] name <- changed[[kk]] [18:41:42.513] NAME <- NAMES[[kk]] [18:41:42.513] if (name != NAME && is.element(NAME, old_names)) [18:41:42.513] next [18:41:42.513] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.513] } [18:41:42.513] NAMES <- toupper(added) [18:41:42.513] for (kk in seq_along(NAMES)) { [18:41:42.513] name <- added[[kk]] [18:41:42.513] NAME <- NAMES[[kk]] [18:41:42.513] if (name != NAME && is.element(NAME, old_names)) [18:41:42.513] next [18:41:42.513] args[[name]] <- "" [18:41:42.513] } [18:41:42.513] NAMES <- toupper(removed) [18:41:42.513] for (kk in seq_along(NAMES)) { [18:41:42.513] name <- removed[[kk]] [18:41:42.513] NAME <- NAMES[[kk]] [18:41:42.513] if (name != NAME && is.element(NAME, old_names)) [18:41:42.513] next [18:41:42.513] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.513] } [18:41:42.513] if (length(args) > 0) [18:41:42.513] base::do.call(base::Sys.setenv, args = args) [18:41:42.513] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.513] } [18:41:42.513] { [18:41:42.513] if (base::length(...future.futureOptionsAdded) > [18:41:42.513] 0L) { [18:41:42.513] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.513] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.513] base::options(opts) [18:41:42.513] } [18:41:42.513] { [18:41:42.513] { [18:41:42.513] NULL [18:41:42.513] RNGkind("Mersenne-Twister") [18:41:42.513] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.513] inherits = FALSE) [18:41:42.513] } [18:41:42.513] options(future.plan = NULL) [18:41:42.513] if (is.na(NA_character_)) [18:41:42.513] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.513] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.513] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.513] .init = FALSE) [18:41:42.513] } [18:41:42.513] } [18:41:42.513] } [18:41:42.513] }) [18:41:42.513] if (TRUE) { [18:41:42.513] base::sink(type = "output", split = FALSE) [18:41:42.513] if (TRUE) { [18:41:42.513] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.513] } [18:41:42.513] else { [18:41:42.513] ...future.result["stdout"] <- base::list(NULL) [18:41:42.513] } [18:41:42.513] base::close(...future.stdout) [18:41:42.513] ...future.stdout <- NULL [18:41:42.513] } [18:41:42.513] ...future.result$conditions <- ...future.conditions [18:41:42.513] ...future.result$finished <- base::Sys.time() [18:41:42.513] ...future.result [18:41:42.513] } [18:41:42.519] assign_globals() ... [18:41:42.519] List of 5 [18:41:42.519] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:42.519] $ future.call.arguments : list() [18:41:42.519] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.519] $ ...future.elements_ii :List of 6 [18:41:42.519] ..$ a1: int 1 [18:41:42.519] ..$ a2: int 2 [18:41:42.519] ..$ b1: int 2 [18:41:42.519] ..$ b2: int 3 [18:41:42.519] ..$ c1: int 3 [18:41:42.519] ..$ c2: int 4 [18:41:42.519] $ ...future.seeds_ii : NULL [18:41:42.519] $ ...future.globals.maxSize: NULL [18:41:42.519] - attr(*, "where")=List of 5 [18:41:42.519] ..$ ...future.FUN : [18:41:42.519] ..$ future.call.arguments : [18:41:42.519] ..$ ...future.elements_ii : [18:41:42.519] ..$ ...future.seeds_ii : [18:41:42.519] ..$ ...future.globals.maxSize: [18:41:42.519] - attr(*, "resolved")= logi FALSE [18:41:42.519] - attr(*, "total_size")= num 6664 [18:41:42.519] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.519] - attr(*, "already-done")= logi TRUE [18:41:42.530] - reassign environment for '...future.FUN' [18:41:42.530] - copied '...future.FUN' to environment [18:41:42.530] - copied 'future.call.arguments' to environment [18:41:42.531] - copied '...future.elements_ii' to environment [18:41:42.531] - copied '...future.seeds_ii' to environment [18:41:42.531] - copied '...future.globals.maxSize' to environment [18:41:42.531] assign_globals() ... done [18:41:42.532] plan(): Setting new future strategy stack: [18:41:42.532] List of future strategies: [18:41:42.532] 1. sequential: [18:41:42.532] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.532] - tweaked: FALSE [18:41:42.532] - call: NULL [18:41:42.533] plan(): nbrOfWorkers() = 1 [18:41:42.535] plan(): Setting new future strategy stack: [18:41:42.535] List of future strategies: [18:41:42.535] 1. sequential: [18:41:42.535] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.535] - tweaked: FALSE [18:41:42.535] - call: plan(strategy) [18:41:42.536] plan(): nbrOfWorkers() = 1 [18:41:42.536] SequentialFuture started (and completed) [18:41:42.537] - Launch lazy future ... done [18:41:42.537] run() for 'SequentialFuture' ... done [18:41:42.537] Created future: [18:41:42.538] SequentialFuture: [18:41:42.538] Label: 'future_sapply-1' [18:41:42.538] Expression: [18:41:42.538] { [18:41:42.538] do.call(function(...) { [18:41:42.538] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.538] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.538] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.538] on.exit(options(oopts), add = TRUE) [18:41:42.538] } [18:41:42.538] { [18:41:42.538] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.538] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.538] ...future.FUN(...future.X_jj, ...) [18:41:42.538] }) [18:41:42.538] } [18:41:42.538] }, args = future.call.arguments) [18:41:42.538] } [18:41:42.538] Lazy evaluation: FALSE [18:41:42.538] Asynchronous evaluation: FALSE [18:41:42.538] Local evaluation: TRUE [18:41:42.538] Environment: R_GlobalEnv [18:41:42.538] Capture standard output: TRUE [18:41:42.538] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.538] Globals: 5 objects totaling 1.10 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.538] Packages: [18:41:42.538] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.538] Resolved: TRUE [18:41:42.538] Value: 978 bytes of class 'list' [18:41:42.538] Early signaling: FALSE [18:41:42.538] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.538] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.539] Chunk #1 of 1 ... DONE [18:41:42.540] Launching 1 futures (chunks) ... DONE [18:41:42.540] Resolving 1 futures (chunks) ... [18:41:42.540] resolve() on list ... [18:41:42.540] recursive: 0 [18:41:42.541] length: 1 [18:41:42.541] [18:41:42.541] resolved() for 'SequentialFuture' ... [18:41:42.541] - state: 'finished' [18:41:42.542] - run: TRUE [18:41:42.542] - result: 'FutureResult' [18:41:42.542] resolved() for 'SequentialFuture' ... done [18:41:42.543] Future #1 [18:41:42.543] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.543] - nx: 1 [18:41:42.544] - relay: TRUE [18:41:42.544] - stdout: TRUE [18:41:42.544] - signal: TRUE [18:41:42.544] - resignal: FALSE [18:41:42.544] - force: TRUE [18:41:42.545] - relayed: [n=1] FALSE [18:41:42.545] - queued futures: [n=1] FALSE [18:41:42.545] - until=1 [18:41:42.545] - relaying element #1 [18:41:42.546] - relayed: [n=1] TRUE [18:41:42.546] - queued futures: [n=1] TRUE [18:41:42.546] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.547] length: 0 (resolved future 1) [18:41:42.547] Relaying remaining futures [18:41:42.547] signalConditionsASAP(NULL, pos=0) ... [18:41:42.548] - nx: 1 [18:41:42.548] - relay: TRUE [18:41:42.548] - stdout: TRUE [18:41:42.548] - signal: TRUE [18:41:42.548] - resignal: FALSE [18:41:42.549] - force: TRUE [18:41:42.549] - relayed: [n=1] TRUE [18:41:42.549] - queued futures: [n=1] TRUE - flush all [18:41:42.550] - relayed: [n=1] TRUE [18:41:42.550] - queued futures: [n=1] TRUE [18:41:42.550] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.550] resolve() on list ... DONE [18:41:42.551] - Number of value chunks collected: 1 [18:41:42.551] Resolving 1 futures (chunks) ... DONE [18:41:42.551] Reducing values from 1 chunks ... [18:41:42.551] - Number of values collected after concatenation: 6 [18:41:42.552] - Number of values expected: 6 [18:41:42.552] Reducing values from 1 chunks ... DONE [18:41:42.552] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y1:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y2:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... [18:41:42.573] future_lapply() ... [18:41:42.574] Number of chunks: 1 [18:41:42.574] getGlobalsAndPackagesXApply() ... [18:41:42.575] - future.globals: TRUE [18:41:42.575] getGlobalsAndPackages() ... [18:41:42.575] Searching for globals... [18:41:42.577] - globals found: [1] 'FUN' [18:41:42.577] Searching for globals ... DONE [18:41:42.578] Resolving globals: FALSE [18:41:42.578] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:42.579] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:42.579] - globals: [1] 'FUN' [18:41:42.579] [18:41:42.580] getGlobalsAndPackages() ... DONE [18:41:42.580] - globals found/used: [n=1] 'FUN' [18:41:42.580] - needed namespaces: [n=0] [18:41:42.580] Finding globals ... DONE [18:41:42.581] - use_args: TRUE [18:41:42.581] - Getting '...' globals ... [18:41:42.582] resolve() on list ... [18:41:42.582] recursive: 0 [18:41:42.582] length: 1 [18:41:42.583] elements: '...' [18:41:42.583] length: 0 (resolved future 1) [18:41:42.583] resolve() on list ... DONE [18:41:42.583] - '...' content: [n=0] [18:41:42.584] List of 1 [18:41:42.584] $ ...: list() [18:41:42.584] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.584] - attr(*, "where")=List of 1 [18:41:42.584] ..$ ...: [18:41:42.584] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.584] - attr(*, "resolved")= logi TRUE [18:41:42.584] - attr(*, "total_size")= num NA [18:41:42.588] - Getting '...' globals ... DONE [18:41:42.589] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.589] List of 2 [18:41:42.589] $ ...future.FUN:function (x) [18:41:42.589] $ ... : list() [18:41:42.589] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.589] - attr(*, "where")=List of 2 [18:41:42.589] ..$ ...future.FUN: [18:41:42.589] ..$ ... : [18:41:42.589] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.589] - attr(*, "resolved")= logi FALSE [18:41:42.589] - attr(*, "total_size")= int 4942 [18:41:42.594] Packages to be attached in all futures: [n=0] [18:41:42.594] getGlobalsAndPackagesXApply() ... DONE [18:41:42.595] Number of futures (= number of chunks): 1 [18:41:42.595] Launching 1 futures (chunks) ... [18:41:42.595] Chunk #1 of 1 ... [18:41:42.596] - Finding globals in 'X' for chunk #1 ... [18:41:42.596] getGlobalsAndPackages() ... [18:41:42.596] Searching for globals... [18:41:42.597] [18:41:42.597] Searching for globals ... DONE [18:41:42.597] - globals: [0] [18:41:42.597] getGlobalsAndPackages() ... DONE [18:41:42.598] + additional globals found: [n=0] [18:41:42.598] + additional namespaces needed: [n=0] [18:41:42.598] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.598] - seeds: [18:41:42.599] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.599] getGlobalsAndPackages() ... [18:41:42.599] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.600] Resolving globals: FALSE [18:41:42.600] Tweak future expression to call with '...' arguments ... [18:41:42.600] { [18:41:42.600] do.call(function(...) { [18:41:42.600] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.600] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.600] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.600] on.exit(options(oopts), add = TRUE) [18:41:42.600] } [18:41:42.600] { [18:41:42.600] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.600] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.600] ...future.FUN(...future.X_jj, ...) [18:41:42.600] }) [18:41:42.600] } [18:41:42.600] }, args = future.call.arguments) [18:41:42.600] } [18:41:42.601] Tweak future expression to call with '...' arguments ... DONE [18:41:42.601] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.602] [18:41:42.602] getGlobalsAndPackages() ... DONE [18:41:42.602] run() for 'Future' ... [18:41:42.603] - state: 'created' [18:41:42.603] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.604] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.604] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.604] - Field: 'label' [18:41:42.605] - Field: 'local' [18:41:42.605] - Field: 'owner' [18:41:42.605] - Field: 'envir' [18:41:42.605] - Field: 'packages' [18:41:42.606] - Field: 'gc' [18:41:42.606] - Field: 'conditions' [18:41:42.606] - Field: 'expr' [18:41:42.607] - Field: 'uuid' [18:41:42.607] - Field: 'seed' [18:41:42.607] - Field: 'version' [18:41:42.607] - Field: 'result' [18:41:42.608] - Field: 'asynchronous' [18:41:42.608] - Field: 'calls' [18:41:42.608] - Field: 'globals' [18:41:42.608] - Field: 'stdout' [18:41:42.609] - Field: 'earlySignal' [18:41:42.609] - Field: 'lazy' [18:41:42.609] - Field: 'state' [18:41:42.610] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.610] - Launch lazy future ... [18:41:42.610] Packages needed by the future expression (n = 0): [18:41:42.610] Packages needed by future strategies (n = 0): [18:41:42.611] { [18:41:42.611] { [18:41:42.611] { [18:41:42.611] ...future.startTime <- base::Sys.time() [18:41:42.611] { [18:41:42.611] { [18:41:42.611] { [18:41:42.611] base::local({ [18:41:42.611] has_future <- base::requireNamespace("future", [18:41:42.611] quietly = TRUE) [18:41:42.611] if (has_future) { [18:41:42.611] ns <- base::getNamespace("future") [18:41:42.611] version <- ns[[".package"]][["version"]] [18:41:42.611] if (is.null(version)) [18:41:42.611] version <- utils::packageVersion("future") [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] version <- NULL [18:41:42.611] } [18:41:42.611] if (!has_future || version < "1.8.0") { [18:41:42.611] info <- base::c(r_version = base::gsub("R version ", [18:41:42.611] "", base::R.version$version.string), [18:41:42.611] platform = base::sprintf("%s (%s-bit)", [18:41:42.611] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.611] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.611] "release", "version")], collapse = " "), [18:41:42.611] hostname = base::Sys.info()[["nodename"]]) [18:41:42.611] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.611] info) [18:41:42.611] info <- base::paste(info, collapse = "; ") [18:41:42.611] if (!has_future) { [18:41:42.611] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.611] info) [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.611] info, version) [18:41:42.611] } [18:41:42.611] base::stop(msg) [18:41:42.611] } [18:41:42.611] }) [18:41:42.611] } [18:41:42.611] ...future.strategy.old <- future::plan("list") [18:41:42.611] options(future.plan = NULL) [18:41:42.611] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.611] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.611] } [18:41:42.611] ...future.workdir <- getwd() [18:41:42.611] } [18:41:42.611] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.611] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.611] } [18:41:42.611] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.611] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.611] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.611] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.611] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.611] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.611] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.611] base::names(...future.oldOptions)) [18:41:42.611] } [18:41:42.611] if (FALSE) { [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] if (TRUE) { [18:41:42.611] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.611] open = "w") [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.611] windows = "NUL", "/dev/null"), open = "w") [18:41:42.611] } [18:41:42.611] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.611] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.611] base::sink(type = "output", split = FALSE) [18:41:42.611] base::close(...future.stdout) [18:41:42.611] }, add = TRUE) [18:41:42.611] } [18:41:42.611] ...future.frame <- base::sys.nframe() [18:41:42.611] ...future.conditions <- base::list() [18:41:42.611] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.611] if (FALSE) { [18:41:42.611] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.611] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.611] } [18:41:42.611] ...future.result <- base::tryCatch({ [18:41:42.611] base::withCallingHandlers({ [18:41:42.611] ...future.value <- base::withVisible(base::local({ [18:41:42.611] do.call(function(...) { [18:41:42.611] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.611] if (!identical(...future.globals.maxSize.org, [18:41:42.611] ...future.globals.maxSize)) { [18:41:42.611] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.611] on.exit(options(oopts), add = TRUE) [18:41:42.611] } [18:41:42.611] { [18:41:42.611] lapply(seq_along(...future.elements_ii), [18:41:42.611] FUN = function(jj) { [18:41:42.611] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.611] ...future.FUN(...future.X_jj, ...) [18:41:42.611] }) [18:41:42.611] } [18:41:42.611] }, args = future.call.arguments) [18:41:42.611] })) [18:41:42.611] future::FutureResult(value = ...future.value$value, [18:41:42.611] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.611] ...future.rng), globalenv = if (FALSE) [18:41:42.611] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.611] ...future.globalenv.names)) [18:41:42.611] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.611] }, condition = base::local({ [18:41:42.611] c <- base::c [18:41:42.611] inherits <- base::inherits [18:41:42.611] invokeRestart <- base::invokeRestart [18:41:42.611] length <- base::length [18:41:42.611] list <- base::list [18:41:42.611] seq.int <- base::seq.int [18:41:42.611] signalCondition <- base::signalCondition [18:41:42.611] sys.calls <- base::sys.calls [18:41:42.611] `[[` <- base::`[[` [18:41:42.611] `+` <- base::`+` [18:41:42.611] `<<-` <- base::`<<-` [18:41:42.611] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.611] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.611] 3L)] [18:41:42.611] } [18:41:42.611] function(cond) { [18:41:42.611] is_error <- inherits(cond, "error") [18:41:42.611] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.611] NULL) [18:41:42.611] if (is_error) { [18:41:42.611] sessionInformation <- function() { [18:41:42.611] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.611] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.611] search = base::search(), system = base::Sys.info()) [18:41:42.611] } [18:41:42.611] ...future.conditions[[length(...future.conditions) + [18:41:42.611] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.611] cond$call), session = sessionInformation(), [18:41:42.611] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.611] signalCondition(cond) [18:41:42.611] } [18:41:42.611] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.611] "immediateCondition"))) { [18:41:42.611] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.611] ...future.conditions[[length(...future.conditions) + [18:41:42.611] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.611] if (TRUE && !signal) { [18:41:42.611] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.611] { [18:41:42.611] inherits <- base::inherits [18:41:42.611] invokeRestart <- base::invokeRestart [18:41:42.611] is.null <- base::is.null [18:41:42.611] muffled <- FALSE [18:41:42.611] if (inherits(cond, "message")) { [18:41:42.611] muffled <- grepl(pattern, "muffleMessage") [18:41:42.611] if (muffled) [18:41:42.611] invokeRestart("muffleMessage") [18:41:42.611] } [18:41:42.611] else if (inherits(cond, "warning")) { [18:41:42.611] muffled <- grepl(pattern, "muffleWarning") [18:41:42.611] if (muffled) [18:41:42.611] invokeRestart("muffleWarning") [18:41:42.611] } [18:41:42.611] else if (inherits(cond, "condition")) { [18:41:42.611] if (!is.null(pattern)) { [18:41:42.611] computeRestarts <- base::computeRestarts [18:41:42.611] grepl <- base::grepl [18:41:42.611] restarts <- computeRestarts(cond) [18:41:42.611] for (restart in restarts) { [18:41:42.611] name <- restart$name [18:41:42.611] if (is.null(name)) [18:41:42.611] next [18:41:42.611] if (!grepl(pattern, name)) [18:41:42.611] next [18:41:42.611] invokeRestart(restart) [18:41:42.611] muffled <- TRUE [18:41:42.611] break [18:41:42.611] } [18:41:42.611] } [18:41:42.611] } [18:41:42.611] invisible(muffled) [18:41:42.611] } [18:41:42.611] muffleCondition(cond, pattern = "^muffle") [18:41:42.611] } [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] if (TRUE) { [18:41:42.611] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.611] { [18:41:42.611] inherits <- base::inherits [18:41:42.611] invokeRestart <- base::invokeRestart [18:41:42.611] is.null <- base::is.null [18:41:42.611] muffled <- FALSE [18:41:42.611] if (inherits(cond, "message")) { [18:41:42.611] muffled <- grepl(pattern, "muffleMessage") [18:41:42.611] if (muffled) [18:41:42.611] invokeRestart("muffleMessage") [18:41:42.611] } [18:41:42.611] else if (inherits(cond, "warning")) { [18:41:42.611] muffled <- grepl(pattern, "muffleWarning") [18:41:42.611] if (muffled) [18:41:42.611] invokeRestart("muffleWarning") [18:41:42.611] } [18:41:42.611] else if (inherits(cond, "condition")) { [18:41:42.611] if (!is.null(pattern)) { [18:41:42.611] computeRestarts <- base::computeRestarts [18:41:42.611] grepl <- base::grepl [18:41:42.611] restarts <- computeRestarts(cond) [18:41:42.611] for (restart in restarts) { [18:41:42.611] name <- restart$name [18:41:42.611] if (is.null(name)) [18:41:42.611] next [18:41:42.611] if (!grepl(pattern, name)) [18:41:42.611] next [18:41:42.611] invokeRestart(restart) [18:41:42.611] muffled <- TRUE [18:41:42.611] break [18:41:42.611] } [18:41:42.611] } [18:41:42.611] } [18:41:42.611] invisible(muffled) [18:41:42.611] } [18:41:42.611] muffleCondition(cond, pattern = "^muffle") [18:41:42.611] } [18:41:42.611] } [18:41:42.611] } [18:41:42.611] })) [18:41:42.611] }, error = function(ex) { [18:41:42.611] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.611] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.611] ...future.rng), started = ...future.startTime, [18:41:42.611] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.611] version = "1.8"), class = "FutureResult") [18:41:42.611] }, finally = { [18:41:42.611] if (!identical(...future.workdir, getwd())) [18:41:42.611] setwd(...future.workdir) [18:41:42.611] { [18:41:42.611] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.611] ...future.oldOptions$nwarnings <- NULL [18:41:42.611] } [18:41:42.611] base::options(...future.oldOptions) [18:41:42.611] if (.Platform$OS.type == "windows") { [18:41:42.611] old_names <- names(...future.oldEnvVars) [18:41:42.611] envs <- base::Sys.getenv() [18:41:42.611] names <- names(envs) [18:41:42.611] common <- intersect(names, old_names) [18:41:42.611] added <- setdiff(names, old_names) [18:41:42.611] removed <- setdiff(old_names, names) [18:41:42.611] changed <- common[...future.oldEnvVars[common] != [18:41:42.611] envs[common]] [18:41:42.611] NAMES <- toupper(changed) [18:41:42.611] args <- list() [18:41:42.611] for (kk in seq_along(NAMES)) { [18:41:42.611] name <- changed[[kk]] [18:41:42.611] NAME <- NAMES[[kk]] [18:41:42.611] if (name != NAME && is.element(NAME, old_names)) [18:41:42.611] next [18:41:42.611] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.611] } [18:41:42.611] NAMES <- toupper(added) [18:41:42.611] for (kk in seq_along(NAMES)) { [18:41:42.611] name <- added[[kk]] [18:41:42.611] NAME <- NAMES[[kk]] [18:41:42.611] if (name != NAME && is.element(NAME, old_names)) [18:41:42.611] next [18:41:42.611] args[[name]] <- "" [18:41:42.611] } [18:41:42.611] NAMES <- toupper(removed) [18:41:42.611] for (kk in seq_along(NAMES)) { [18:41:42.611] name <- removed[[kk]] [18:41:42.611] NAME <- NAMES[[kk]] [18:41:42.611] if (name != NAME && is.element(NAME, old_names)) [18:41:42.611] next [18:41:42.611] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.611] } [18:41:42.611] if (length(args) > 0) [18:41:42.611] base::do.call(base::Sys.setenv, args = args) [18:41:42.611] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.611] } [18:41:42.611] { [18:41:42.611] if (base::length(...future.futureOptionsAdded) > [18:41:42.611] 0L) { [18:41:42.611] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.611] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.611] base::options(opts) [18:41:42.611] } [18:41:42.611] { [18:41:42.611] { [18:41:42.611] NULL [18:41:42.611] RNGkind("Mersenne-Twister") [18:41:42.611] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.611] inherits = FALSE) [18:41:42.611] } [18:41:42.611] options(future.plan = NULL) [18:41:42.611] if (is.na(NA_character_)) [18:41:42.611] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.611] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.611] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.611] .init = FALSE) [18:41:42.611] } [18:41:42.611] } [18:41:42.611] } [18:41:42.611] }) [18:41:42.611] if (TRUE) { [18:41:42.611] base::sink(type = "output", split = FALSE) [18:41:42.611] if (TRUE) { [18:41:42.611] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.611] } [18:41:42.611] else { [18:41:42.611] ...future.result["stdout"] <- base::list(NULL) [18:41:42.611] } [18:41:42.611] base::close(...future.stdout) [18:41:42.611] ...future.stdout <- NULL [18:41:42.611] } [18:41:42.611] ...future.result$conditions <- ...future.conditions [18:41:42.611] ...future.result$finished <- base::Sys.time() [18:41:42.611] ...future.result [18:41:42.611] } [18:41:42.618] assign_globals() ... [18:41:42.618] List of 5 [18:41:42.618] $ ...future.FUN :function (x) [18:41:42.618] $ future.call.arguments : list() [18:41:42.618] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.618] $ ...future.elements_ii :List of 6 [18:41:42.618] ..$ a1: int 1 [18:41:42.618] ..$ a2: int 2 [18:41:42.618] ..$ b1: int 2 [18:41:42.618] ..$ b2: int 3 [18:41:42.618] ..$ c1: int 3 [18:41:42.618] ..$ c2: int 4 [18:41:42.618] $ ...future.seeds_ii : NULL [18:41:42.618] $ ...future.globals.maxSize: NULL [18:41:42.618] - attr(*, "where")=List of 5 [18:41:42.618] ..$ ...future.FUN : [18:41:42.618] ..$ future.call.arguments : [18:41:42.618] ..$ ...future.elements_ii : [18:41:42.618] ..$ ...future.seeds_ii : [18:41:42.618] ..$ ...future.globals.maxSize: [18:41:42.618] - attr(*, "resolved")= logi FALSE [18:41:42.618] - attr(*, "total_size")= num 4942 [18:41:42.618] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.618] - attr(*, "already-done")= logi TRUE [18:41:42.632] - copied '...future.FUN' to environment [18:41:42.633] - copied 'future.call.arguments' to environment [18:41:42.633] - copied '...future.elements_ii' to environment [18:41:42.633] - copied '...future.seeds_ii' to environment [18:41:42.633] - copied '...future.globals.maxSize' to environment [18:41:42.634] assign_globals() ... done [18:41:42.634] plan(): Setting new future strategy stack: [18:41:42.634] List of future strategies: [18:41:42.634] 1. sequential: [18:41:42.634] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.634] - tweaked: FALSE [18:41:42.634] - call: NULL [18:41:42.635] plan(): nbrOfWorkers() = 1 [18:41:42.637] plan(): Setting new future strategy stack: [18:41:42.637] List of future strategies: [18:41:42.637] 1. sequential: [18:41:42.637] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.637] - tweaked: FALSE [18:41:42.637] - call: plan(strategy) [18:41:42.638] plan(): nbrOfWorkers() = 1 [18:41:42.639] SequentialFuture started (and completed) [18:41:42.639] - Launch lazy future ... done [18:41:42.639] run() for 'SequentialFuture' ... done [18:41:42.640] Created future: [18:41:42.640] SequentialFuture: [18:41:42.640] Label: 'future_sapply-1' [18:41:42.640] Expression: [18:41:42.640] { [18:41:42.640] do.call(function(...) { [18:41:42.640] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.640] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.640] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.640] on.exit(options(oopts), add = TRUE) [18:41:42.640] } [18:41:42.640] { [18:41:42.640] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.640] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.640] ...future.FUN(...future.X_jj, ...) [18:41:42.640] }) [18:41:42.640] } [18:41:42.640] }, args = future.call.arguments) [18:41:42.640] } [18:41:42.640] Lazy evaluation: FALSE [18:41:42.640] Asynchronous evaluation: FALSE [18:41:42.640] Local evaluation: TRUE [18:41:42.640] Environment: R_GlobalEnv [18:41:42.640] Capture standard output: TRUE [18:41:42.640] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.640] Globals: 5 objects totaling 532 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.640] Packages: [18:41:42.640] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.640] Resolved: TRUE [18:41:42.640] Value: 103 bytes of class 'list' [18:41:42.640] Early signaling: FALSE [18:41:42.640] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.640] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.641] Chunk #1 of 1 ... DONE [18:41:42.642] Launching 1 futures (chunks) ... DONE [18:41:42.642] Resolving 1 futures (chunks) ... [18:41:42.642] resolve() on list ... [18:41:42.642] recursive: 0 [18:41:42.643] length: 1 [18:41:42.643] [18:41:42.643] resolved() for 'SequentialFuture' ... [18:41:42.643] - state: 'finished' [18:41:42.644] - run: TRUE [18:41:42.644] - result: 'FutureResult' [18:41:42.644] resolved() for 'SequentialFuture' ... done [18:41:42.644] Future #1 [18:41:42.645] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.645] - nx: 1 [18:41:42.645] - relay: TRUE [18:41:42.646] - stdout: TRUE [18:41:42.646] - signal: TRUE [18:41:42.646] - resignal: FALSE [18:41:42.646] - force: TRUE [18:41:42.646] - relayed: [n=1] FALSE [18:41:42.647] - queued futures: [n=1] FALSE [18:41:42.647] - until=1 [18:41:42.647] - relaying element #1 [18:41:42.648] - relayed: [n=1] TRUE [18:41:42.648] - queued futures: [n=1] TRUE [18:41:42.648] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.648] length: 0 (resolved future 1) [18:41:42.649] Relaying remaining futures [18:41:42.649] signalConditionsASAP(NULL, pos=0) ... [18:41:42.649] - nx: 1 [18:41:42.649] - relay: TRUE [18:41:42.649] - stdout: TRUE [18:41:42.650] - signal: TRUE [18:41:42.650] - resignal: FALSE [18:41:42.650] - force: TRUE [18:41:42.650] - relayed: [n=1] TRUE [18:41:42.650] - queued futures: [n=1] TRUE - flush all [18:41:42.651] - relayed: [n=1] TRUE [18:41:42.651] - queued futures: [n=1] TRUE [18:41:42.651] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.651] resolve() on list ... DONE [18:41:42.652] - Number of value chunks collected: 1 [18:41:42.652] Resolving 1 futures (chunks) ... DONE [18:41:42.652] Reducing values from 1 chunks ... [18:41:42.652] - Number of values collected after concatenation: 6 [18:41:42.653] - Number of values expected: 6 [18:41:42.653] Reducing values from 1 chunks ... DONE [18:41:42.653] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.656] future_lapply() ... [18:41:42.657] Number of chunks: 1 [18:41:42.657] getGlobalsAndPackagesXApply() ... [18:41:42.657] - future.globals: TRUE [18:41:42.658] getGlobalsAndPackages() ... [18:41:42.658] Searching for globals... [18:41:42.660] - globals found: [2] 'FUN', 'UseMethod' [18:41:42.660] Searching for globals ... DONE [18:41:42.660] Resolving globals: FALSE [18:41:42.661] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:42.662] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:42.662] - globals: [1] 'FUN' [18:41:42.662] [18:41:42.663] getGlobalsAndPackages() ... DONE [18:41:42.663] - globals found/used: [n=1] 'FUN' [18:41:42.663] - needed namespaces: [n=0] [18:41:42.663] Finding globals ... DONE [18:41:42.664] - use_args: TRUE [18:41:42.664] - Getting '...' globals ... [18:41:42.664] resolve() on list ... [18:41:42.665] recursive: 0 [18:41:42.665] length: 1 [18:41:42.665] elements: '...' [18:41:42.665] length: 0 (resolved future 1) [18:41:42.666] resolve() on list ... DONE [18:41:42.666] - '...' content: [n=0] [18:41:42.666] List of 1 [18:41:42.666] $ ...: list() [18:41:42.666] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.666] - attr(*, "where")=List of 1 [18:41:42.666] ..$ ...: [18:41:42.666] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.666] - attr(*, "resolved")= logi TRUE [18:41:42.666] - attr(*, "total_size")= num NA [18:41:42.670] - Getting '...' globals ... DONE [18:41:42.671] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.671] List of 2 [18:41:42.671] $ ...future.FUN:function (x, ...) [18:41:42.671] $ ... : list() [18:41:42.671] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.671] - attr(*, "where")=List of 2 [18:41:42.671] ..$ ...future.FUN: [18:41:42.671] ..$ ... : [18:41:42.671] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.671] - attr(*, "resolved")= logi FALSE [18:41:42.671] - attr(*, "total_size")= int 5182 [18:41:42.676] Packages to be attached in all futures: [n=0] [18:41:42.676] getGlobalsAndPackagesXApply() ... DONE [18:41:42.676] Number of futures (= number of chunks): 1 [18:41:42.677] Launching 1 futures (chunks) ... [18:41:42.677] Chunk #1 of 1 ... [18:41:42.677] - Finding globals in 'X' for chunk #1 ... [18:41:42.677] getGlobalsAndPackages() ... [18:41:42.678] Searching for globals... [18:41:42.678] [18:41:42.678] Searching for globals ... DONE [18:41:42.678] - globals: [0] [18:41:42.679] getGlobalsAndPackages() ... DONE [18:41:42.679] + additional globals found: [n=0] [18:41:42.679] + additional namespaces needed: [n=0] [18:41:42.680] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.680] - seeds: [18:41:42.680] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.680] getGlobalsAndPackages() ... [18:41:42.680] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.681] Resolving globals: FALSE [18:41:42.681] Tweak future expression to call with '...' arguments ... [18:41:42.681] { [18:41:42.681] do.call(function(...) { [18:41:42.681] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.681] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.681] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.681] on.exit(options(oopts), add = TRUE) [18:41:42.681] } [18:41:42.681] { [18:41:42.681] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.681] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.681] ...future.FUN(...future.X_jj, ...) [18:41:42.681] }) [18:41:42.681] } [18:41:42.681] }, args = future.call.arguments) [18:41:42.681] } [18:41:42.682] Tweak future expression to call with '...' arguments ... DONE [18:41:42.683] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.683] [18:41:42.683] getGlobalsAndPackages() ... DONE [18:41:42.684] run() for 'Future' ... [18:41:42.684] - state: 'created' [18:41:42.684] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.685] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.685] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.685] - Field: 'label' [18:41:42.686] - Field: 'local' [18:41:42.686] - Field: 'owner' [18:41:42.686] - Field: 'envir' [18:41:42.686] - Field: 'packages' [18:41:42.687] - Field: 'gc' [18:41:42.687] - Field: 'conditions' [18:41:42.687] - Field: 'expr' [18:41:42.688] - Field: 'uuid' [18:41:42.688] - Field: 'seed' [18:41:42.688] - Field: 'version' [18:41:42.688] - Field: 'result' [18:41:42.689] - Field: 'asynchronous' [18:41:42.689] - Field: 'calls' [18:41:42.689] - Field: 'globals' [18:41:42.689] - Field: 'stdout' [18:41:42.690] - Field: 'earlySignal' [18:41:42.690] - Field: 'lazy' [18:41:42.690] - Field: 'state' [18:41:42.690] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.691] - Launch lazy future ... [18:41:42.691] Packages needed by the future expression (n = 0): [18:41:42.691] Packages needed by future strategies (n = 0): [18:41:42.692] { [18:41:42.692] { [18:41:42.692] { [18:41:42.692] ...future.startTime <- base::Sys.time() [18:41:42.692] { [18:41:42.692] { [18:41:42.692] { [18:41:42.692] base::local({ [18:41:42.692] has_future <- base::requireNamespace("future", [18:41:42.692] quietly = TRUE) [18:41:42.692] if (has_future) { [18:41:42.692] ns <- base::getNamespace("future") [18:41:42.692] version <- ns[[".package"]][["version"]] [18:41:42.692] if (is.null(version)) [18:41:42.692] version <- utils::packageVersion("future") [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] version <- NULL [18:41:42.692] } [18:41:42.692] if (!has_future || version < "1.8.0") { [18:41:42.692] info <- base::c(r_version = base::gsub("R version ", [18:41:42.692] "", base::R.version$version.string), [18:41:42.692] platform = base::sprintf("%s (%s-bit)", [18:41:42.692] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.692] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.692] "release", "version")], collapse = " "), [18:41:42.692] hostname = base::Sys.info()[["nodename"]]) [18:41:42.692] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.692] info) [18:41:42.692] info <- base::paste(info, collapse = "; ") [18:41:42.692] if (!has_future) { [18:41:42.692] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.692] info) [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.692] info, version) [18:41:42.692] } [18:41:42.692] base::stop(msg) [18:41:42.692] } [18:41:42.692] }) [18:41:42.692] } [18:41:42.692] ...future.strategy.old <- future::plan("list") [18:41:42.692] options(future.plan = NULL) [18:41:42.692] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.692] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.692] } [18:41:42.692] ...future.workdir <- getwd() [18:41:42.692] } [18:41:42.692] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.692] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.692] } [18:41:42.692] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.692] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.692] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.692] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.692] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.692] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.692] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.692] base::names(...future.oldOptions)) [18:41:42.692] } [18:41:42.692] if (FALSE) { [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] if (TRUE) { [18:41:42.692] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.692] open = "w") [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.692] windows = "NUL", "/dev/null"), open = "w") [18:41:42.692] } [18:41:42.692] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.692] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.692] base::sink(type = "output", split = FALSE) [18:41:42.692] base::close(...future.stdout) [18:41:42.692] }, add = TRUE) [18:41:42.692] } [18:41:42.692] ...future.frame <- base::sys.nframe() [18:41:42.692] ...future.conditions <- base::list() [18:41:42.692] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.692] if (FALSE) { [18:41:42.692] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.692] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.692] } [18:41:42.692] ...future.result <- base::tryCatch({ [18:41:42.692] base::withCallingHandlers({ [18:41:42.692] ...future.value <- base::withVisible(base::local({ [18:41:42.692] do.call(function(...) { [18:41:42.692] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.692] if (!identical(...future.globals.maxSize.org, [18:41:42.692] ...future.globals.maxSize)) { [18:41:42.692] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.692] on.exit(options(oopts), add = TRUE) [18:41:42.692] } [18:41:42.692] { [18:41:42.692] lapply(seq_along(...future.elements_ii), [18:41:42.692] FUN = function(jj) { [18:41:42.692] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.692] ...future.FUN(...future.X_jj, ...) [18:41:42.692] }) [18:41:42.692] } [18:41:42.692] }, args = future.call.arguments) [18:41:42.692] })) [18:41:42.692] future::FutureResult(value = ...future.value$value, [18:41:42.692] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.692] ...future.rng), globalenv = if (FALSE) [18:41:42.692] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.692] ...future.globalenv.names)) [18:41:42.692] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.692] }, condition = base::local({ [18:41:42.692] c <- base::c [18:41:42.692] inherits <- base::inherits [18:41:42.692] invokeRestart <- base::invokeRestart [18:41:42.692] length <- base::length [18:41:42.692] list <- base::list [18:41:42.692] seq.int <- base::seq.int [18:41:42.692] signalCondition <- base::signalCondition [18:41:42.692] sys.calls <- base::sys.calls [18:41:42.692] `[[` <- base::`[[` [18:41:42.692] `+` <- base::`+` [18:41:42.692] `<<-` <- base::`<<-` [18:41:42.692] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.692] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.692] 3L)] [18:41:42.692] } [18:41:42.692] function(cond) { [18:41:42.692] is_error <- inherits(cond, "error") [18:41:42.692] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.692] NULL) [18:41:42.692] if (is_error) { [18:41:42.692] sessionInformation <- function() { [18:41:42.692] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.692] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.692] search = base::search(), system = base::Sys.info()) [18:41:42.692] } [18:41:42.692] ...future.conditions[[length(...future.conditions) + [18:41:42.692] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.692] cond$call), session = sessionInformation(), [18:41:42.692] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.692] signalCondition(cond) [18:41:42.692] } [18:41:42.692] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.692] "immediateCondition"))) { [18:41:42.692] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.692] ...future.conditions[[length(...future.conditions) + [18:41:42.692] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.692] if (TRUE && !signal) { [18:41:42.692] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.692] { [18:41:42.692] inherits <- base::inherits [18:41:42.692] invokeRestart <- base::invokeRestart [18:41:42.692] is.null <- base::is.null [18:41:42.692] muffled <- FALSE [18:41:42.692] if (inherits(cond, "message")) { [18:41:42.692] muffled <- grepl(pattern, "muffleMessage") [18:41:42.692] if (muffled) [18:41:42.692] invokeRestart("muffleMessage") [18:41:42.692] } [18:41:42.692] else if (inherits(cond, "warning")) { [18:41:42.692] muffled <- grepl(pattern, "muffleWarning") [18:41:42.692] if (muffled) [18:41:42.692] invokeRestart("muffleWarning") [18:41:42.692] } [18:41:42.692] else if (inherits(cond, "condition")) { [18:41:42.692] if (!is.null(pattern)) { [18:41:42.692] computeRestarts <- base::computeRestarts [18:41:42.692] grepl <- base::grepl [18:41:42.692] restarts <- computeRestarts(cond) [18:41:42.692] for (restart in restarts) { [18:41:42.692] name <- restart$name [18:41:42.692] if (is.null(name)) [18:41:42.692] next [18:41:42.692] if (!grepl(pattern, name)) [18:41:42.692] next [18:41:42.692] invokeRestart(restart) [18:41:42.692] muffled <- TRUE [18:41:42.692] break [18:41:42.692] } [18:41:42.692] } [18:41:42.692] } [18:41:42.692] invisible(muffled) [18:41:42.692] } [18:41:42.692] muffleCondition(cond, pattern = "^muffle") [18:41:42.692] } [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] if (TRUE) { [18:41:42.692] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.692] { [18:41:42.692] inherits <- base::inherits [18:41:42.692] invokeRestart <- base::invokeRestart [18:41:42.692] is.null <- base::is.null [18:41:42.692] muffled <- FALSE [18:41:42.692] if (inherits(cond, "message")) { [18:41:42.692] muffled <- grepl(pattern, "muffleMessage") [18:41:42.692] if (muffled) [18:41:42.692] invokeRestart("muffleMessage") [18:41:42.692] } [18:41:42.692] else if (inherits(cond, "warning")) { [18:41:42.692] muffled <- grepl(pattern, "muffleWarning") [18:41:42.692] if (muffled) [18:41:42.692] invokeRestart("muffleWarning") [18:41:42.692] } [18:41:42.692] else if (inherits(cond, "condition")) { [18:41:42.692] if (!is.null(pattern)) { [18:41:42.692] computeRestarts <- base::computeRestarts [18:41:42.692] grepl <- base::grepl [18:41:42.692] restarts <- computeRestarts(cond) [18:41:42.692] for (restart in restarts) { [18:41:42.692] name <- restart$name [18:41:42.692] if (is.null(name)) [18:41:42.692] next [18:41:42.692] if (!grepl(pattern, name)) [18:41:42.692] next [18:41:42.692] invokeRestart(restart) [18:41:42.692] muffled <- TRUE [18:41:42.692] break [18:41:42.692] } [18:41:42.692] } [18:41:42.692] } [18:41:42.692] invisible(muffled) [18:41:42.692] } [18:41:42.692] muffleCondition(cond, pattern = "^muffle") [18:41:42.692] } [18:41:42.692] } [18:41:42.692] } [18:41:42.692] })) [18:41:42.692] }, error = function(ex) { [18:41:42.692] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.692] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.692] ...future.rng), started = ...future.startTime, [18:41:42.692] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.692] version = "1.8"), class = "FutureResult") [18:41:42.692] }, finally = { [18:41:42.692] if (!identical(...future.workdir, getwd())) [18:41:42.692] setwd(...future.workdir) [18:41:42.692] { [18:41:42.692] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.692] ...future.oldOptions$nwarnings <- NULL [18:41:42.692] } [18:41:42.692] base::options(...future.oldOptions) [18:41:42.692] if (.Platform$OS.type == "windows") { [18:41:42.692] old_names <- names(...future.oldEnvVars) [18:41:42.692] envs <- base::Sys.getenv() [18:41:42.692] names <- names(envs) [18:41:42.692] common <- intersect(names, old_names) [18:41:42.692] added <- setdiff(names, old_names) [18:41:42.692] removed <- setdiff(old_names, names) [18:41:42.692] changed <- common[...future.oldEnvVars[common] != [18:41:42.692] envs[common]] [18:41:42.692] NAMES <- toupper(changed) [18:41:42.692] args <- list() [18:41:42.692] for (kk in seq_along(NAMES)) { [18:41:42.692] name <- changed[[kk]] [18:41:42.692] NAME <- NAMES[[kk]] [18:41:42.692] if (name != NAME && is.element(NAME, old_names)) [18:41:42.692] next [18:41:42.692] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.692] } [18:41:42.692] NAMES <- toupper(added) [18:41:42.692] for (kk in seq_along(NAMES)) { [18:41:42.692] name <- added[[kk]] [18:41:42.692] NAME <- NAMES[[kk]] [18:41:42.692] if (name != NAME && is.element(NAME, old_names)) [18:41:42.692] next [18:41:42.692] args[[name]] <- "" [18:41:42.692] } [18:41:42.692] NAMES <- toupper(removed) [18:41:42.692] for (kk in seq_along(NAMES)) { [18:41:42.692] name <- removed[[kk]] [18:41:42.692] NAME <- NAMES[[kk]] [18:41:42.692] if (name != NAME && is.element(NAME, old_names)) [18:41:42.692] next [18:41:42.692] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.692] } [18:41:42.692] if (length(args) > 0) [18:41:42.692] base::do.call(base::Sys.setenv, args = args) [18:41:42.692] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.692] } [18:41:42.692] { [18:41:42.692] if (base::length(...future.futureOptionsAdded) > [18:41:42.692] 0L) { [18:41:42.692] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.692] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.692] base::options(opts) [18:41:42.692] } [18:41:42.692] { [18:41:42.692] { [18:41:42.692] NULL [18:41:42.692] RNGkind("Mersenne-Twister") [18:41:42.692] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.692] inherits = FALSE) [18:41:42.692] } [18:41:42.692] options(future.plan = NULL) [18:41:42.692] if (is.na(NA_character_)) [18:41:42.692] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.692] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.692] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.692] .init = FALSE) [18:41:42.692] } [18:41:42.692] } [18:41:42.692] } [18:41:42.692] }) [18:41:42.692] if (TRUE) { [18:41:42.692] base::sink(type = "output", split = FALSE) [18:41:42.692] if (TRUE) { [18:41:42.692] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.692] } [18:41:42.692] else { [18:41:42.692] ...future.result["stdout"] <- base::list(NULL) [18:41:42.692] } [18:41:42.692] base::close(...future.stdout) [18:41:42.692] ...future.stdout <- NULL [18:41:42.692] } [18:41:42.692] ...future.result$conditions <- ...future.conditions [18:41:42.692] ...future.result$finished <- base::Sys.time() [18:41:42.692] ...future.result [18:41:42.692] } [18:41:42.698] assign_globals() ... [18:41:42.699] List of 5 [18:41:42.699] $ ...future.FUN :function (x, ...) [18:41:42.699] $ future.call.arguments : list() [18:41:42.699] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.699] $ ...future.elements_ii :List of 6 [18:41:42.699] ..$ a1: int 1 [18:41:42.699] ..$ a2: int 2 [18:41:42.699] ..$ b1: int 2 [18:41:42.699] ..$ b2: int 3 [18:41:42.699] ..$ c1: int 3 [18:41:42.699] ..$ c2: int 4 [18:41:42.699] $ ...future.seeds_ii : NULL [18:41:42.699] $ ...future.globals.maxSize: NULL [18:41:42.699] - attr(*, "where")=List of 5 [18:41:42.699] ..$ ...future.FUN : [18:41:42.699] ..$ future.call.arguments : [18:41:42.699] ..$ ...future.elements_ii : [18:41:42.699] ..$ ...future.seeds_ii : [18:41:42.699] ..$ ...future.globals.maxSize: [18:41:42.699] - attr(*, "resolved")= logi FALSE [18:41:42.699] - attr(*, "total_size")= num 5182 [18:41:42.699] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.699] - attr(*, "already-done")= logi TRUE [18:41:42.711] - copied '...future.FUN' to environment [18:41:42.711] - copied 'future.call.arguments' to environment [18:41:42.711] - copied '...future.elements_ii' to environment [18:41:42.712] - copied '...future.seeds_ii' to environment [18:41:42.712] - copied '...future.globals.maxSize' to environment [18:41:42.712] assign_globals() ... done [18:41:42.713] plan(): Setting new future strategy stack: [18:41:42.713] List of future strategies: [18:41:42.713] 1. sequential: [18:41:42.713] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.713] - tweaked: FALSE [18:41:42.713] - call: NULL [18:41:42.714] plan(): nbrOfWorkers() = 1 [18:41:42.716] plan(): Setting new future strategy stack: [18:41:42.716] List of future strategies: [18:41:42.716] 1. sequential: [18:41:42.716] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.716] - tweaked: FALSE [18:41:42.716] - call: plan(strategy) [18:41:42.717] plan(): nbrOfWorkers() = 1 [18:41:42.718] SequentialFuture started (and completed) [18:41:42.718] - Launch lazy future ... done [18:41:42.718] run() for 'SequentialFuture' ... done [18:41:42.719] Created future: [18:41:42.719] SequentialFuture: [18:41:42.719] Label: 'future_sapply-1' [18:41:42.719] Expression: [18:41:42.719] { [18:41:42.719] do.call(function(...) { [18:41:42.719] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.719] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.719] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.719] on.exit(options(oopts), add = TRUE) [18:41:42.719] } [18:41:42.719] { [18:41:42.719] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.719] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.719] ...future.FUN(...future.X_jj, ...) [18:41:42.719] }) [18:41:42.719] } [18:41:42.719] }, args = future.call.arguments) [18:41:42.719] } [18:41:42.719] Lazy evaluation: FALSE [18:41:42.719] Asynchronous evaluation: FALSE [18:41:42.719] Local evaluation: TRUE [18:41:42.719] Environment: R_GlobalEnv [18:41:42.719] Capture standard output: TRUE [18:41:42.719] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.719] Globals: 5 objects totaling 625 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.719] Packages: [18:41:42.719] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.719] Resolved: TRUE [18:41:42.719] Value: 282 bytes of class 'list' [18:41:42.719] Early signaling: FALSE [18:41:42.719] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.719] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.721] Chunk #1 of 1 ... DONE [18:41:42.721] Launching 1 futures (chunks) ... DONE [18:41:42.721] Resolving 1 futures (chunks) ... [18:41:42.721] resolve() on list ... [18:41:42.722] recursive: 0 [18:41:42.722] length: 1 [18:41:42.722] [18:41:42.722] resolved() for 'SequentialFuture' ... [18:41:42.723] - state: 'finished' [18:41:42.723] - run: TRUE [18:41:42.723] - result: 'FutureResult' [18:41:42.724] resolved() for 'SequentialFuture' ... done [18:41:42.724] Future #1 [18:41:42.724] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.725] - nx: 1 [18:41:42.725] - relay: TRUE [18:41:42.725] - stdout: TRUE [18:41:42.725] - signal: TRUE [18:41:42.726] - resignal: FALSE [18:41:42.726] - force: TRUE [18:41:42.726] - relayed: [n=1] FALSE [18:41:42.726] - queued futures: [n=1] FALSE [18:41:42.727] - until=1 [18:41:42.727] - relaying element #1 [18:41:42.727] - relayed: [n=1] TRUE [18:41:42.728] - queued futures: [n=1] TRUE [18:41:42.728] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.728] length: 0 (resolved future 1) [18:41:42.728] Relaying remaining futures [18:41:42.729] signalConditionsASAP(NULL, pos=0) ... [18:41:42.729] - nx: 1 [18:41:42.729] - relay: TRUE [18:41:42.729] - stdout: TRUE [18:41:42.730] - signal: TRUE [18:41:42.730] - resignal: FALSE [18:41:42.730] - force: TRUE [18:41:42.730] - relayed: [n=1] TRUE [18:41:42.731] - queued futures: [n=1] TRUE - flush all [18:41:42.731] - relayed: [n=1] TRUE [18:41:42.731] - queued futures: [n=1] TRUE [18:41:42.732] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.732] resolve() on list ... DONE [18:41:42.732] - Number of value chunks collected: 1 [18:41:42.732] Resolving 1 futures (chunks) ... DONE [18:41:42.733] Reducing values from 1 chunks ... [18:41:42.733] - Number of values collected after concatenation: 6 [18:41:42.733] - Number of values expected: 6 [18:41:42.733] Reducing values from 1 chunks ... DONE [18:41:42.734] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.737] future_lapply() ... [18:41:42.739] Number of chunks: 1 [18:41:42.739] getGlobalsAndPackagesXApply() ... [18:41:42.739] - future.globals: TRUE [18:41:42.739] getGlobalsAndPackages() ... [18:41:42.740] Searching for globals... [18:41:42.742] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:42.743] Searching for globals ... DONE [18:41:42.743] Resolving globals: FALSE [18:41:42.744] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:42.744] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:42.745] - globals: [1] 'FUN' [18:41:42.745] [18:41:42.745] getGlobalsAndPackages() ... DONE [18:41:42.746] - globals found/used: [n=1] 'FUN' [18:41:42.746] - needed namespaces: [n=0] [18:41:42.746] Finding globals ... DONE [18:41:42.746] - use_args: TRUE [18:41:42.747] - Getting '...' globals ... [18:41:42.747] resolve() on list ... [18:41:42.747] recursive: 0 [18:41:42.748] length: 1 [18:41:42.748] elements: '...' [18:41:42.748] length: 0 (resolved future 1) [18:41:42.749] resolve() on list ... DONE [18:41:42.749] - '...' content: [n=0] [18:41:42.749] List of 1 [18:41:42.749] $ ...: list() [18:41:42.749] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.749] - attr(*, "where")=List of 1 [18:41:42.749] ..$ ...: [18:41:42.749] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.749] - attr(*, "resolved")= logi TRUE [18:41:42.749] - attr(*, "total_size")= num NA [18:41:42.753] - Getting '...' globals ... DONE [18:41:42.754] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.754] List of 2 [18:41:42.754] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:42.754] $ ... : list() [18:41:42.754] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.754] - attr(*, "where")=List of 2 [18:41:42.754] ..$ ...future.FUN: [18:41:42.754] ..$ ... : [18:41:42.754] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.754] - attr(*, "resolved")= logi FALSE [18:41:42.754] - attr(*, "total_size")= int 6664 [18:41:42.759] Packages to be attached in all futures: [n=0] [18:41:42.760] getGlobalsAndPackagesXApply() ... DONE [18:41:42.760] Number of futures (= number of chunks): 1 [18:41:42.760] Launching 1 futures (chunks) ... [18:41:42.760] Chunk #1 of 1 ... [18:41:42.761] - Finding globals in 'X' for chunk #1 ... [18:41:42.761] getGlobalsAndPackages() ... [18:41:42.761] Searching for globals... [18:41:42.762] [18:41:42.762] Searching for globals ... DONE [18:41:42.762] - globals: [0] [18:41:42.763] getGlobalsAndPackages() ... DONE [18:41:42.763] + additional globals found: [n=0] [18:41:42.763] + additional namespaces needed: [n=0] [18:41:42.763] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.764] - seeds: [18:41:42.764] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.764] getGlobalsAndPackages() ... [18:41:42.765] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.765] Resolving globals: FALSE [18:41:42.765] Tweak future expression to call with '...' arguments ... [18:41:42.765] { [18:41:42.765] do.call(function(...) { [18:41:42.765] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.765] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.765] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.765] on.exit(options(oopts), add = TRUE) [18:41:42.765] } [18:41:42.765] { [18:41:42.765] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.765] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.765] ...future.FUN(...future.X_jj, ...) [18:41:42.765] }) [18:41:42.765] } [18:41:42.765] }, args = future.call.arguments) [18:41:42.765] } [18:41:42.766] Tweak future expression to call with '...' arguments ... DONE [18:41:42.767] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.767] [18:41:42.767] getGlobalsAndPackages() ... DONE [18:41:42.768] run() for 'Future' ... [18:41:42.768] - state: 'created' [18:41:42.769] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.769] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.770] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.770] - Field: 'label' [18:41:42.770] - Field: 'local' [18:41:42.770] - Field: 'owner' [18:41:42.771] - Field: 'envir' [18:41:42.771] - Field: 'packages' [18:41:42.771] - Field: 'gc' [18:41:42.771] - Field: 'conditions' [18:41:42.772] - Field: 'expr' [18:41:42.772] - Field: 'uuid' [18:41:42.772] - Field: 'seed' [18:41:42.773] - Field: 'version' [18:41:42.773] - Field: 'result' [18:41:42.773] - Field: 'asynchronous' [18:41:42.773] - Field: 'calls' [18:41:42.774] - Field: 'globals' [18:41:42.774] - Field: 'stdout' [18:41:42.774] - Field: 'earlySignal' [18:41:42.775] - Field: 'lazy' [18:41:42.775] - Field: 'state' [18:41:42.775] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.775] - Launch lazy future ... [18:41:42.776] Packages needed by the future expression (n = 0): [18:41:42.776] Packages needed by future strategies (n = 0): [18:41:42.777] { [18:41:42.777] { [18:41:42.777] { [18:41:42.777] ...future.startTime <- base::Sys.time() [18:41:42.777] { [18:41:42.777] { [18:41:42.777] { [18:41:42.777] base::local({ [18:41:42.777] has_future <- base::requireNamespace("future", [18:41:42.777] quietly = TRUE) [18:41:42.777] if (has_future) { [18:41:42.777] ns <- base::getNamespace("future") [18:41:42.777] version <- ns[[".package"]][["version"]] [18:41:42.777] if (is.null(version)) [18:41:42.777] version <- utils::packageVersion("future") [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] version <- NULL [18:41:42.777] } [18:41:42.777] if (!has_future || version < "1.8.0") { [18:41:42.777] info <- base::c(r_version = base::gsub("R version ", [18:41:42.777] "", base::R.version$version.string), [18:41:42.777] platform = base::sprintf("%s (%s-bit)", [18:41:42.777] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.777] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.777] "release", "version")], collapse = " "), [18:41:42.777] hostname = base::Sys.info()[["nodename"]]) [18:41:42.777] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.777] info) [18:41:42.777] info <- base::paste(info, collapse = "; ") [18:41:42.777] if (!has_future) { [18:41:42.777] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.777] info) [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.777] info, version) [18:41:42.777] } [18:41:42.777] base::stop(msg) [18:41:42.777] } [18:41:42.777] }) [18:41:42.777] } [18:41:42.777] ...future.strategy.old <- future::plan("list") [18:41:42.777] options(future.plan = NULL) [18:41:42.777] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.777] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.777] } [18:41:42.777] ...future.workdir <- getwd() [18:41:42.777] } [18:41:42.777] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.777] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.777] } [18:41:42.777] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.777] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.777] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.777] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.777] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.777] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.777] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.777] base::names(...future.oldOptions)) [18:41:42.777] } [18:41:42.777] if (FALSE) { [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] if (TRUE) { [18:41:42.777] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.777] open = "w") [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.777] windows = "NUL", "/dev/null"), open = "w") [18:41:42.777] } [18:41:42.777] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.777] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.777] base::sink(type = "output", split = FALSE) [18:41:42.777] base::close(...future.stdout) [18:41:42.777] }, add = TRUE) [18:41:42.777] } [18:41:42.777] ...future.frame <- base::sys.nframe() [18:41:42.777] ...future.conditions <- base::list() [18:41:42.777] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.777] if (FALSE) { [18:41:42.777] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.777] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.777] } [18:41:42.777] ...future.result <- base::tryCatch({ [18:41:42.777] base::withCallingHandlers({ [18:41:42.777] ...future.value <- base::withVisible(base::local({ [18:41:42.777] do.call(function(...) { [18:41:42.777] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.777] if (!identical(...future.globals.maxSize.org, [18:41:42.777] ...future.globals.maxSize)) { [18:41:42.777] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.777] on.exit(options(oopts), add = TRUE) [18:41:42.777] } [18:41:42.777] { [18:41:42.777] lapply(seq_along(...future.elements_ii), [18:41:42.777] FUN = function(jj) { [18:41:42.777] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.777] ...future.FUN(...future.X_jj, ...) [18:41:42.777] }) [18:41:42.777] } [18:41:42.777] }, args = future.call.arguments) [18:41:42.777] })) [18:41:42.777] future::FutureResult(value = ...future.value$value, [18:41:42.777] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.777] ...future.rng), globalenv = if (FALSE) [18:41:42.777] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.777] ...future.globalenv.names)) [18:41:42.777] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.777] }, condition = base::local({ [18:41:42.777] c <- base::c [18:41:42.777] inherits <- base::inherits [18:41:42.777] invokeRestart <- base::invokeRestart [18:41:42.777] length <- base::length [18:41:42.777] list <- base::list [18:41:42.777] seq.int <- base::seq.int [18:41:42.777] signalCondition <- base::signalCondition [18:41:42.777] sys.calls <- base::sys.calls [18:41:42.777] `[[` <- base::`[[` [18:41:42.777] `+` <- base::`+` [18:41:42.777] `<<-` <- base::`<<-` [18:41:42.777] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.777] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.777] 3L)] [18:41:42.777] } [18:41:42.777] function(cond) { [18:41:42.777] is_error <- inherits(cond, "error") [18:41:42.777] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.777] NULL) [18:41:42.777] if (is_error) { [18:41:42.777] sessionInformation <- function() { [18:41:42.777] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.777] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.777] search = base::search(), system = base::Sys.info()) [18:41:42.777] } [18:41:42.777] ...future.conditions[[length(...future.conditions) + [18:41:42.777] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.777] cond$call), session = sessionInformation(), [18:41:42.777] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.777] signalCondition(cond) [18:41:42.777] } [18:41:42.777] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.777] "immediateCondition"))) { [18:41:42.777] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.777] ...future.conditions[[length(...future.conditions) + [18:41:42.777] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.777] if (TRUE && !signal) { [18:41:42.777] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.777] { [18:41:42.777] inherits <- base::inherits [18:41:42.777] invokeRestart <- base::invokeRestart [18:41:42.777] is.null <- base::is.null [18:41:42.777] muffled <- FALSE [18:41:42.777] if (inherits(cond, "message")) { [18:41:42.777] muffled <- grepl(pattern, "muffleMessage") [18:41:42.777] if (muffled) [18:41:42.777] invokeRestart("muffleMessage") [18:41:42.777] } [18:41:42.777] else if (inherits(cond, "warning")) { [18:41:42.777] muffled <- grepl(pattern, "muffleWarning") [18:41:42.777] if (muffled) [18:41:42.777] invokeRestart("muffleWarning") [18:41:42.777] } [18:41:42.777] else if (inherits(cond, "condition")) { [18:41:42.777] if (!is.null(pattern)) { [18:41:42.777] computeRestarts <- base::computeRestarts [18:41:42.777] grepl <- base::grepl [18:41:42.777] restarts <- computeRestarts(cond) [18:41:42.777] for (restart in restarts) { [18:41:42.777] name <- restart$name [18:41:42.777] if (is.null(name)) [18:41:42.777] next [18:41:42.777] if (!grepl(pattern, name)) [18:41:42.777] next [18:41:42.777] invokeRestart(restart) [18:41:42.777] muffled <- TRUE [18:41:42.777] break [18:41:42.777] } [18:41:42.777] } [18:41:42.777] } [18:41:42.777] invisible(muffled) [18:41:42.777] } [18:41:42.777] muffleCondition(cond, pattern = "^muffle") [18:41:42.777] } [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] if (TRUE) { [18:41:42.777] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.777] { [18:41:42.777] inherits <- base::inherits [18:41:42.777] invokeRestart <- base::invokeRestart [18:41:42.777] is.null <- base::is.null [18:41:42.777] muffled <- FALSE [18:41:42.777] if (inherits(cond, "message")) { [18:41:42.777] muffled <- grepl(pattern, "muffleMessage") [18:41:42.777] if (muffled) [18:41:42.777] invokeRestart("muffleMessage") [18:41:42.777] } [18:41:42.777] else if (inherits(cond, "warning")) { [18:41:42.777] muffled <- grepl(pattern, "muffleWarning") [18:41:42.777] if (muffled) [18:41:42.777] invokeRestart("muffleWarning") [18:41:42.777] } [18:41:42.777] else if (inherits(cond, "condition")) { [18:41:42.777] if (!is.null(pattern)) { [18:41:42.777] computeRestarts <- base::computeRestarts [18:41:42.777] grepl <- base::grepl [18:41:42.777] restarts <- computeRestarts(cond) [18:41:42.777] for (restart in restarts) { [18:41:42.777] name <- restart$name [18:41:42.777] if (is.null(name)) [18:41:42.777] next [18:41:42.777] if (!grepl(pattern, name)) [18:41:42.777] next [18:41:42.777] invokeRestart(restart) [18:41:42.777] muffled <- TRUE [18:41:42.777] break [18:41:42.777] } [18:41:42.777] } [18:41:42.777] } [18:41:42.777] invisible(muffled) [18:41:42.777] } [18:41:42.777] muffleCondition(cond, pattern = "^muffle") [18:41:42.777] } [18:41:42.777] } [18:41:42.777] } [18:41:42.777] })) [18:41:42.777] }, error = function(ex) { [18:41:42.777] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.777] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.777] ...future.rng), started = ...future.startTime, [18:41:42.777] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.777] version = "1.8"), class = "FutureResult") [18:41:42.777] }, finally = { [18:41:42.777] if (!identical(...future.workdir, getwd())) [18:41:42.777] setwd(...future.workdir) [18:41:42.777] { [18:41:42.777] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.777] ...future.oldOptions$nwarnings <- NULL [18:41:42.777] } [18:41:42.777] base::options(...future.oldOptions) [18:41:42.777] if (.Platform$OS.type == "windows") { [18:41:42.777] old_names <- names(...future.oldEnvVars) [18:41:42.777] envs <- base::Sys.getenv() [18:41:42.777] names <- names(envs) [18:41:42.777] common <- intersect(names, old_names) [18:41:42.777] added <- setdiff(names, old_names) [18:41:42.777] removed <- setdiff(old_names, names) [18:41:42.777] changed <- common[...future.oldEnvVars[common] != [18:41:42.777] envs[common]] [18:41:42.777] NAMES <- toupper(changed) [18:41:42.777] args <- list() [18:41:42.777] for (kk in seq_along(NAMES)) { [18:41:42.777] name <- changed[[kk]] [18:41:42.777] NAME <- NAMES[[kk]] [18:41:42.777] if (name != NAME && is.element(NAME, old_names)) [18:41:42.777] next [18:41:42.777] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.777] } [18:41:42.777] NAMES <- toupper(added) [18:41:42.777] for (kk in seq_along(NAMES)) { [18:41:42.777] name <- added[[kk]] [18:41:42.777] NAME <- NAMES[[kk]] [18:41:42.777] if (name != NAME && is.element(NAME, old_names)) [18:41:42.777] next [18:41:42.777] args[[name]] <- "" [18:41:42.777] } [18:41:42.777] NAMES <- toupper(removed) [18:41:42.777] for (kk in seq_along(NAMES)) { [18:41:42.777] name <- removed[[kk]] [18:41:42.777] NAME <- NAMES[[kk]] [18:41:42.777] if (name != NAME && is.element(NAME, old_names)) [18:41:42.777] next [18:41:42.777] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.777] } [18:41:42.777] if (length(args) > 0) [18:41:42.777] base::do.call(base::Sys.setenv, args = args) [18:41:42.777] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.777] } [18:41:42.777] { [18:41:42.777] if (base::length(...future.futureOptionsAdded) > [18:41:42.777] 0L) { [18:41:42.777] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.777] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.777] base::options(opts) [18:41:42.777] } [18:41:42.777] { [18:41:42.777] { [18:41:42.777] NULL [18:41:42.777] RNGkind("Mersenne-Twister") [18:41:42.777] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.777] inherits = FALSE) [18:41:42.777] } [18:41:42.777] options(future.plan = NULL) [18:41:42.777] if (is.na(NA_character_)) [18:41:42.777] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.777] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.777] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.777] .init = FALSE) [18:41:42.777] } [18:41:42.777] } [18:41:42.777] } [18:41:42.777] }) [18:41:42.777] if (TRUE) { [18:41:42.777] base::sink(type = "output", split = FALSE) [18:41:42.777] if (TRUE) { [18:41:42.777] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.777] } [18:41:42.777] else { [18:41:42.777] ...future.result["stdout"] <- base::list(NULL) [18:41:42.777] } [18:41:42.777] base::close(...future.stdout) [18:41:42.777] ...future.stdout <- NULL [18:41:42.777] } [18:41:42.777] ...future.result$conditions <- ...future.conditions [18:41:42.777] ...future.result$finished <- base::Sys.time() [18:41:42.777] ...future.result [18:41:42.777] } [18:41:42.784] assign_globals() ... [18:41:42.784] List of 5 [18:41:42.784] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:42.784] $ future.call.arguments : list() [18:41:42.784] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.784] $ ...future.elements_ii :List of 6 [18:41:42.784] ..$ a1: int 1 [18:41:42.784] ..$ a2: int 2 [18:41:42.784] ..$ b1: int 2 [18:41:42.784] ..$ b2: int 3 [18:41:42.784] ..$ c1: int 3 [18:41:42.784] ..$ c2: int 4 [18:41:42.784] $ ...future.seeds_ii : NULL [18:41:42.784] $ ...future.globals.maxSize: NULL [18:41:42.784] - attr(*, "where")=List of 5 [18:41:42.784] ..$ ...future.FUN : [18:41:42.784] ..$ future.call.arguments : [18:41:42.784] ..$ ...future.elements_ii : [18:41:42.784] ..$ ...future.seeds_ii : [18:41:42.784] ..$ ...future.globals.maxSize: [18:41:42.784] - attr(*, "resolved")= logi FALSE [18:41:42.784] - attr(*, "total_size")= num 6664 [18:41:42.784] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.784] - attr(*, "already-done")= logi TRUE [18:41:42.796] - reassign environment for '...future.FUN' [18:41:42.796] - copied '...future.FUN' to environment [18:41:42.797] - copied 'future.call.arguments' to environment [18:41:42.797] - copied '...future.elements_ii' to environment [18:41:42.797] - copied '...future.seeds_ii' to environment [18:41:42.797] - copied '...future.globals.maxSize' to environment [18:41:42.798] assign_globals() ... done [18:41:42.798] plan(): Setting new future strategy stack: [18:41:42.799] List of future strategies: [18:41:42.799] 1. sequential: [18:41:42.799] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.799] - tweaked: FALSE [18:41:42.799] - call: NULL [18:41:42.799] plan(): nbrOfWorkers() = 1 [18:41:42.805] plan(): Setting new future strategy stack: [18:41:42.805] List of future strategies: [18:41:42.805] 1. sequential: [18:41:42.805] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.805] - tweaked: FALSE [18:41:42.805] - call: plan(strategy) [18:41:42.806] plan(): nbrOfWorkers() = 1 [18:41:42.806] SequentialFuture started (and completed) [18:41:42.806] - Launch lazy future ... done [18:41:42.807] run() for 'SequentialFuture' ... done [18:41:42.807] Created future: [18:41:42.807] SequentialFuture: [18:41:42.807] Label: 'future_sapply-1' [18:41:42.807] Expression: [18:41:42.807] { [18:41:42.807] do.call(function(...) { [18:41:42.807] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.807] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.807] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.807] on.exit(options(oopts), add = TRUE) [18:41:42.807] } [18:41:42.807] { [18:41:42.807] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.807] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.807] ...future.FUN(...future.X_jj, ...) [18:41:42.807] }) [18:41:42.807] } [18:41:42.807] }, args = future.call.arguments) [18:41:42.807] } [18:41:42.807] Lazy evaluation: FALSE [18:41:42.807] Asynchronous evaluation: FALSE [18:41:42.807] Local evaluation: TRUE [18:41:42.807] Environment: R_GlobalEnv [18:41:42.807] Capture standard output: TRUE [18:41:42.807] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.807] Globals: 5 objects totaling 1.10 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.807] Packages: [18:41:42.807] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.807] Resolved: TRUE [18:41:42.807] Value: 978 bytes of class 'list' [18:41:42.807] Early signaling: FALSE [18:41:42.807] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.807] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.809] Chunk #1 of 1 ... DONE [18:41:42.809] Launching 1 futures (chunks) ... DONE [18:41:42.810] Resolving 1 futures (chunks) ... [18:41:42.810] resolve() on list ... [18:41:42.810] recursive: 0 [18:41:42.810] length: 1 [18:41:42.811] [18:41:42.811] resolved() for 'SequentialFuture' ... [18:41:42.811] - state: 'finished' [18:41:42.811] - run: TRUE [18:41:42.812] - result: 'FutureResult' [18:41:42.812] resolved() for 'SequentialFuture' ... done [18:41:42.812] Future #1 [18:41:42.813] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.813] - nx: 1 [18:41:42.813] - relay: TRUE [18:41:42.813] - stdout: TRUE [18:41:42.814] - signal: TRUE [18:41:42.814] - resignal: FALSE [18:41:42.814] - force: TRUE [18:41:42.814] - relayed: [n=1] FALSE [18:41:42.815] - queued futures: [n=1] FALSE [18:41:42.815] - until=1 [18:41:42.815] - relaying element #1 [18:41:42.816] - relayed: [n=1] TRUE [18:41:42.816] - queued futures: [n=1] TRUE [18:41:42.816] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.816] length: 0 (resolved future 1) [18:41:42.817] Relaying remaining futures [18:41:42.817] signalConditionsASAP(NULL, pos=0) ... [18:41:42.817] - nx: 1 [18:41:42.817] - relay: TRUE [18:41:42.818] - stdout: TRUE [18:41:42.818] - signal: TRUE [18:41:42.818] - resignal: FALSE [18:41:42.818] - force: TRUE [18:41:42.819] - relayed: [n=1] TRUE [18:41:42.819] - queued futures: [n=1] TRUE - flush all [18:41:42.819] - relayed: [n=1] TRUE [18:41:42.820] - queued futures: [n=1] TRUE [18:41:42.820] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.820] resolve() on list ... DONE [18:41:42.820] - Number of value chunks collected: 1 [18:41:42.821] Resolving 1 futures (chunks) ... DONE [18:41:42.821] Reducing values from 1 chunks ... [18:41:42.821] - Number of values collected after concatenation: 6 [18:41:42.821] - Number of values expected: 6 [18:41:42.822] Reducing values from 1 chunks ... DONE [18:41:42.822] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.827] future_lapply() ... [18:41:42.828] Number of chunks: 1 [18:41:42.828] getGlobalsAndPackagesXApply() ... [18:41:42.828] - future.globals: TRUE [18:41:42.828] getGlobalsAndPackages() ... [18:41:42.829] Searching for globals... [18:41:42.830] - globals found: [1] 'FUN' [18:41:42.831] Searching for globals ... DONE [18:41:42.831] Resolving globals: FALSE [18:41:42.832] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:42.832] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:42.833] - globals: [1] 'FUN' [18:41:42.833] [18:41:42.833] getGlobalsAndPackages() ... DONE [18:41:42.833] - globals found/used: [n=1] 'FUN' [18:41:42.834] - needed namespaces: [n=0] [18:41:42.834] Finding globals ... DONE [18:41:42.834] - use_args: TRUE [18:41:42.834] - Getting '...' globals ... [18:41:42.835] resolve() on list ... [18:41:42.835] recursive: 0 [18:41:42.836] length: 1 [18:41:42.836] elements: '...' [18:41:42.836] length: 0 (resolved future 1) [18:41:42.836] resolve() on list ... DONE [18:41:42.837] - '...' content: [n=0] [18:41:42.837] List of 1 [18:41:42.837] $ ...: list() [18:41:42.837] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.837] - attr(*, "where")=List of 1 [18:41:42.837] ..$ ...: [18:41:42.837] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.837] - attr(*, "resolved")= logi TRUE [18:41:42.837] - attr(*, "total_size")= num NA [18:41:42.841] - Getting '...' globals ... DONE [18:41:42.842] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.842] List of 2 [18:41:42.842] $ ...future.FUN:function (x) [18:41:42.842] $ ... : list() [18:41:42.842] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.842] - attr(*, "where")=List of 2 [18:41:42.842] ..$ ...future.FUN: [18:41:42.842] ..$ ... : [18:41:42.842] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.842] - attr(*, "resolved")= logi FALSE [18:41:42.842] - attr(*, "total_size")= int 4942 [18:41:42.847] Packages to be attached in all futures: [n=0] [18:41:42.847] getGlobalsAndPackagesXApply() ... DONE [18:41:42.848] Number of futures (= number of chunks): 1 [18:41:42.848] Launching 1 futures (chunks) ... [18:41:42.848] Chunk #1 of 1 ... [18:41:42.849] - Finding globals in 'X' for chunk #1 ... [18:41:42.849] getGlobalsAndPackages() ... [18:41:42.849] Searching for globals... [18:41:42.850] [18:41:42.850] Searching for globals ... DONE [18:41:42.850] - globals: [0] [18:41:42.850] getGlobalsAndPackages() ... DONE [18:41:42.851] + additional globals found: [n=0] [18:41:42.851] + additional namespaces needed: [n=0] [18:41:42.851] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.851] - seeds: [18:41:42.852] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.852] getGlobalsAndPackages() ... [18:41:42.852] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.853] Resolving globals: FALSE [18:41:42.853] Tweak future expression to call with '...' arguments ... [18:41:42.853] { [18:41:42.853] do.call(function(...) { [18:41:42.853] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.853] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.853] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.853] on.exit(options(oopts), add = TRUE) [18:41:42.853] } [18:41:42.853] { [18:41:42.853] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.853] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.853] ...future.FUN(...future.X_jj, ...) [18:41:42.853] }) [18:41:42.853] } [18:41:42.853] }, args = future.call.arguments) [18:41:42.853] } [18:41:42.854] Tweak future expression to call with '...' arguments ... DONE [18:41:42.855] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.855] [18:41:42.855] getGlobalsAndPackages() ... DONE [18:41:42.856] run() for 'Future' ... [18:41:42.856] - state: 'created' [18:41:42.856] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.857] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.857] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.857] - Field: 'label' [18:41:42.858] - Field: 'local' [18:41:42.858] - Field: 'owner' [18:41:42.858] - Field: 'envir' [18:41:42.859] - Field: 'packages' [18:41:42.859] - Field: 'gc' [18:41:42.859] - Field: 'conditions' [18:41:42.859] - Field: 'expr' [18:41:42.860] - Field: 'uuid' [18:41:42.860] - Field: 'seed' [18:41:42.860] - Field: 'version' [18:41:42.861] - Field: 'result' [18:41:42.861] - Field: 'asynchronous' [18:41:42.861] - Field: 'calls' [18:41:42.861] - Field: 'globals' [18:41:42.862] - Field: 'stdout' [18:41:42.862] - Field: 'earlySignal' [18:41:42.862] - Field: 'lazy' [18:41:42.863] - Field: 'state' [18:41:42.863] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.863] - Launch lazy future ... [18:41:42.864] Packages needed by the future expression (n = 0): [18:41:42.864] Packages needed by future strategies (n = 0): [18:41:42.865] { [18:41:42.865] { [18:41:42.865] { [18:41:42.865] ...future.startTime <- base::Sys.time() [18:41:42.865] { [18:41:42.865] { [18:41:42.865] { [18:41:42.865] base::local({ [18:41:42.865] has_future <- base::requireNamespace("future", [18:41:42.865] quietly = TRUE) [18:41:42.865] if (has_future) { [18:41:42.865] ns <- base::getNamespace("future") [18:41:42.865] version <- ns[[".package"]][["version"]] [18:41:42.865] if (is.null(version)) [18:41:42.865] version <- utils::packageVersion("future") [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] version <- NULL [18:41:42.865] } [18:41:42.865] if (!has_future || version < "1.8.0") { [18:41:42.865] info <- base::c(r_version = base::gsub("R version ", [18:41:42.865] "", base::R.version$version.string), [18:41:42.865] platform = base::sprintf("%s (%s-bit)", [18:41:42.865] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.865] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.865] "release", "version")], collapse = " "), [18:41:42.865] hostname = base::Sys.info()[["nodename"]]) [18:41:42.865] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.865] info) [18:41:42.865] info <- base::paste(info, collapse = "; ") [18:41:42.865] if (!has_future) { [18:41:42.865] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.865] info) [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.865] info, version) [18:41:42.865] } [18:41:42.865] base::stop(msg) [18:41:42.865] } [18:41:42.865] }) [18:41:42.865] } [18:41:42.865] ...future.strategy.old <- future::plan("list") [18:41:42.865] options(future.plan = NULL) [18:41:42.865] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.865] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.865] } [18:41:42.865] ...future.workdir <- getwd() [18:41:42.865] } [18:41:42.865] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.865] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.865] } [18:41:42.865] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.865] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.865] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.865] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.865] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.865] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.865] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.865] base::names(...future.oldOptions)) [18:41:42.865] } [18:41:42.865] if (FALSE) { [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] if (TRUE) { [18:41:42.865] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.865] open = "w") [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.865] windows = "NUL", "/dev/null"), open = "w") [18:41:42.865] } [18:41:42.865] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.865] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.865] base::sink(type = "output", split = FALSE) [18:41:42.865] base::close(...future.stdout) [18:41:42.865] }, add = TRUE) [18:41:42.865] } [18:41:42.865] ...future.frame <- base::sys.nframe() [18:41:42.865] ...future.conditions <- base::list() [18:41:42.865] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.865] if (FALSE) { [18:41:42.865] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.865] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.865] } [18:41:42.865] ...future.result <- base::tryCatch({ [18:41:42.865] base::withCallingHandlers({ [18:41:42.865] ...future.value <- base::withVisible(base::local({ [18:41:42.865] do.call(function(...) { [18:41:42.865] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.865] if (!identical(...future.globals.maxSize.org, [18:41:42.865] ...future.globals.maxSize)) { [18:41:42.865] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.865] on.exit(options(oopts), add = TRUE) [18:41:42.865] } [18:41:42.865] { [18:41:42.865] lapply(seq_along(...future.elements_ii), [18:41:42.865] FUN = function(jj) { [18:41:42.865] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.865] ...future.FUN(...future.X_jj, ...) [18:41:42.865] }) [18:41:42.865] } [18:41:42.865] }, args = future.call.arguments) [18:41:42.865] })) [18:41:42.865] future::FutureResult(value = ...future.value$value, [18:41:42.865] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.865] ...future.rng), globalenv = if (FALSE) [18:41:42.865] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.865] ...future.globalenv.names)) [18:41:42.865] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.865] }, condition = base::local({ [18:41:42.865] c <- base::c [18:41:42.865] inherits <- base::inherits [18:41:42.865] invokeRestart <- base::invokeRestart [18:41:42.865] length <- base::length [18:41:42.865] list <- base::list [18:41:42.865] seq.int <- base::seq.int [18:41:42.865] signalCondition <- base::signalCondition [18:41:42.865] sys.calls <- base::sys.calls [18:41:42.865] `[[` <- base::`[[` [18:41:42.865] `+` <- base::`+` [18:41:42.865] `<<-` <- base::`<<-` [18:41:42.865] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.865] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.865] 3L)] [18:41:42.865] } [18:41:42.865] function(cond) { [18:41:42.865] is_error <- inherits(cond, "error") [18:41:42.865] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.865] NULL) [18:41:42.865] if (is_error) { [18:41:42.865] sessionInformation <- function() { [18:41:42.865] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.865] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.865] search = base::search(), system = base::Sys.info()) [18:41:42.865] } [18:41:42.865] ...future.conditions[[length(...future.conditions) + [18:41:42.865] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.865] cond$call), session = sessionInformation(), [18:41:42.865] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.865] signalCondition(cond) [18:41:42.865] } [18:41:42.865] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.865] "immediateCondition"))) { [18:41:42.865] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.865] ...future.conditions[[length(...future.conditions) + [18:41:42.865] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.865] if (TRUE && !signal) { [18:41:42.865] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.865] { [18:41:42.865] inherits <- base::inherits [18:41:42.865] invokeRestart <- base::invokeRestart [18:41:42.865] is.null <- base::is.null [18:41:42.865] muffled <- FALSE [18:41:42.865] if (inherits(cond, "message")) { [18:41:42.865] muffled <- grepl(pattern, "muffleMessage") [18:41:42.865] if (muffled) [18:41:42.865] invokeRestart("muffleMessage") [18:41:42.865] } [18:41:42.865] else if (inherits(cond, "warning")) { [18:41:42.865] muffled <- grepl(pattern, "muffleWarning") [18:41:42.865] if (muffled) [18:41:42.865] invokeRestart("muffleWarning") [18:41:42.865] } [18:41:42.865] else if (inherits(cond, "condition")) { [18:41:42.865] if (!is.null(pattern)) { [18:41:42.865] computeRestarts <- base::computeRestarts [18:41:42.865] grepl <- base::grepl [18:41:42.865] restarts <- computeRestarts(cond) [18:41:42.865] for (restart in restarts) { [18:41:42.865] name <- restart$name [18:41:42.865] if (is.null(name)) [18:41:42.865] next [18:41:42.865] if (!grepl(pattern, name)) [18:41:42.865] next [18:41:42.865] invokeRestart(restart) [18:41:42.865] muffled <- TRUE [18:41:42.865] break [18:41:42.865] } [18:41:42.865] } [18:41:42.865] } [18:41:42.865] invisible(muffled) [18:41:42.865] } [18:41:42.865] muffleCondition(cond, pattern = "^muffle") [18:41:42.865] } [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] if (TRUE) { [18:41:42.865] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.865] { [18:41:42.865] inherits <- base::inherits [18:41:42.865] invokeRestart <- base::invokeRestart [18:41:42.865] is.null <- base::is.null [18:41:42.865] muffled <- FALSE [18:41:42.865] if (inherits(cond, "message")) { [18:41:42.865] muffled <- grepl(pattern, "muffleMessage") [18:41:42.865] if (muffled) [18:41:42.865] invokeRestart("muffleMessage") [18:41:42.865] } [18:41:42.865] else if (inherits(cond, "warning")) { [18:41:42.865] muffled <- grepl(pattern, "muffleWarning") [18:41:42.865] if (muffled) [18:41:42.865] invokeRestart("muffleWarning") [18:41:42.865] } [18:41:42.865] else if (inherits(cond, "condition")) { [18:41:42.865] if (!is.null(pattern)) { [18:41:42.865] computeRestarts <- base::computeRestarts [18:41:42.865] grepl <- base::grepl [18:41:42.865] restarts <- computeRestarts(cond) [18:41:42.865] for (restart in restarts) { [18:41:42.865] name <- restart$name [18:41:42.865] if (is.null(name)) [18:41:42.865] next [18:41:42.865] if (!grepl(pattern, name)) [18:41:42.865] next [18:41:42.865] invokeRestart(restart) [18:41:42.865] muffled <- TRUE [18:41:42.865] break [18:41:42.865] } [18:41:42.865] } [18:41:42.865] } [18:41:42.865] invisible(muffled) [18:41:42.865] } [18:41:42.865] muffleCondition(cond, pattern = "^muffle") [18:41:42.865] } [18:41:42.865] } [18:41:42.865] } [18:41:42.865] })) [18:41:42.865] }, error = function(ex) { [18:41:42.865] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.865] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.865] ...future.rng), started = ...future.startTime, [18:41:42.865] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.865] version = "1.8"), class = "FutureResult") [18:41:42.865] }, finally = { [18:41:42.865] if (!identical(...future.workdir, getwd())) [18:41:42.865] setwd(...future.workdir) [18:41:42.865] { [18:41:42.865] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.865] ...future.oldOptions$nwarnings <- NULL [18:41:42.865] } [18:41:42.865] base::options(...future.oldOptions) [18:41:42.865] if (.Platform$OS.type == "windows") { [18:41:42.865] old_names <- names(...future.oldEnvVars) [18:41:42.865] envs <- base::Sys.getenv() [18:41:42.865] names <- names(envs) [18:41:42.865] common <- intersect(names, old_names) [18:41:42.865] added <- setdiff(names, old_names) [18:41:42.865] removed <- setdiff(old_names, names) [18:41:42.865] changed <- common[...future.oldEnvVars[common] != [18:41:42.865] envs[common]] [18:41:42.865] NAMES <- toupper(changed) [18:41:42.865] args <- list() [18:41:42.865] for (kk in seq_along(NAMES)) { [18:41:42.865] name <- changed[[kk]] [18:41:42.865] NAME <- NAMES[[kk]] [18:41:42.865] if (name != NAME && is.element(NAME, old_names)) [18:41:42.865] next [18:41:42.865] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.865] } [18:41:42.865] NAMES <- toupper(added) [18:41:42.865] for (kk in seq_along(NAMES)) { [18:41:42.865] name <- added[[kk]] [18:41:42.865] NAME <- NAMES[[kk]] [18:41:42.865] if (name != NAME && is.element(NAME, old_names)) [18:41:42.865] next [18:41:42.865] args[[name]] <- "" [18:41:42.865] } [18:41:42.865] NAMES <- toupper(removed) [18:41:42.865] for (kk in seq_along(NAMES)) { [18:41:42.865] name <- removed[[kk]] [18:41:42.865] NAME <- NAMES[[kk]] [18:41:42.865] if (name != NAME && is.element(NAME, old_names)) [18:41:42.865] next [18:41:42.865] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.865] } [18:41:42.865] if (length(args) > 0) [18:41:42.865] base::do.call(base::Sys.setenv, args = args) [18:41:42.865] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.865] } [18:41:42.865] { [18:41:42.865] if (base::length(...future.futureOptionsAdded) > [18:41:42.865] 0L) { [18:41:42.865] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.865] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.865] base::options(opts) [18:41:42.865] } [18:41:42.865] { [18:41:42.865] { [18:41:42.865] NULL [18:41:42.865] RNGkind("Mersenne-Twister") [18:41:42.865] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.865] inherits = FALSE) [18:41:42.865] } [18:41:42.865] options(future.plan = NULL) [18:41:42.865] if (is.na(NA_character_)) [18:41:42.865] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.865] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.865] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.865] .init = FALSE) [18:41:42.865] } [18:41:42.865] } [18:41:42.865] } [18:41:42.865] }) [18:41:42.865] if (TRUE) { [18:41:42.865] base::sink(type = "output", split = FALSE) [18:41:42.865] if (TRUE) { [18:41:42.865] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.865] } [18:41:42.865] else { [18:41:42.865] ...future.result["stdout"] <- base::list(NULL) [18:41:42.865] } [18:41:42.865] base::close(...future.stdout) [18:41:42.865] ...future.stdout <- NULL [18:41:42.865] } [18:41:42.865] ...future.result$conditions <- ...future.conditions [18:41:42.865] ...future.result$finished <- base::Sys.time() [18:41:42.865] ...future.result [18:41:42.865] } [18:41:42.871] assign_globals() ... [18:41:42.871] List of 5 [18:41:42.871] $ ...future.FUN :function (x) [18:41:42.871] $ future.call.arguments : list() [18:41:42.871] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.871] $ ...future.elements_ii :List of 6 [18:41:42.871] ..$ a1: int 1 [18:41:42.871] ..$ a2: int 2 [18:41:42.871] ..$ b1: int 2 [18:41:42.871] ..$ b2: int 3 [18:41:42.871] ..$ c1: int 3 [18:41:42.871] ..$ c2: int 4 [18:41:42.871] $ ...future.seeds_ii : NULL [18:41:42.871] $ ...future.globals.maxSize: NULL [18:41:42.871] - attr(*, "where")=List of 5 [18:41:42.871] ..$ ...future.FUN : [18:41:42.871] ..$ future.call.arguments : [18:41:42.871] ..$ ...future.elements_ii : [18:41:42.871] ..$ ...future.seeds_ii : [18:41:42.871] ..$ ...future.globals.maxSize: [18:41:42.871] - attr(*, "resolved")= logi FALSE [18:41:42.871] - attr(*, "total_size")= num 4942 [18:41:42.871] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.871] - attr(*, "already-done")= logi TRUE [18:41:42.883] - copied '...future.FUN' to environment [18:41:42.884] - copied 'future.call.arguments' to environment [18:41:42.884] - copied '...future.elements_ii' to environment [18:41:42.884] - copied '...future.seeds_ii' to environment [18:41:42.885] - copied '...future.globals.maxSize' to environment [18:41:42.885] assign_globals() ... done [18:41:42.885] plan(): Setting new future strategy stack: [18:41:42.886] List of future strategies: [18:41:42.886] 1. sequential: [18:41:42.886] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.886] - tweaked: FALSE [18:41:42.886] - call: NULL [18:41:42.887] plan(): nbrOfWorkers() = 1 [18:41:42.889] plan(): Setting new future strategy stack: [18:41:42.889] List of future strategies: [18:41:42.889] 1. sequential: [18:41:42.889] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.889] - tweaked: FALSE [18:41:42.889] - call: plan(strategy) [18:41:42.890] plan(): nbrOfWorkers() = 1 [18:41:42.890] SequentialFuture started (and completed) [18:41:42.890] - Launch lazy future ... done [18:41:42.891] run() for 'SequentialFuture' ... done [18:41:42.891] Created future: [18:41:42.891] SequentialFuture: [18:41:42.891] Label: 'future_sapply-1' [18:41:42.891] Expression: [18:41:42.891] { [18:41:42.891] do.call(function(...) { [18:41:42.891] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.891] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.891] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.891] on.exit(options(oopts), add = TRUE) [18:41:42.891] } [18:41:42.891] { [18:41:42.891] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.891] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.891] ...future.FUN(...future.X_jj, ...) [18:41:42.891] }) [18:41:42.891] } [18:41:42.891] }, args = future.call.arguments) [18:41:42.891] } [18:41:42.891] Lazy evaluation: FALSE [18:41:42.891] Asynchronous evaluation: FALSE [18:41:42.891] Local evaluation: TRUE [18:41:42.891] Environment: R_GlobalEnv [18:41:42.891] Capture standard output: TRUE [18:41:42.891] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.891] Globals: 5 objects totaling 532 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.891] Packages: [18:41:42.891] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.891] Resolved: TRUE [18:41:42.891] Value: 103 bytes of class 'list' [18:41:42.891] Early signaling: FALSE [18:41:42.891] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.891] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.893] Chunk #1 of 1 ... DONE [18:41:42.893] Launching 1 futures (chunks) ... DONE [18:41:42.894] Resolving 1 futures (chunks) ... [18:41:42.894] resolve() on list ... [18:41:42.894] recursive: 0 [18:41:42.894] length: 1 [18:41:42.895] [18:41:42.895] resolved() for 'SequentialFuture' ... [18:41:42.895] - state: 'finished' [18:41:42.895] - run: TRUE [18:41:42.896] - result: 'FutureResult' [18:41:42.896] resolved() for 'SequentialFuture' ... done [18:41:42.896] Future #1 [18:41:42.897] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.897] - nx: 1 [18:41:42.897] - relay: TRUE [18:41:42.897] - stdout: TRUE [18:41:42.898] - signal: TRUE [18:41:42.898] - resignal: FALSE [18:41:42.898] - force: TRUE [18:41:42.898] - relayed: [n=1] FALSE [18:41:42.899] - queued futures: [n=1] FALSE [18:41:42.899] - until=1 [18:41:42.899] - relaying element #1 [18:41:42.900] - relayed: [n=1] TRUE [18:41:42.900] - queued futures: [n=1] TRUE [18:41:42.900] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.900] length: 0 (resolved future 1) [18:41:42.901] Relaying remaining futures [18:41:42.901] signalConditionsASAP(NULL, pos=0) ... [18:41:42.901] - nx: 1 [18:41:42.901] - relay: TRUE [18:41:42.902] - stdout: TRUE [18:41:42.902] - signal: TRUE [18:41:42.902] - resignal: FALSE [18:41:42.902] - force: TRUE [18:41:42.903] - relayed: [n=1] TRUE [18:41:42.903] - queued futures: [n=1] TRUE - flush all [18:41:42.903] - relayed: [n=1] TRUE [18:41:42.904] - queued futures: [n=1] TRUE [18:41:42.904] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.904] resolve() on list ... DONE [18:41:42.904] - Number of value chunks collected: 1 [18:41:42.905] Resolving 1 futures (chunks) ... DONE [18:41:42.905] Reducing values from 1 chunks ... [18:41:42.905] - Number of values collected after concatenation: 6 [18:41:42.905] - Number of values expected: 6 [18:41:42.906] Reducing values from 1 chunks ... DONE [18:41:42.906] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.909] future_lapply() ... [18:41:42.910] Number of chunks: 1 [18:41:42.910] getGlobalsAndPackagesXApply() ... [18:41:42.911] - future.globals: TRUE [18:41:42.911] getGlobalsAndPackages() ... [18:41:42.911] Searching for globals... [18:41:42.913] - globals found: [2] 'FUN', 'UseMethod' [18:41:42.913] Searching for globals ... DONE [18:41:42.914] Resolving globals: FALSE [18:41:42.914] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:42.915] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:42.915] - globals: [1] 'FUN' [18:41:42.916] [18:41:42.916] getGlobalsAndPackages() ... DONE [18:41:42.916] - globals found/used: [n=1] 'FUN' [18:41:42.916] - needed namespaces: [n=0] [18:41:42.917] Finding globals ... DONE [18:41:42.917] - use_args: TRUE [18:41:42.917] - Getting '...' globals ... [18:41:42.918] resolve() on list ... [18:41:42.918] recursive: 0 [18:41:42.918] length: 1 [18:41:42.919] elements: '...' [18:41:42.919] length: 0 (resolved future 1) [18:41:42.919] resolve() on list ... DONE [18:41:42.919] - '...' content: [n=0] [18:41:42.920] List of 1 [18:41:42.920] $ ...: list() [18:41:42.920] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.920] - attr(*, "where")=List of 1 [18:41:42.920] ..$ ...: [18:41:42.920] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.920] - attr(*, "resolved")= logi TRUE [18:41:42.920] - attr(*, "total_size")= num NA [18:41:42.924] - Getting '...' globals ... DONE [18:41:42.925] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:42.925] List of 2 [18:41:42.925] $ ...future.FUN:function (x, ...) [18:41:42.925] $ ... : list() [18:41:42.925] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.925] - attr(*, "where")=List of 2 [18:41:42.925] ..$ ...future.FUN: [18:41:42.925] ..$ ... : [18:41:42.925] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.925] - attr(*, "resolved")= logi FALSE [18:41:42.925] - attr(*, "total_size")= int 5182 [18:41:42.930] Packages to be attached in all futures: [n=0] [18:41:42.930] getGlobalsAndPackagesXApply() ... DONE [18:41:42.931] Number of futures (= number of chunks): 1 [18:41:42.931] Launching 1 futures (chunks) ... [18:41:42.931] Chunk #1 of 1 ... [18:41:42.932] - Finding globals in 'X' for chunk #1 ... [18:41:42.932] getGlobalsAndPackages() ... [18:41:42.932] Searching for globals... [18:41:42.933] [18:41:42.933] Searching for globals ... DONE [18:41:42.933] - globals: [0] [18:41:42.933] getGlobalsAndPackages() ... DONE [18:41:42.934] + additional globals found: [n=0] [18:41:42.934] + additional namespaces needed: [n=0] [18:41:42.934] - Finding globals in 'X' for chunk #1 ... DONE [18:41:42.934] - seeds: [18:41:42.935] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.935] getGlobalsAndPackages() ... [18:41:42.935] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.936] Resolving globals: FALSE [18:41:42.936] Tweak future expression to call with '...' arguments ... [18:41:42.936] { [18:41:42.936] do.call(function(...) { [18:41:42.936] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.936] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.936] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.936] on.exit(options(oopts), add = TRUE) [18:41:42.936] } [18:41:42.936] { [18:41:42.936] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.936] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.936] ...future.FUN(...future.X_jj, ...) [18:41:42.936] }) [18:41:42.936] } [18:41:42.936] }, args = future.call.arguments) [18:41:42.936] } [18:41:42.937] Tweak future expression to call with '...' arguments ... DONE [18:41:42.938] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:42.938] [18:41:42.938] getGlobalsAndPackages() ... DONE [18:41:42.939] run() for 'Future' ... [18:41:42.939] - state: 'created' [18:41:42.939] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:42.940] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.940] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:42.940] - Field: 'label' [18:41:42.941] - Field: 'local' [18:41:42.941] - Field: 'owner' [18:41:42.941] - Field: 'envir' [18:41:42.942] - Field: 'packages' [18:41:42.942] - Field: 'gc' [18:41:42.942] - Field: 'conditions' [18:41:42.942] - Field: 'expr' [18:41:42.943] - Field: 'uuid' [18:41:42.943] - Field: 'seed' [18:41:42.943] - Field: 'version' [18:41:42.944] - Field: 'result' [18:41:42.944] - Field: 'asynchronous' [18:41:42.944] - Field: 'calls' [18:41:42.944] - Field: 'globals' [18:41:42.945] - Field: 'stdout' [18:41:42.945] - Field: 'earlySignal' [18:41:42.945] - Field: 'lazy' [18:41:42.946] - Field: 'state' [18:41:42.946] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:42.946] - Launch lazy future ... [18:41:42.947] Packages needed by the future expression (n = 0): [18:41:42.947] Packages needed by future strategies (n = 0): [18:41:42.948] { [18:41:42.948] { [18:41:42.948] { [18:41:42.948] ...future.startTime <- base::Sys.time() [18:41:42.948] { [18:41:42.948] { [18:41:42.948] { [18:41:42.948] base::local({ [18:41:42.948] has_future <- base::requireNamespace("future", [18:41:42.948] quietly = TRUE) [18:41:42.948] if (has_future) { [18:41:42.948] ns <- base::getNamespace("future") [18:41:42.948] version <- ns[[".package"]][["version"]] [18:41:42.948] if (is.null(version)) [18:41:42.948] version <- utils::packageVersion("future") [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] version <- NULL [18:41:42.948] } [18:41:42.948] if (!has_future || version < "1.8.0") { [18:41:42.948] info <- base::c(r_version = base::gsub("R version ", [18:41:42.948] "", base::R.version$version.string), [18:41:42.948] platform = base::sprintf("%s (%s-bit)", [18:41:42.948] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:42.948] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:42.948] "release", "version")], collapse = " "), [18:41:42.948] hostname = base::Sys.info()[["nodename"]]) [18:41:42.948] info <- base::sprintf("%s: %s", base::names(info), [18:41:42.948] info) [18:41:42.948] info <- base::paste(info, collapse = "; ") [18:41:42.948] if (!has_future) { [18:41:42.948] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:42.948] info) [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:42.948] info, version) [18:41:42.948] } [18:41:42.948] base::stop(msg) [18:41:42.948] } [18:41:42.948] }) [18:41:42.948] } [18:41:42.948] ...future.strategy.old <- future::plan("list") [18:41:42.948] options(future.plan = NULL) [18:41:42.948] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.948] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:42.948] } [18:41:42.948] ...future.workdir <- getwd() [18:41:42.948] } [18:41:42.948] ...future.oldOptions <- base::as.list(base::.Options) [18:41:42.948] ...future.oldEnvVars <- base::Sys.getenv() [18:41:42.948] } [18:41:42.948] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:42.948] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:42.948] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:42.948] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:42.948] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:42.948] future.stdout.windows.reencode = NULL, width = 80L) [18:41:42.948] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:42.948] base::names(...future.oldOptions)) [18:41:42.948] } [18:41:42.948] if (FALSE) { [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] if (TRUE) { [18:41:42.948] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:42.948] open = "w") [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:42.948] windows = "NUL", "/dev/null"), open = "w") [18:41:42.948] } [18:41:42.948] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:42.948] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:42.948] base::sink(type = "output", split = FALSE) [18:41:42.948] base::close(...future.stdout) [18:41:42.948] }, add = TRUE) [18:41:42.948] } [18:41:42.948] ...future.frame <- base::sys.nframe() [18:41:42.948] ...future.conditions <- base::list() [18:41:42.948] ...future.rng <- base::globalenv()$.Random.seed [18:41:42.948] if (FALSE) { [18:41:42.948] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:42.948] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:42.948] } [18:41:42.948] ...future.result <- base::tryCatch({ [18:41:42.948] base::withCallingHandlers({ [18:41:42.948] ...future.value <- base::withVisible(base::local({ [18:41:42.948] do.call(function(...) { [18:41:42.948] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.948] if (!identical(...future.globals.maxSize.org, [18:41:42.948] ...future.globals.maxSize)) { [18:41:42.948] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.948] on.exit(options(oopts), add = TRUE) [18:41:42.948] } [18:41:42.948] { [18:41:42.948] lapply(seq_along(...future.elements_ii), [18:41:42.948] FUN = function(jj) { [18:41:42.948] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.948] ...future.FUN(...future.X_jj, ...) [18:41:42.948] }) [18:41:42.948] } [18:41:42.948] }, args = future.call.arguments) [18:41:42.948] })) [18:41:42.948] future::FutureResult(value = ...future.value$value, [18:41:42.948] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.948] ...future.rng), globalenv = if (FALSE) [18:41:42.948] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:42.948] ...future.globalenv.names)) [18:41:42.948] else NULL, started = ...future.startTime, version = "1.8") [18:41:42.948] }, condition = base::local({ [18:41:42.948] c <- base::c [18:41:42.948] inherits <- base::inherits [18:41:42.948] invokeRestart <- base::invokeRestart [18:41:42.948] length <- base::length [18:41:42.948] list <- base::list [18:41:42.948] seq.int <- base::seq.int [18:41:42.948] signalCondition <- base::signalCondition [18:41:42.948] sys.calls <- base::sys.calls [18:41:42.948] `[[` <- base::`[[` [18:41:42.948] `+` <- base::`+` [18:41:42.948] `<<-` <- base::`<<-` [18:41:42.948] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:42.948] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:42.948] 3L)] [18:41:42.948] } [18:41:42.948] function(cond) { [18:41:42.948] is_error <- inherits(cond, "error") [18:41:42.948] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:42.948] NULL) [18:41:42.948] if (is_error) { [18:41:42.948] sessionInformation <- function() { [18:41:42.948] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:42.948] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:42.948] search = base::search(), system = base::Sys.info()) [18:41:42.948] } [18:41:42.948] ...future.conditions[[length(...future.conditions) + [18:41:42.948] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:42.948] cond$call), session = sessionInformation(), [18:41:42.948] timestamp = base::Sys.time(), signaled = 0L) [18:41:42.948] signalCondition(cond) [18:41:42.948] } [18:41:42.948] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:42.948] "immediateCondition"))) { [18:41:42.948] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:42.948] ...future.conditions[[length(...future.conditions) + [18:41:42.948] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:42.948] if (TRUE && !signal) { [18:41:42.948] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.948] { [18:41:42.948] inherits <- base::inherits [18:41:42.948] invokeRestart <- base::invokeRestart [18:41:42.948] is.null <- base::is.null [18:41:42.948] muffled <- FALSE [18:41:42.948] if (inherits(cond, "message")) { [18:41:42.948] muffled <- grepl(pattern, "muffleMessage") [18:41:42.948] if (muffled) [18:41:42.948] invokeRestart("muffleMessage") [18:41:42.948] } [18:41:42.948] else if (inherits(cond, "warning")) { [18:41:42.948] muffled <- grepl(pattern, "muffleWarning") [18:41:42.948] if (muffled) [18:41:42.948] invokeRestart("muffleWarning") [18:41:42.948] } [18:41:42.948] else if (inherits(cond, "condition")) { [18:41:42.948] if (!is.null(pattern)) { [18:41:42.948] computeRestarts <- base::computeRestarts [18:41:42.948] grepl <- base::grepl [18:41:42.948] restarts <- computeRestarts(cond) [18:41:42.948] for (restart in restarts) { [18:41:42.948] name <- restart$name [18:41:42.948] if (is.null(name)) [18:41:42.948] next [18:41:42.948] if (!grepl(pattern, name)) [18:41:42.948] next [18:41:42.948] invokeRestart(restart) [18:41:42.948] muffled <- TRUE [18:41:42.948] break [18:41:42.948] } [18:41:42.948] } [18:41:42.948] } [18:41:42.948] invisible(muffled) [18:41:42.948] } [18:41:42.948] muffleCondition(cond, pattern = "^muffle") [18:41:42.948] } [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] if (TRUE) { [18:41:42.948] muffleCondition <- function (cond, pattern = "^muffle") [18:41:42.948] { [18:41:42.948] inherits <- base::inherits [18:41:42.948] invokeRestart <- base::invokeRestart [18:41:42.948] is.null <- base::is.null [18:41:42.948] muffled <- FALSE [18:41:42.948] if (inherits(cond, "message")) { [18:41:42.948] muffled <- grepl(pattern, "muffleMessage") [18:41:42.948] if (muffled) [18:41:42.948] invokeRestart("muffleMessage") [18:41:42.948] } [18:41:42.948] else if (inherits(cond, "warning")) { [18:41:42.948] muffled <- grepl(pattern, "muffleWarning") [18:41:42.948] if (muffled) [18:41:42.948] invokeRestart("muffleWarning") [18:41:42.948] } [18:41:42.948] else if (inherits(cond, "condition")) { [18:41:42.948] if (!is.null(pattern)) { [18:41:42.948] computeRestarts <- base::computeRestarts [18:41:42.948] grepl <- base::grepl [18:41:42.948] restarts <- computeRestarts(cond) [18:41:42.948] for (restart in restarts) { [18:41:42.948] name <- restart$name [18:41:42.948] if (is.null(name)) [18:41:42.948] next [18:41:42.948] if (!grepl(pattern, name)) [18:41:42.948] next [18:41:42.948] invokeRestart(restart) [18:41:42.948] muffled <- TRUE [18:41:42.948] break [18:41:42.948] } [18:41:42.948] } [18:41:42.948] } [18:41:42.948] invisible(muffled) [18:41:42.948] } [18:41:42.948] muffleCondition(cond, pattern = "^muffle") [18:41:42.948] } [18:41:42.948] } [18:41:42.948] } [18:41:42.948] })) [18:41:42.948] }, error = function(ex) { [18:41:42.948] base::structure(base::list(value = NULL, visible = NULL, [18:41:42.948] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:42.948] ...future.rng), started = ...future.startTime, [18:41:42.948] finished = Sys.time(), session_uuid = NA_character_, [18:41:42.948] version = "1.8"), class = "FutureResult") [18:41:42.948] }, finally = { [18:41:42.948] if (!identical(...future.workdir, getwd())) [18:41:42.948] setwd(...future.workdir) [18:41:42.948] { [18:41:42.948] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:42.948] ...future.oldOptions$nwarnings <- NULL [18:41:42.948] } [18:41:42.948] base::options(...future.oldOptions) [18:41:42.948] if (.Platform$OS.type == "windows") { [18:41:42.948] old_names <- names(...future.oldEnvVars) [18:41:42.948] envs <- base::Sys.getenv() [18:41:42.948] names <- names(envs) [18:41:42.948] common <- intersect(names, old_names) [18:41:42.948] added <- setdiff(names, old_names) [18:41:42.948] removed <- setdiff(old_names, names) [18:41:42.948] changed <- common[...future.oldEnvVars[common] != [18:41:42.948] envs[common]] [18:41:42.948] NAMES <- toupper(changed) [18:41:42.948] args <- list() [18:41:42.948] for (kk in seq_along(NAMES)) { [18:41:42.948] name <- changed[[kk]] [18:41:42.948] NAME <- NAMES[[kk]] [18:41:42.948] if (name != NAME && is.element(NAME, old_names)) [18:41:42.948] next [18:41:42.948] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.948] } [18:41:42.948] NAMES <- toupper(added) [18:41:42.948] for (kk in seq_along(NAMES)) { [18:41:42.948] name <- added[[kk]] [18:41:42.948] NAME <- NAMES[[kk]] [18:41:42.948] if (name != NAME && is.element(NAME, old_names)) [18:41:42.948] next [18:41:42.948] args[[name]] <- "" [18:41:42.948] } [18:41:42.948] NAMES <- toupper(removed) [18:41:42.948] for (kk in seq_along(NAMES)) { [18:41:42.948] name <- removed[[kk]] [18:41:42.948] NAME <- NAMES[[kk]] [18:41:42.948] if (name != NAME && is.element(NAME, old_names)) [18:41:42.948] next [18:41:42.948] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:42.948] } [18:41:42.948] if (length(args) > 0) [18:41:42.948] base::do.call(base::Sys.setenv, args = args) [18:41:42.948] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:42.948] } [18:41:42.948] { [18:41:42.948] if (base::length(...future.futureOptionsAdded) > [18:41:42.948] 0L) { [18:41:42.948] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:42.948] base::names(opts) <- ...future.futureOptionsAdded [18:41:42.948] base::options(opts) [18:41:42.948] } [18:41:42.948] { [18:41:42.948] { [18:41:42.948] NULL [18:41:42.948] RNGkind("Mersenne-Twister") [18:41:42.948] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:42.948] inherits = FALSE) [18:41:42.948] } [18:41:42.948] options(future.plan = NULL) [18:41:42.948] if (is.na(NA_character_)) [18:41:42.948] Sys.unsetenv("R_FUTURE_PLAN") [18:41:42.948] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:42.948] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:42.948] .init = FALSE) [18:41:42.948] } [18:41:42.948] } [18:41:42.948] } [18:41:42.948] }) [18:41:42.948] if (TRUE) { [18:41:42.948] base::sink(type = "output", split = FALSE) [18:41:42.948] if (TRUE) { [18:41:42.948] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:42.948] } [18:41:42.948] else { [18:41:42.948] ...future.result["stdout"] <- base::list(NULL) [18:41:42.948] } [18:41:42.948] base::close(...future.stdout) [18:41:42.948] ...future.stdout <- NULL [18:41:42.948] } [18:41:42.948] ...future.result$conditions <- ...future.conditions [18:41:42.948] ...future.result$finished <- base::Sys.time() [18:41:42.948] ...future.result [18:41:42.948] } [18:41:42.954] assign_globals() ... [18:41:42.955] List of 5 [18:41:42.955] $ ...future.FUN :function (x, ...) [18:41:42.955] $ future.call.arguments : list() [18:41:42.955] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:42.955] $ ...future.elements_ii :List of 6 [18:41:42.955] ..$ a1: int 1 [18:41:42.955] ..$ a2: int 2 [18:41:42.955] ..$ b1: int 2 [18:41:42.955] ..$ b2: int 3 [18:41:42.955] ..$ c1: int 3 [18:41:42.955] ..$ c2: int 4 [18:41:42.955] $ ...future.seeds_ii : NULL [18:41:42.955] $ ...future.globals.maxSize: NULL [18:41:42.955] - attr(*, "where")=List of 5 [18:41:42.955] ..$ ...future.FUN : [18:41:42.955] ..$ future.call.arguments : [18:41:42.955] ..$ ...future.elements_ii : [18:41:42.955] ..$ ...future.seeds_ii : [18:41:42.955] ..$ ...future.globals.maxSize: [18:41:42.955] - attr(*, "resolved")= logi FALSE [18:41:42.955] - attr(*, "total_size")= num 5182 [18:41:42.955] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:42.955] - attr(*, "already-done")= logi TRUE [18:41:42.967] - copied '...future.FUN' to environment [18:41:42.967] - copied 'future.call.arguments' to environment [18:41:42.967] - copied '...future.elements_ii' to environment [18:41:42.968] - copied '...future.seeds_ii' to environment [18:41:42.968] - copied '...future.globals.maxSize' to environment [18:41:42.968] assign_globals() ... done [18:41:42.969] plan(): Setting new future strategy stack: [18:41:42.969] List of future strategies: [18:41:42.969] 1. sequential: [18:41:42.969] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.969] - tweaked: FALSE [18:41:42.969] - call: NULL [18:41:42.970] plan(): nbrOfWorkers() = 1 [18:41:42.972] plan(): Setting new future strategy stack: [18:41:42.972] List of future strategies: [18:41:42.972] 1. sequential: [18:41:42.972] - args: function (..., envir = parent.frame(), workers = "") [18:41:42.972] - tweaked: FALSE [18:41:42.972] - call: plan(strategy) [18:41:42.973] plan(): nbrOfWorkers() = 1 [18:41:42.974] SequentialFuture started (and completed) [18:41:42.974] - Launch lazy future ... done [18:41:42.974] run() for 'SequentialFuture' ... done [18:41:42.975] Created future: [18:41:42.975] SequentialFuture: [18:41:42.975] Label: 'future_sapply-1' [18:41:42.975] Expression: [18:41:42.975] { [18:41:42.975] do.call(function(...) { [18:41:42.975] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:42.975] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:42.975] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:42.975] on.exit(options(oopts), add = TRUE) [18:41:42.975] } [18:41:42.975] { [18:41:42.975] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:42.975] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:42.975] ...future.FUN(...future.X_jj, ...) [18:41:42.975] }) [18:41:42.975] } [18:41:42.975] }, args = future.call.arguments) [18:41:42.975] } [18:41:42.975] Lazy evaluation: FALSE [18:41:42.975] Asynchronous evaluation: FALSE [18:41:42.975] Local evaluation: TRUE [18:41:42.975] Environment: R_GlobalEnv [18:41:42.975] Capture standard output: TRUE [18:41:42.975] Capture condition classes: 'condition' (excluding 'nothing') [18:41:42.975] Globals: 5 objects totaling 625 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:42.975] Packages: [18:41:42.975] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:42.975] Resolved: TRUE [18:41:42.975] Value: 282 bytes of class 'list' [18:41:42.975] Early signaling: FALSE [18:41:42.975] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:42.975] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:42.979] Chunk #1 of 1 ... DONE [18:41:42.980] Launching 1 futures (chunks) ... DONE [18:41:42.980] Resolving 1 futures (chunks) ... [18:41:42.980] resolve() on list ... [18:41:42.980] recursive: 0 [18:41:42.981] length: 1 [18:41:42.981] [18:41:42.981] resolved() for 'SequentialFuture' ... [18:41:42.981] - state: 'finished' [18:41:42.982] - run: TRUE [18:41:42.982] - result: 'FutureResult' [18:41:42.982] resolved() for 'SequentialFuture' ... done [18:41:42.983] Future #1 [18:41:42.983] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:42.983] - nx: 1 [18:41:42.983] - relay: TRUE [18:41:42.984] - stdout: TRUE [18:41:42.984] - signal: TRUE [18:41:42.984] - resignal: FALSE [18:41:42.984] - force: TRUE [18:41:42.985] - relayed: [n=1] FALSE [18:41:42.985] - queued futures: [n=1] FALSE [18:41:42.985] - until=1 [18:41:42.985] - relaying element #1 [18:41:42.986] - relayed: [n=1] TRUE [18:41:42.986] - queued futures: [n=1] TRUE [18:41:42.986] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:42.987] length: 0 (resolved future 1) [18:41:42.987] Relaying remaining futures [18:41:42.987] signalConditionsASAP(NULL, pos=0) ... [18:41:42.987] - nx: 1 [18:41:42.988] - relay: TRUE [18:41:42.988] - stdout: TRUE [18:41:42.988] - signal: TRUE [18:41:42.988] - resignal: FALSE [18:41:42.989] - force: TRUE [18:41:42.989] - relayed: [n=1] TRUE [18:41:42.989] - queued futures: [n=1] TRUE - flush all [18:41:42.989] - relayed: [n=1] TRUE [18:41:42.990] - queued futures: [n=1] TRUE [18:41:42.990] signalConditionsASAP(NULL, pos=0) ... done [18:41:42.990] resolve() on list ... DONE [18:41:42.991] - Number of value chunks collected: 1 [18:41:42.991] Resolving 1 futures (chunks) ... DONE [18:41:42.991] Reducing values from 1 chunks ... [18:41:42.991] - Number of values collected after concatenation: 6 [18:41:42.992] - Number of values expected: 6 [18:41:42.992] Reducing values from 1 chunks ... DONE [18:41:42.992] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:42.995] future_lapply() ... [18:41:42.997] Number of chunks: 1 [18:41:42.997] getGlobalsAndPackagesXApply() ... [18:41:42.997] - future.globals: TRUE [18:41:42.997] getGlobalsAndPackages() ... [18:41:42.998] Searching for globals... [18:41:43.000] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:43.001] Searching for globals ... DONE [18:41:43.001] Resolving globals: FALSE [18:41:43.002] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:43.002] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:43.003] - globals: [1] 'FUN' [18:41:43.003] [18:41:43.003] getGlobalsAndPackages() ... DONE [18:41:43.003] - globals found/used: [n=1] 'FUN' [18:41:43.004] - needed namespaces: [n=0] [18:41:43.004] Finding globals ... DONE [18:41:43.004] - use_args: TRUE [18:41:43.005] - Getting '...' globals ... [18:41:43.005] resolve() on list ... [18:41:43.005] recursive: 0 [18:41:43.006] length: 1 [18:41:43.006] elements: '...' [18:41:43.006] length: 0 (resolved future 1) [18:41:43.007] resolve() on list ... DONE [18:41:43.007] - '...' content: [n=0] [18:41:43.007] List of 1 [18:41:43.007] $ ...: list() [18:41:43.007] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.007] - attr(*, "where")=List of 1 [18:41:43.007] ..$ ...: [18:41:43.007] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.007] - attr(*, "resolved")= logi TRUE [18:41:43.007] - attr(*, "total_size")= num NA [18:41:43.011] - Getting '...' globals ... DONE [18:41:43.012] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.012] List of 2 [18:41:43.012] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:43.012] $ ... : list() [18:41:43.012] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.012] - attr(*, "where")=List of 2 [18:41:43.012] ..$ ...future.FUN: [18:41:43.012] ..$ ... : [18:41:43.012] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.012] - attr(*, "resolved")= logi FALSE [18:41:43.012] - attr(*, "total_size")= int 6664 [18:41:43.017] Packages to be attached in all futures: [n=0] [18:41:43.017] getGlobalsAndPackagesXApply() ... DONE [18:41:43.018] Number of futures (= number of chunks): 1 [18:41:43.018] Launching 1 futures (chunks) ... [18:41:43.018] Chunk #1 of 1 ... [18:41:43.019] - Finding globals in 'X' for chunk #1 ... [18:41:43.019] getGlobalsAndPackages() ... [18:41:43.019] Searching for globals... [18:41:43.020] [18:41:43.020] Searching for globals ... DONE [18:41:43.020] - globals: [0] [18:41:43.021] getGlobalsAndPackages() ... DONE [18:41:43.021] + additional globals found: [n=0] [18:41:43.021] + additional namespaces needed: [n=0] [18:41:43.021] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.022] - seeds: [18:41:43.022] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.022] getGlobalsAndPackages() ... [18:41:43.022] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.023] Resolving globals: FALSE [18:41:43.023] Tweak future expression to call with '...' arguments ... [18:41:43.023] { [18:41:43.023] do.call(function(...) { [18:41:43.023] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.023] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.023] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.023] on.exit(options(oopts), add = TRUE) [18:41:43.023] } [18:41:43.023] { [18:41:43.023] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.023] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.023] ...future.FUN(...future.X_jj, ...) [18:41:43.023] }) [18:41:43.023] } [18:41:43.023] }, args = future.call.arguments) [18:41:43.023] } [18:41:43.024] Tweak future expression to call with '...' arguments ... DONE [18:41:43.025] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.025] [18:41:43.025] getGlobalsAndPackages() ... DONE [18:41:43.026] run() for 'Future' ... [18:41:43.026] - state: 'created' [18:41:43.026] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.027] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.027] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.028] - Field: 'label' [18:41:43.028] - Field: 'local' [18:41:43.028] - Field: 'owner' [18:41:43.029] - Field: 'envir' [18:41:43.029] - Field: 'packages' [18:41:43.029] - Field: 'gc' [18:41:43.029] - Field: 'conditions' [18:41:43.030] - Field: 'expr' [18:41:43.030] - Field: 'uuid' [18:41:43.030] - Field: 'seed' [18:41:43.031] - Field: 'version' [18:41:43.031] - Field: 'result' [18:41:43.031] - Field: 'asynchronous' [18:41:43.031] - Field: 'calls' [18:41:43.032] - Field: 'globals' [18:41:43.032] - Field: 'stdout' [18:41:43.032] - Field: 'earlySignal' [18:41:43.033] - Field: 'lazy' [18:41:43.033] - Field: 'state' [18:41:43.033] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.033] - Launch lazy future ... [18:41:43.034] Packages needed by the future expression (n = 0): [18:41:43.034] Packages needed by future strategies (n = 0): [18:41:43.035] { [18:41:43.035] { [18:41:43.035] { [18:41:43.035] ...future.startTime <- base::Sys.time() [18:41:43.035] { [18:41:43.035] { [18:41:43.035] { [18:41:43.035] base::local({ [18:41:43.035] has_future <- base::requireNamespace("future", [18:41:43.035] quietly = TRUE) [18:41:43.035] if (has_future) { [18:41:43.035] ns <- base::getNamespace("future") [18:41:43.035] version <- ns[[".package"]][["version"]] [18:41:43.035] if (is.null(version)) [18:41:43.035] version <- utils::packageVersion("future") [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] version <- NULL [18:41:43.035] } [18:41:43.035] if (!has_future || version < "1.8.0") { [18:41:43.035] info <- base::c(r_version = base::gsub("R version ", [18:41:43.035] "", base::R.version$version.string), [18:41:43.035] platform = base::sprintf("%s (%s-bit)", [18:41:43.035] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.035] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.035] "release", "version")], collapse = " "), [18:41:43.035] hostname = base::Sys.info()[["nodename"]]) [18:41:43.035] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.035] info) [18:41:43.035] info <- base::paste(info, collapse = "; ") [18:41:43.035] if (!has_future) { [18:41:43.035] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.035] info) [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.035] info, version) [18:41:43.035] } [18:41:43.035] base::stop(msg) [18:41:43.035] } [18:41:43.035] }) [18:41:43.035] } [18:41:43.035] ...future.strategy.old <- future::plan("list") [18:41:43.035] options(future.plan = NULL) [18:41:43.035] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.035] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.035] } [18:41:43.035] ...future.workdir <- getwd() [18:41:43.035] } [18:41:43.035] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.035] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.035] } [18:41:43.035] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.035] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.035] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.035] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.035] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.035] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.035] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.035] base::names(...future.oldOptions)) [18:41:43.035] } [18:41:43.035] if (FALSE) { [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] if (TRUE) { [18:41:43.035] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.035] open = "w") [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.035] windows = "NUL", "/dev/null"), open = "w") [18:41:43.035] } [18:41:43.035] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.035] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.035] base::sink(type = "output", split = FALSE) [18:41:43.035] base::close(...future.stdout) [18:41:43.035] }, add = TRUE) [18:41:43.035] } [18:41:43.035] ...future.frame <- base::sys.nframe() [18:41:43.035] ...future.conditions <- base::list() [18:41:43.035] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.035] if (FALSE) { [18:41:43.035] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.035] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.035] } [18:41:43.035] ...future.result <- base::tryCatch({ [18:41:43.035] base::withCallingHandlers({ [18:41:43.035] ...future.value <- base::withVisible(base::local({ [18:41:43.035] do.call(function(...) { [18:41:43.035] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.035] if (!identical(...future.globals.maxSize.org, [18:41:43.035] ...future.globals.maxSize)) { [18:41:43.035] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.035] on.exit(options(oopts), add = TRUE) [18:41:43.035] } [18:41:43.035] { [18:41:43.035] lapply(seq_along(...future.elements_ii), [18:41:43.035] FUN = function(jj) { [18:41:43.035] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.035] ...future.FUN(...future.X_jj, ...) [18:41:43.035] }) [18:41:43.035] } [18:41:43.035] }, args = future.call.arguments) [18:41:43.035] })) [18:41:43.035] future::FutureResult(value = ...future.value$value, [18:41:43.035] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.035] ...future.rng), globalenv = if (FALSE) [18:41:43.035] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.035] ...future.globalenv.names)) [18:41:43.035] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.035] }, condition = base::local({ [18:41:43.035] c <- base::c [18:41:43.035] inherits <- base::inherits [18:41:43.035] invokeRestart <- base::invokeRestart [18:41:43.035] length <- base::length [18:41:43.035] list <- base::list [18:41:43.035] seq.int <- base::seq.int [18:41:43.035] signalCondition <- base::signalCondition [18:41:43.035] sys.calls <- base::sys.calls [18:41:43.035] `[[` <- base::`[[` [18:41:43.035] `+` <- base::`+` [18:41:43.035] `<<-` <- base::`<<-` [18:41:43.035] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.035] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.035] 3L)] [18:41:43.035] } [18:41:43.035] function(cond) { [18:41:43.035] is_error <- inherits(cond, "error") [18:41:43.035] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.035] NULL) [18:41:43.035] if (is_error) { [18:41:43.035] sessionInformation <- function() { [18:41:43.035] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.035] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.035] search = base::search(), system = base::Sys.info()) [18:41:43.035] } [18:41:43.035] ...future.conditions[[length(...future.conditions) + [18:41:43.035] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.035] cond$call), session = sessionInformation(), [18:41:43.035] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.035] signalCondition(cond) [18:41:43.035] } [18:41:43.035] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.035] "immediateCondition"))) { [18:41:43.035] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.035] ...future.conditions[[length(...future.conditions) + [18:41:43.035] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.035] if (TRUE && !signal) { [18:41:43.035] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.035] { [18:41:43.035] inherits <- base::inherits [18:41:43.035] invokeRestart <- base::invokeRestart [18:41:43.035] is.null <- base::is.null [18:41:43.035] muffled <- FALSE [18:41:43.035] if (inherits(cond, "message")) { [18:41:43.035] muffled <- grepl(pattern, "muffleMessage") [18:41:43.035] if (muffled) [18:41:43.035] invokeRestart("muffleMessage") [18:41:43.035] } [18:41:43.035] else if (inherits(cond, "warning")) { [18:41:43.035] muffled <- grepl(pattern, "muffleWarning") [18:41:43.035] if (muffled) [18:41:43.035] invokeRestart("muffleWarning") [18:41:43.035] } [18:41:43.035] else if (inherits(cond, "condition")) { [18:41:43.035] if (!is.null(pattern)) { [18:41:43.035] computeRestarts <- base::computeRestarts [18:41:43.035] grepl <- base::grepl [18:41:43.035] restarts <- computeRestarts(cond) [18:41:43.035] for (restart in restarts) { [18:41:43.035] name <- restart$name [18:41:43.035] if (is.null(name)) [18:41:43.035] next [18:41:43.035] if (!grepl(pattern, name)) [18:41:43.035] next [18:41:43.035] invokeRestart(restart) [18:41:43.035] muffled <- TRUE [18:41:43.035] break [18:41:43.035] } [18:41:43.035] } [18:41:43.035] } [18:41:43.035] invisible(muffled) [18:41:43.035] } [18:41:43.035] muffleCondition(cond, pattern = "^muffle") [18:41:43.035] } [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] if (TRUE) { [18:41:43.035] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.035] { [18:41:43.035] inherits <- base::inherits [18:41:43.035] invokeRestart <- base::invokeRestart [18:41:43.035] is.null <- base::is.null [18:41:43.035] muffled <- FALSE [18:41:43.035] if (inherits(cond, "message")) { [18:41:43.035] muffled <- grepl(pattern, "muffleMessage") [18:41:43.035] if (muffled) [18:41:43.035] invokeRestart("muffleMessage") [18:41:43.035] } [18:41:43.035] else if (inherits(cond, "warning")) { [18:41:43.035] muffled <- grepl(pattern, "muffleWarning") [18:41:43.035] if (muffled) [18:41:43.035] invokeRestart("muffleWarning") [18:41:43.035] } [18:41:43.035] else if (inherits(cond, "condition")) { [18:41:43.035] if (!is.null(pattern)) { [18:41:43.035] computeRestarts <- base::computeRestarts [18:41:43.035] grepl <- base::grepl [18:41:43.035] restarts <- computeRestarts(cond) [18:41:43.035] for (restart in restarts) { [18:41:43.035] name <- restart$name [18:41:43.035] if (is.null(name)) [18:41:43.035] next [18:41:43.035] if (!grepl(pattern, name)) [18:41:43.035] next [18:41:43.035] invokeRestart(restart) [18:41:43.035] muffled <- TRUE [18:41:43.035] break [18:41:43.035] } [18:41:43.035] } [18:41:43.035] } [18:41:43.035] invisible(muffled) [18:41:43.035] } [18:41:43.035] muffleCondition(cond, pattern = "^muffle") [18:41:43.035] } [18:41:43.035] } [18:41:43.035] } [18:41:43.035] })) [18:41:43.035] }, error = function(ex) { [18:41:43.035] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.035] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.035] ...future.rng), started = ...future.startTime, [18:41:43.035] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.035] version = "1.8"), class = "FutureResult") [18:41:43.035] }, finally = { [18:41:43.035] if (!identical(...future.workdir, getwd())) [18:41:43.035] setwd(...future.workdir) [18:41:43.035] { [18:41:43.035] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.035] ...future.oldOptions$nwarnings <- NULL [18:41:43.035] } [18:41:43.035] base::options(...future.oldOptions) [18:41:43.035] if (.Platform$OS.type == "windows") { [18:41:43.035] old_names <- names(...future.oldEnvVars) [18:41:43.035] envs <- base::Sys.getenv() [18:41:43.035] names <- names(envs) [18:41:43.035] common <- intersect(names, old_names) [18:41:43.035] added <- setdiff(names, old_names) [18:41:43.035] removed <- setdiff(old_names, names) [18:41:43.035] changed <- common[...future.oldEnvVars[common] != [18:41:43.035] envs[common]] [18:41:43.035] NAMES <- toupper(changed) [18:41:43.035] args <- list() [18:41:43.035] for (kk in seq_along(NAMES)) { [18:41:43.035] name <- changed[[kk]] [18:41:43.035] NAME <- NAMES[[kk]] [18:41:43.035] if (name != NAME && is.element(NAME, old_names)) [18:41:43.035] next [18:41:43.035] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.035] } [18:41:43.035] NAMES <- toupper(added) [18:41:43.035] for (kk in seq_along(NAMES)) { [18:41:43.035] name <- added[[kk]] [18:41:43.035] NAME <- NAMES[[kk]] [18:41:43.035] if (name != NAME && is.element(NAME, old_names)) [18:41:43.035] next [18:41:43.035] args[[name]] <- "" [18:41:43.035] } [18:41:43.035] NAMES <- toupper(removed) [18:41:43.035] for (kk in seq_along(NAMES)) { [18:41:43.035] name <- removed[[kk]] [18:41:43.035] NAME <- NAMES[[kk]] [18:41:43.035] if (name != NAME && is.element(NAME, old_names)) [18:41:43.035] next [18:41:43.035] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.035] } [18:41:43.035] if (length(args) > 0) [18:41:43.035] base::do.call(base::Sys.setenv, args = args) [18:41:43.035] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.035] } [18:41:43.035] { [18:41:43.035] if (base::length(...future.futureOptionsAdded) > [18:41:43.035] 0L) { [18:41:43.035] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.035] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.035] base::options(opts) [18:41:43.035] } [18:41:43.035] { [18:41:43.035] { [18:41:43.035] NULL [18:41:43.035] RNGkind("Mersenne-Twister") [18:41:43.035] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.035] inherits = FALSE) [18:41:43.035] } [18:41:43.035] options(future.plan = NULL) [18:41:43.035] if (is.na(NA_character_)) [18:41:43.035] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.035] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.035] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.035] .init = FALSE) [18:41:43.035] } [18:41:43.035] } [18:41:43.035] } [18:41:43.035] }) [18:41:43.035] if (TRUE) { [18:41:43.035] base::sink(type = "output", split = FALSE) [18:41:43.035] if (TRUE) { [18:41:43.035] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.035] } [18:41:43.035] else { [18:41:43.035] ...future.result["stdout"] <- base::list(NULL) [18:41:43.035] } [18:41:43.035] base::close(...future.stdout) [18:41:43.035] ...future.stdout <- NULL [18:41:43.035] } [18:41:43.035] ...future.result$conditions <- ...future.conditions [18:41:43.035] ...future.result$finished <- base::Sys.time() [18:41:43.035] ...future.result [18:41:43.035] } [18:41:43.041] assign_globals() ... [18:41:43.042] List of 5 [18:41:43.042] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:43.042] $ future.call.arguments : list() [18:41:43.042] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.042] $ ...future.elements_ii :List of 6 [18:41:43.042] ..$ a1: int 1 [18:41:43.042] ..$ a2: int 2 [18:41:43.042] ..$ b1: int 2 [18:41:43.042] ..$ b2: int 3 [18:41:43.042] ..$ c1: int 3 [18:41:43.042] ..$ c2: int 4 [18:41:43.042] $ ...future.seeds_ii : NULL [18:41:43.042] $ ...future.globals.maxSize: NULL [18:41:43.042] - attr(*, "where")=List of 5 [18:41:43.042] ..$ ...future.FUN : [18:41:43.042] ..$ future.call.arguments : [18:41:43.042] ..$ ...future.elements_ii : [18:41:43.042] ..$ ...future.seeds_ii : [18:41:43.042] ..$ ...future.globals.maxSize: [18:41:43.042] - attr(*, "resolved")= logi FALSE [18:41:43.042] - attr(*, "total_size")= num 6664 [18:41:43.042] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.042] - attr(*, "already-done")= logi TRUE [18:41:43.054] - reassign environment for '...future.FUN' [18:41:43.054] - copied '...future.FUN' to environment [18:41:43.054] - copied 'future.call.arguments' to environment [18:41:43.055] - copied '...future.elements_ii' to environment [18:41:43.055] - copied '...future.seeds_ii' to environment [18:41:43.055] - copied '...future.globals.maxSize' to environment [18:41:43.055] assign_globals() ... done [18:41:43.056] plan(): Setting new future strategy stack: [18:41:43.056] List of future strategies: [18:41:43.056] 1. sequential: [18:41:43.056] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.056] - tweaked: FALSE [18:41:43.056] - call: NULL [18:41:43.057] plan(): nbrOfWorkers() = 1 [18:41:43.059] plan(): Setting new future strategy stack: [18:41:43.060] List of future strategies: [18:41:43.060] 1. sequential: [18:41:43.060] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.060] - tweaked: FALSE [18:41:43.060] - call: plan(strategy) [18:41:43.061] plan(): nbrOfWorkers() = 1 [18:41:43.061] SequentialFuture started (and completed) [18:41:43.061] - Launch lazy future ... done [18:41:43.062] run() for 'SequentialFuture' ... done [18:41:43.062] Created future: [18:41:43.062] SequentialFuture: [18:41:43.062] Label: 'future_sapply-1' [18:41:43.062] Expression: [18:41:43.062] { [18:41:43.062] do.call(function(...) { [18:41:43.062] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.062] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.062] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.062] on.exit(options(oopts), add = TRUE) [18:41:43.062] } [18:41:43.062] { [18:41:43.062] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.062] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.062] ...future.FUN(...future.X_jj, ...) [18:41:43.062] }) [18:41:43.062] } [18:41:43.062] }, args = future.call.arguments) [18:41:43.062] } [18:41:43.062] Lazy evaluation: FALSE [18:41:43.062] Asynchronous evaluation: FALSE [18:41:43.062] Local evaluation: TRUE [18:41:43.062] Environment: R_GlobalEnv [18:41:43.062] Capture standard output: TRUE [18:41:43.062] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.062] Globals: 5 objects totaling 1.10 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 196 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.062] Packages: [18:41:43.062] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.062] Resolved: TRUE [18:41:43.062] Value: 978 bytes of class 'list' [18:41:43.062] Early signaling: FALSE [18:41:43.062] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.062] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.064] Chunk #1 of 1 ... DONE [18:41:43.064] Launching 1 futures (chunks) ... DONE [18:41:43.064] Resolving 1 futures (chunks) ... [18:41:43.065] resolve() on list ... [18:41:43.065] recursive: 0 [18:41:43.065] length: 1 [18:41:43.065] [18:41:43.066] resolved() for 'SequentialFuture' ... [18:41:43.066] - state: 'finished' [18:41:43.066] - run: TRUE [18:41:43.067] - result: 'FutureResult' [18:41:43.067] resolved() for 'SequentialFuture' ... done [18:41:43.067] Future #1 [18:41:43.068] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.068] - nx: 1 [18:41:43.068] - relay: TRUE [18:41:43.068] - stdout: TRUE [18:41:43.069] - signal: TRUE [18:41:43.069] - resignal: FALSE [18:41:43.069] - force: TRUE [18:41:43.069] - relayed: [n=1] FALSE [18:41:43.069] - queued futures: [n=1] FALSE [18:41:43.070] - until=1 [18:41:43.070] - relaying element #1 [18:41:43.070] - relayed: [n=1] TRUE [18:41:43.071] - queued futures: [n=1] TRUE [18:41:43.071] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.071] length: 0 (resolved future 1) [18:41:43.072] Relaying remaining futures [18:41:43.072] signalConditionsASAP(NULL, pos=0) ... [18:41:43.072] - nx: 1 [18:41:43.072] - relay: TRUE [18:41:43.073] - stdout: TRUE [18:41:43.073] - signal: TRUE [18:41:43.073] - resignal: FALSE [18:41:43.073] - force: TRUE [18:41:43.074] - relayed: [n=1] TRUE [18:41:43.074] - queued futures: [n=1] TRUE - flush all [18:41:43.074] - relayed: [n=1] TRUE [18:41:43.074] - queued futures: [n=1] TRUE [18:41:43.075] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.075] resolve() on list ... DONE [18:41:43.075] - Number of value chunks collected: 1 [18:41:43.076] Resolving 1 futures (chunks) ... DONE [18:41:43.076] Reducing values from 1 chunks ... [18:41:43.076] - Number of values collected after concatenation: 6 [18:41:43.076] - Number of values expected: 6 [18:41:43.077] Reducing values from 1 chunks ... DONE [18:41:43.077] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:43.083] future_lapply() ... [18:41:43.084] Number of chunks: 1 [18:41:43.084] getGlobalsAndPackagesXApply() ... [18:41:43.084] - future.globals: TRUE [18:41:43.085] getGlobalsAndPackages() ... [18:41:43.085] Searching for globals... [18:41:43.087] - globals found: [1] 'FUN' [18:41:43.087] Searching for globals ... DONE [18:41:43.087] Resolving globals: FALSE [18:41:43.088] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.088] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.089] - globals: [1] 'FUN' [18:41:43.089] [18:41:43.089] getGlobalsAndPackages() ... DONE [18:41:43.089] - globals found/used: [n=1] 'FUN' [18:41:43.090] - needed namespaces: [n=0] [18:41:43.090] Finding globals ... DONE [18:41:43.090] - use_args: TRUE [18:41:43.091] - Getting '...' globals ... [18:41:43.091] resolve() on list ... [18:41:43.091] recursive: 0 [18:41:43.092] length: 1 [18:41:43.092] elements: '...' [18:41:43.092] length: 0 (resolved future 1) [18:41:43.093] resolve() on list ... DONE [18:41:43.093] - '...' content: [n=0] [18:41:43.093] List of 1 [18:41:43.093] $ ...: list() [18:41:43.093] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.093] - attr(*, "where")=List of 1 [18:41:43.093] ..$ ...: [18:41:43.093] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.093] - attr(*, "resolved")= logi TRUE [18:41:43.093] - attr(*, "total_size")= num NA [18:41:43.098] - Getting '...' globals ... DONE [18:41:43.098] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.098] List of 2 [18:41:43.098] $ ...future.FUN:function (x) [18:41:43.098] $ ... : list() [18:41:43.098] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.098] - attr(*, "where")=List of 2 [18:41:43.098] ..$ ...future.FUN: [18:41:43.098] ..$ ... : [18:41:43.098] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.098] - attr(*, "resolved")= logi FALSE [18:41:43.098] - attr(*, "total_size")= int 4788 [18:41:43.104] Packages to be attached in all futures: [n=0] [18:41:43.104] getGlobalsAndPackagesXApply() ... DONE [18:41:43.104] Number of futures (= number of chunks): 1 [18:41:43.105] Launching 1 futures (chunks) ... [18:41:43.105] Chunk #1 of 1 ... [18:41:43.105] - Finding globals in 'X' for chunk #1 ... [18:41:43.105] getGlobalsAndPackages() ... [18:41:43.106] Searching for globals... [18:41:43.106] [18:41:43.106] Searching for globals ... DONE [18:41:43.107] - globals: [0] [18:41:43.107] getGlobalsAndPackages() ... DONE [18:41:43.107] + additional globals found: [n=0] [18:41:43.108] + additional namespaces needed: [n=0] [18:41:43.108] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.108] - seeds: [18:41:43.108] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.109] getGlobalsAndPackages() ... [18:41:43.109] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.109] Resolving globals: FALSE [18:41:43.109] Tweak future expression to call with '...' arguments ... [18:41:43.110] { [18:41:43.110] do.call(function(...) { [18:41:43.110] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.110] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.110] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.110] on.exit(options(oopts), add = TRUE) [18:41:43.110] } [18:41:43.110] { [18:41:43.110] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.110] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.110] ...future.FUN(...future.X_jj, ...) [18:41:43.110] }) [18:41:43.110] } [18:41:43.110] }, args = future.call.arguments) [18:41:43.110] } [18:41:43.110] Tweak future expression to call with '...' arguments ... DONE [18:41:43.111] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.112] [18:41:43.112] getGlobalsAndPackages() ... DONE [18:41:43.112] run() for 'Future' ... [18:41:43.113] - state: 'created' [18:41:43.113] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.114] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.114] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.114] - Field: 'label' [18:41:43.115] - Field: 'local' [18:41:43.115] - Field: 'owner' [18:41:43.115] - Field: 'envir' [18:41:43.116] - Field: 'packages' [18:41:43.116] - Field: 'gc' [18:41:43.116] - Field: 'conditions' [18:41:43.116] - Field: 'expr' [18:41:43.117] - Field: 'uuid' [18:41:43.117] - Field: 'seed' [18:41:43.117] - Field: 'version' [18:41:43.118] - Field: 'result' [18:41:43.118] - Field: 'asynchronous' [18:41:43.118] - Field: 'calls' [18:41:43.118] - Field: 'globals' [18:41:43.119] - Field: 'stdout' [18:41:43.119] - Field: 'earlySignal' [18:41:43.119] - Field: 'lazy' [18:41:43.120] - Field: 'state' [18:41:43.120] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.120] - Launch lazy future ... [18:41:43.121] Packages needed by the future expression (n = 0): [18:41:43.121] Packages needed by future strategies (n = 0): [18:41:43.122] { [18:41:43.122] { [18:41:43.122] { [18:41:43.122] ...future.startTime <- base::Sys.time() [18:41:43.122] { [18:41:43.122] { [18:41:43.122] { [18:41:43.122] base::local({ [18:41:43.122] has_future <- base::requireNamespace("future", [18:41:43.122] quietly = TRUE) [18:41:43.122] if (has_future) { [18:41:43.122] ns <- base::getNamespace("future") [18:41:43.122] version <- ns[[".package"]][["version"]] [18:41:43.122] if (is.null(version)) [18:41:43.122] version <- utils::packageVersion("future") [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] version <- NULL [18:41:43.122] } [18:41:43.122] if (!has_future || version < "1.8.0") { [18:41:43.122] info <- base::c(r_version = base::gsub("R version ", [18:41:43.122] "", base::R.version$version.string), [18:41:43.122] platform = base::sprintf("%s (%s-bit)", [18:41:43.122] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.122] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.122] "release", "version")], collapse = " "), [18:41:43.122] hostname = base::Sys.info()[["nodename"]]) [18:41:43.122] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.122] info) [18:41:43.122] info <- base::paste(info, collapse = "; ") [18:41:43.122] if (!has_future) { [18:41:43.122] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.122] info) [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.122] info, version) [18:41:43.122] } [18:41:43.122] base::stop(msg) [18:41:43.122] } [18:41:43.122] }) [18:41:43.122] } [18:41:43.122] ...future.strategy.old <- future::plan("list") [18:41:43.122] options(future.plan = NULL) [18:41:43.122] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.122] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.122] } [18:41:43.122] ...future.workdir <- getwd() [18:41:43.122] } [18:41:43.122] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.122] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.122] } [18:41:43.122] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.122] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.122] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.122] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.122] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.122] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.122] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.122] base::names(...future.oldOptions)) [18:41:43.122] } [18:41:43.122] if (FALSE) { [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] if (TRUE) { [18:41:43.122] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.122] open = "w") [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.122] windows = "NUL", "/dev/null"), open = "w") [18:41:43.122] } [18:41:43.122] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.122] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.122] base::sink(type = "output", split = FALSE) [18:41:43.122] base::close(...future.stdout) [18:41:43.122] }, add = TRUE) [18:41:43.122] } [18:41:43.122] ...future.frame <- base::sys.nframe() [18:41:43.122] ...future.conditions <- base::list() [18:41:43.122] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.122] if (FALSE) { [18:41:43.122] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.122] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.122] } [18:41:43.122] ...future.result <- base::tryCatch({ [18:41:43.122] base::withCallingHandlers({ [18:41:43.122] ...future.value <- base::withVisible(base::local({ [18:41:43.122] do.call(function(...) { [18:41:43.122] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.122] if (!identical(...future.globals.maxSize.org, [18:41:43.122] ...future.globals.maxSize)) { [18:41:43.122] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.122] on.exit(options(oopts), add = TRUE) [18:41:43.122] } [18:41:43.122] { [18:41:43.122] lapply(seq_along(...future.elements_ii), [18:41:43.122] FUN = function(jj) { [18:41:43.122] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.122] ...future.FUN(...future.X_jj, ...) [18:41:43.122] }) [18:41:43.122] } [18:41:43.122] }, args = future.call.arguments) [18:41:43.122] })) [18:41:43.122] future::FutureResult(value = ...future.value$value, [18:41:43.122] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.122] ...future.rng), globalenv = if (FALSE) [18:41:43.122] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.122] ...future.globalenv.names)) [18:41:43.122] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.122] }, condition = base::local({ [18:41:43.122] c <- base::c [18:41:43.122] inherits <- base::inherits [18:41:43.122] invokeRestart <- base::invokeRestart [18:41:43.122] length <- base::length [18:41:43.122] list <- base::list [18:41:43.122] seq.int <- base::seq.int [18:41:43.122] signalCondition <- base::signalCondition [18:41:43.122] sys.calls <- base::sys.calls [18:41:43.122] `[[` <- base::`[[` [18:41:43.122] `+` <- base::`+` [18:41:43.122] `<<-` <- base::`<<-` [18:41:43.122] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.122] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.122] 3L)] [18:41:43.122] } [18:41:43.122] function(cond) { [18:41:43.122] is_error <- inherits(cond, "error") [18:41:43.122] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.122] NULL) [18:41:43.122] if (is_error) { [18:41:43.122] sessionInformation <- function() { [18:41:43.122] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.122] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.122] search = base::search(), system = base::Sys.info()) [18:41:43.122] } [18:41:43.122] ...future.conditions[[length(...future.conditions) + [18:41:43.122] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.122] cond$call), session = sessionInformation(), [18:41:43.122] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.122] signalCondition(cond) [18:41:43.122] } [18:41:43.122] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.122] "immediateCondition"))) { [18:41:43.122] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.122] ...future.conditions[[length(...future.conditions) + [18:41:43.122] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.122] if (TRUE && !signal) { [18:41:43.122] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.122] { [18:41:43.122] inherits <- base::inherits [18:41:43.122] invokeRestart <- base::invokeRestart [18:41:43.122] is.null <- base::is.null [18:41:43.122] muffled <- FALSE [18:41:43.122] if (inherits(cond, "message")) { [18:41:43.122] muffled <- grepl(pattern, "muffleMessage") [18:41:43.122] if (muffled) [18:41:43.122] invokeRestart("muffleMessage") [18:41:43.122] } [18:41:43.122] else if (inherits(cond, "warning")) { [18:41:43.122] muffled <- grepl(pattern, "muffleWarning") [18:41:43.122] if (muffled) [18:41:43.122] invokeRestart("muffleWarning") [18:41:43.122] } [18:41:43.122] else if (inherits(cond, "condition")) { [18:41:43.122] if (!is.null(pattern)) { [18:41:43.122] computeRestarts <- base::computeRestarts [18:41:43.122] grepl <- base::grepl [18:41:43.122] restarts <- computeRestarts(cond) [18:41:43.122] for (restart in restarts) { [18:41:43.122] name <- restart$name [18:41:43.122] if (is.null(name)) [18:41:43.122] next [18:41:43.122] if (!grepl(pattern, name)) [18:41:43.122] next [18:41:43.122] invokeRestart(restart) [18:41:43.122] muffled <- TRUE [18:41:43.122] break [18:41:43.122] } [18:41:43.122] } [18:41:43.122] } [18:41:43.122] invisible(muffled) [18:41:43.122] } [18:41:43.122] muffleCondition(cond, pattern = "^muffle") [18:41:43.122] } [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] if (TRUE) { [18:41:43.122] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.122] { [18:41:43.122] inherits <- base::inherits [18:41:43.122] invokeRestart <- base::invokeRestart [18:41:43.122] is.null <- base::is.null [18:41:43.122] muffled <- FALSE [18:41:43.122] if (inherits(cond, "message")) { [18:41:43.122] muffled <- grepl(pattern, "muffleMessage") [18:41:43.122] if (muffled) [18:41:43.122] invokeRestart("muffleMessage") [18:41:43.122] } [18:41:43.122] else if (inherits(cond, "warning")) { [18:41:43.122] muffled <- grepl(pattern, "muffleWarning") [18:41:43.122] if (muffled) [18:41:43.122] invokeRestart("muffleWarning") [18:41:43.122] } [18:41:43.122] else if (inherits(cond, "condition")) { [18:41:43.122] if (!is.null(pattern)) { [18:41:43.122] computeRestarts <- base::computeRestarts [18:41:43.122] grepl <- base::grepl [18:41:43.122] restarts <- computeRestarts(cond) [18:41:43.122] for (restart in restarts) { [18:41:43.122] name <- restart$name [18:41:43.122] if (is.null(name)) [18:41:43.122] next [18:41:43.122] if (!grepl(pattern, name)) [18:41:43.122] next [18:41:43.122] invokeRestart(restart) [18:41:43.122] muffled <- TRUE [18:41:43.122] break [18:41:43.122] } [18:41:43.122] } [18:41:43.122] } [18:41:43.122] invisible(muffled) [18:41:43.122] } [18:41:43.122] muffleCondition(cond, pattern = "^muffle") [18:41:43.122] } [18:41:43.122] } [18:41:43.122] } [18:41:43.122] })) [18:41:43.122] }, error = function(ex) { [18:41:43.122] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.122] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.122] ...future.rng), started = ...future.startTime, [18:41:43.122] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.122] version = "1.8"), class = "FutureResult") [18:41:43.122] }, finally = { [18:41:43.122] if (!identical(...future.workdir, getwd())) [18:41:43.122] setwd(...future.workdir) [18:41:43.122] { [18:41:43.122] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.122] ...future.oldOptions$nwarnings <- NULL [18:41:43.122] } [18:41:43.122] base::options(...future.oldOptions) [18:41:43.122] if (.Platform$OS.type == "windows") { [18:41:43.122] old_names <- names(...future.oldEnvVars) [18:41:43.122] envs <- base::Sys.getenv() [18:41:43.122] names <- names(envs) [18:41:43.122] common <- intersect(names, old_names) [18:41:43.122] added <- setdiff(names, old_names) [18:41:43.122] removed <- setdiff(old_names, names) [18:41:43.122] changed <- common[...future.oldEnvVars[common] != [18:41:43.122] envs[common]] [18:41:43.122] NAMES <- toupper(changed) [18:41:43.122] args <- list() [18:41:43.122] for (kk in seq_along(NAMES)) { [18:41:43.122] name <- changed[[kk]] [18:41:43.122] NAME <- NAMES[[kk]] [18:41:43.122] if (name != NAME && is.element(NAME, old_names)) [18:41:43.122] next [18:41:43.122] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.122] } [18:41:43.122] NAMES <- toupper(added) [18:41:43.122] for (kk in seq_along(NAMES)) { [18:41:43.122] name <- added[[kk]] [18:41:43.122] NAME <- NAMES[[kk]] [18:41:43.122] if (name != NAME && is.element(NAME, old_names)) [18:41:43.122] next [18:41:43.122] args[[name]] <- "" [18:41:43.122] } [18:41:43.122] NAMES <- toupper(removed) [18:41:43.122] for (kk in seq_along(NAMES)) { [18:41:43.122] name <- removed[[kk]] [18:41:43.122] NAME <- NAMES[[kk]] [18:41:43.122] if (name != NAME && is.element(NAME, old_names)) [18:41:43.122] next [18:41:43.122] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.122] } [18:41:43.122] if (length(args) > 0) [18:41:43.122] base::do.call(base::Sys.setenv, args = args) [18:41:43.122] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.122] } [18:41:43.122] { [18:41:43.122] if (base::length(...future.futureOptionsAdded) > [18:41:43.122] 0L) { [18:41:43.122] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.122] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.122] base::options(opts) [18:41:43.122] } [18:41:43.122] { [18:41:43.122] { [18:41:43.122] NULL [18:41:43.122] RNGkind("Mersenne-Twister") [18:41:43.122] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.122] inherits = FALSE) [18:41:43.122] } [18:41:43.122] options(future.plan = NULL) [18:41:43.122] if (is.na(NA_character_)) [18:41:43.122] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.122] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.122] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.122] .init = FALSE) [18:41:43.122] } [18:41:43.122] } [18:41:43.122] } [18:41:43.122] }) [18:41:43.122] if (TRUE) { [18:41:43.122] base::sink(type = "output", split = FALSE) [18:41:43.122] if (TRUE) { [18:41:43.122] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.122] } [18:41:43.122] else { [18:41:43.122] ...future.result["stdout"] <- base::list(NULL) [18:41:43.122] } [18:41:43.122] base::close(...future.stdout) [18:41:43.122] ...future.stdout <- NULL [18:41:43.122] } [18:41:43.122] ...future.result$conditions <- ...future.conditions [18:41:43.122] ...future.result$finished <- base::Sys.time() [18:41:43.122] ...future.result [18:41:43.122] } [18:41:43.128] assign_globals() ... [18:41:43.129] List of 5 [18:41:43.129] $ ...future.FUN :function (x) [18:41:43.129] $ future.call.arguments : list() [18:41:43.129] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.129] $ ...future.elements_ii :List of 3 [18:41:43.129] ..$ : chr "a" [18:41:43.129] ..$ : chr "b" [18:41:43.129] ..$ : chr "c" [18:41:43.129] $ ...future.seeds_ii : NULL [18:41:43.129] $ ...future.globals.maxSize: NULL [18:41:43.129] - attr(*, "where")=List of 5 [18:41:43.129] ..$ ...future.FUN : [18:41:43.129] ..$ future.call.arguments : [18:41:43.129] ..$ ...future.elements_ii : [18:41:43.129] ..$ ...future.seeds_ii : [18:41:43.129] ..$ ...future.globals.maxSize: [18:41:43.129] - attr(*, "resolved")= logi FALSE [18:41:43.129] - attr(*, "total_size")= num 4788 [18:41:43.129] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.129] - attr(*, "already-done")= logi TRUE [18:41:43.139] - copied '...future.FUN' to environment [18:41:43.139] - copied 'future.call.arguments' to environment [18:41:43.139] - copied '...future.elements_ii' to environment [18:41:43.140] - copied '...future.seeds_ii' to environment [18:41:43.140] - copied '...future.globals.maxSize' to environment [18:41:43.140] assign_globals() ... done [18:41:43.141] plan(): Setting new future strategy stack: [18:41:43.141] List of future strategies: [18:41:43.141] 1. sequential: [18:41:43.141] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.141] - tweaked: FALSE [18:41:43.141] - call: NULL [18:41:43.142] plan(): nbrOfWorkers() = 1 [18:41:43.144] plan(): Setting new future strategy stack: [18:41:43.144] List of future strategies: [18:41:43.144] 1. sequential: [18:41:43.144] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.144] - tweaked: FALSE [18:41:43.144] - call: plan(strategy) [18:41:43.145] plan(): nbrOfWorkers() = 1 [18:41:43.146] SequentialFuture started (and completed) [18:41:43.146] - Launch lazy future ... done [18:41:43.146] run() for 'SequentialFuture' ... done [18:41:43.147] Created future: [18:41:43.147] SequentialFuture: [18:41:43.147] Label: 'future_sapply-1' [18:41:43.147] Expression: [18:41:43.147] { [18:41:43.147] do.call(function(...) { [18:41:43.147] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.147] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.147] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.147] on.exit(options(oopts), add = TRUE) [18:41:43.147] } [18:41:43.147] { [18:41:43.147] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.147] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.147] ...future.FUN(...future.X_jj, ...) [18:41:43.147] }) [18:41:43.147] } [18:41:43.147] }, args = future.call.arguments) [18:41:43.147] } [18:41:43.147] Lazy evaluation: FALSE [18:41:43.147] Asynchronous evaluation: FALSE [18:41:43.147] Local evaluation: TRUE [18:41:43.147] Environment: R_GlobalEnv [18:41:43.147] Capture standard output: TRUE [18:41:43.147] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.147] Globals: 5 objects totaling 418 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.147] Packages: [18:41:43.147] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.147] Resolved: TRUE [18:41:43.147] Value: 82 bytes of class 'list' [18:41:43.147] Early signaling: FALSE [18:41:43.147] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.147] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.149] Chunk #1 of 1 ... DONE [18:41:43.149] Launching 1 futures (chunks) ... DONE [18:41:43.149] Resolving 1 futures (chunks) ... [18:41:43.150] resolve() on list ... [18:41:43.153] recursive: 0 [18:41:43.153] length: 1 [18:41:43.153] [18:41:43.154] resolved() for 'SequentialFuture' ... [18:41:43.154] - state: 'finished' [18:41:43.154] - run: TRUE [18:41:43.155] - result: 'FutureResult' [18:41:43.155] resolved() for 'SequentialFuture' ... done [18:41:43.155] Future #1 [18:41:43.156] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.156] - nx: 1 [18:41:43.156] - relay: TRUE [18:41:43.156] - stdout: TRUE [18:41:43.157] - signal: TRUE [18:41:43.157] - resignal: FALSE [18:41:43.157] - force: TRUE [18:41:43.157] - relayed: [n=1] FALSE [18:41:43.158] - queued futures: [n=1] FALSE [18:41:43.158] - until=1 [18:41:43.158] - relaying element #1 [18:41:43.159] - relayed: [n=1] TRUE [18:41:43.159] - queued futures: [n=1] TRUE [18:41:43.159] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.159] length: 0 (resolved future 1) [18:41:43.160] Relaying remaining futures [18:41:43.160] signalConditionsASAP(NULL, pos=0) ... [18:41:43.160] - nx: 1 [18:41:43.160] - relay: TRUE [18:41:43.161] - stdout: TRUE [18:41:43.161] - signal: TRUE [18:41:43.161] - resignal: FALSE [18:41:43.161] - force: TRUE [18:41:43.162] - relayed: [n=1] TRUE [18:41:43.162] - queued futures: [n=1] TRUE - flush all [18:41:43.162] - relayed: [n=1] TRUE [18:41:43.162] - queued futures: [n=1] TRUE [18:41:43.163] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.163] resolve() on list ... DONE [18:41:43.163] - Number of value chunks collected: 1 [18:41:43.164] Resolving 1 futures (chunks) ... DONE [18:41:43.164] Reducing values from 1 chunks ... [18:41:43.164] - Number of values collected after concatenation: 3 [18:41:43.164] - Number of values expected: 3 [18:41:43.165] Reducing values from 1 chunks ... DONE [18:41:43.165] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" $ y1:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" List of 2 $ y0:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" $ y2:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" [18:41:43.174] future_lapply() ... [18:41:43.175] Number of chunks: 1 [18:41:43.175] getGlobalsAndPackagesXApply() ... [18:41:43.175] - future.globals: TRUE [18:41:43.175] getGlobalsAndPackages() ... [18:41:43.176] Searching for globals... [18:41:43.178] - globals found: [2] 'FUN', 'UseMethod' [18:41:43.178] Searching for globals ... DONE [18:41:43.178] Resolving globals: FALSE [18:41:43.179] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:43.180] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:43.180] - globals: [1] 'FUN' [18:41:43.180] [18:41:43.180] getGlobalsAndPackages() ... DONE [18:41:43.181] - globals found/used: [n=1] 'FUN' [18:41:43.181] - needed namespaces: [n=0] [18:41:43.181] Finding globals ... DONE [18:41:43.181] - use_args: TRUE [18:41:43.182] - Getting '...' globals ... [18:41:43.182] resolve() on list ... [18:41:43.183] recursive: 0 [18:41:43.183] length: 1 [18:41:43.183] elements: '...' [18:41:43.183] length: 0 (resolved future 1) [18:41:43.184] resolve() on list ... DONE [18:41:43.184] - '...' content: [n=0] [18:41:43.184] List of 1 [18:41:43.184] $ ...: list() [18:41:43.184] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.184] - attr(*, "where")=List of 1 [18:41:43.184] ..$ ...: [18:41:43.184] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.184] - attr(*, "resolved")= logi TRUE [18:41:43.184] - attr(*, "total_size")= num NA [18:41:43.189] - Getting '...' globals ... DONE [18:41:43.189] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.189] List of 2 [18:41:43.189] $ ...future.FUN:function (x, ...) [18:41:43.189] $ ... : list() [18:41:43.189] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.189] - attr(*, "where")=List of 2 [18:41:43.189] ..$ ...future.FUN: [18:41:43.189] ..$ ... : [18:41:43.189] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.189] - attr(*, "resolved")= logi FALSE [18:41:43.189] - attr(*, "total_size")= int 5028 [18:41:43.195] Packages to be attached in all futures: [n=0] [18:41:43.195] getGlobalsAndPackagesXApply() ... DONE [18:41:43.195] Number of futures (= number of chunks): 1 [18:41:43.196] Launching 1 futures (chunks) ... [18:41:43.196] Chunk #1 of 1 ... [18:41:43.196] - Finding globals in 'X' for chunk #1 ... [18:41:43.196] getGlobalsAndPackages() ... [18:41:43.197] Searching for globals... [18:41:43.197] [18:41:43.197] Searching for globals ... DONE [18:41:43.198] - globals: [0] [18:41:43.198] getGlobalsAndPackages() ... DONE [18:41:43.198] + additional globals found: [n=0] [18:41:43.198] + additional namespaces needed: [n=0] [18:41:43.199] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.199] - seeds: [18:41:43.199] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.200] getGlobalsAndPackages() ... [18:41:43.200] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.200] Resolving globals: FALSE [18:41:43.200] Tweak future expression to call with '...' arguments ... [18:41:43.201] { [18:41:43.201] do.call(function(...) { [18:41:43.201] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.201] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.201] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.201] on.exit(options(oopts), add = TRUE) [18:41:43.201] } [18:41:43.201] { [18:41:43.201] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.201] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.201] ...future.FUN(...future.X_jj, ...) [18:41:43.201] }) [18:41:43.201] } [18:41:43.201] }, args = future.call.arguments) [18:41:43.201] } [18:41:43.201] Tweak future expression to call with '...' arguments ... DONE [18:41:43.202] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.202] [18:41:43.203] getGlobalsAndPackages() ... DONE [18:41:43.203] run() for 'Future' ... [18:41:43.204] - state: 'created' [18:41:43.204] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.204] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.205] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.205] - Field: 'label' [18:41:43.205] - Field: 'local' [18:41:43.206] - Field: 'owner' [18:41:43.206] - Field: 'envir' [18:41:43.206] - Field: 'packages' [18:41:43.207] - Field: 'gc' [18:41:43.207] - Field: 'conditions' [18:41:43.207] - Field: 'expr' [18:41:43.207] - Field: 'uuid' [18:41:43.208] - Field: 'seed' [18:41:43.208] - Field: 'version' [18:41:43.208] - Field: 'result' [18:41:43.209] - Field: 'asynchronous' [18:41:43.209] - Field: 'calls' [18:41:43.209] - Field: 'globals' [18:41:43.209] - Field: 'stdout' [18:41:43.210] - Field: 'earlySignal' [18:41:43.210] - Field: 'lazy' [18:41:43.210] - Field: 'state' [18:41:43.210] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.211] - Launch lazy future ... [18:41:43.211] Packages needed by the future expression (n = 0): [18:41:43.211] Packages needed by future strategies (n = 0): [18:41:43.212] { [18:41:43.212] { [18:41:43.212] { [18:41:43.212] ...future.startTime <- base::Sys.time() [18:41:43.212] { [18:41:43.212] { [18:41:43.212] { [18:41:43.212] base::local({ [18:41:43.212] has_future <- base::requireNamespace("future", [18:41:43.212] quietly = TRUE) [18:41:43.212] if (has_future) { [18:41:43.212] ns <- base::getNamespace("future") [18:41:43.212] version <- ns[[".package"]][["version"]] [18:41:43.212] if (is.null(version)) [18:41:43.212] version <- utils::packageVersion("future") [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] version <- NULL [18:41:43.212] } [18:41:43.212] if (!has_future || version < "1.8.0") { [18:41:43.212] info <- base::c(r_version = base::gsub("R version ", [18:41:43.212] "", base::R.version$version.string), [18:41:43.212] platform = base::sprintf("%s (%s-bit)", [18:41:43.212] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.212] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.212] "release", "version")], collapse = " "), [18:41:43.212] hostname = base::Sys.info()[["nodename"]]) [18:41:43.212] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.212] info) [18:41:43.212] info <- base::paste(info, collapse = "; ") [18:41:43.212] if (!has_future) { [18:41:43.212] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.212] info) [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.212] info, version) [18:41:43.212] } [18:41:43.212] base::stop(msg) [18:41:43.212] } [18:41:43.212] }) [18:41:43.212] } [18:41:43.212] ...future.strategy.old <- future::plan("list") [18:41:43.212] options(future.plan = NULL) [18:41:43.212] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.212] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.212] } [18:41:43.212] ...future.workdir <- getwd() [18:41:43.212] } [18:41:43.212] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.212] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.212] } [18:41:43.212] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.212] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.212] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.212] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.212] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.212] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.212] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.212] base::names(...future.oldOptions)) [18:41:43.212] } [18:41:43.212] if (FALSE) { [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] if (TRUE) { [18:41:43.212] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.212] open = "w") [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.212] windows = "NUL", "/dev/null"), open = "w") [18:41:43.212] } [18:41:43.212] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.212] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.212] base::sink(type = "output", split = FALSE) [18:41:43.212] base::close(...future.stdout) [18:41:43.212] }, add = TRUE) [18:41:43.212] } [18:41:43.212] ...future.frame <- base::sys.nframe() [18:41:43.212] ...future.conditions <- base::list() [18:41:43.212] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.212] if (FALSE) { [18:41:43.212] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.212] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.212] } [18:41:43.212] ...future.result <- base::tryCatch({ [18:41:43.212] base::withCallingHandlers({ [18:41:43.212] ...future.value <- base::withVisible(base::local({ [18:41:43.212] do.call(function(...) { [18:41:43.212] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.212] if (!identical(...future.globals.maxSize.org, [18:41:43.212] ...future.globals.maxSize)) { [18:41:43.212] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.212] on.exit(options(oopts), add = TRUE) [18:41:43.212] } [18:41:43.212] { [18:41:43.212] lapply(seq_along(...future.elements_ii), [18:41:43.212] FUN = function(jj) { [18:41:43.212] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.212] ...future.FUN(...future.X_jj, ...) [18:41:43.212] }) [18:41:43.212] } [18:41:43.212] }, args = future.call.arguments) [18:41:43.212] })) [18:41:43.212] future::FutureResult(value = ...future.value$value, [18:41:43.212] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.212] ...future.rng), globalenv = if (FALSE) [18:41:43.212] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.212] ...future.globalenv.names)) [18:41:43.212] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.212] }, condition = base::local({ [18:41:43.212] c <- base::c [18:41:43.212] inherits <- base::inherits [18:41:43.212] invokeRestart <- base::invokeRestart [18:41:43.212] length <- base::length [18:41:43.212] list <- base::list [18:41:43.212] seq.int <- base::seq.int [18:41:43.212] signalCondition <- base::signalCondition [18:41:43.212] sys.calls <- base::sys.calls [18:41:43.212] `[[` <- base::`[[` [18:41:43.212] `+` <- base::`+` [18:41:43.212] `<<-` <- base::`<<-` [18:41:43.212] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.212] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.212] 3L)] [18:41:43.212] } [18:41:43.212] function(cond) { [18:41:43.212] is_error <- inherits(cond, "error") [18:41:43.212] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.212] NULL) [18:41:43.212] if (is_error) { [18:41:43.212] sessionInformation <- function() { [18:41:43.212] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.212] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.212] search = base::search(), system = base::Sys.info()) [18:41:43.212] } [18:41:43.212] ...future.conditions[[length(...future.conditions) + [18:41:43.212] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.212] cond$call), session = sessionInformation(), [18:41:43.212] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.212] signalCondition(cond) [18:41:43.212] } [18:41:43.212] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.212] "immediateCondition"))) { [18:41:43.212] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.212] ...future.conditions[[length(...future.conditions) + [18:41:43.212] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.212] if (TRUE && !signal) { [18:41:43.212] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.212] { [18:41:43.212] inherits <- base::inherits [18:41:43.212] invokeRestart <- base::invokeRestart [18:41:43.212] is.null <- base::is.null [18:41:43.212] muffled <- FALSE [18:41:43.212] if (inherits(cond, "message")) { [18:41:43.212] muffled <- grepl(pattern, "muffleMessage") [18:41:43.212] if (muffled) [18:41:43.212] invokeRestart("muffleMessage") [18:41:43.212] } [18:41:43.212] else if (inherits(cond, "warning")) { [18:41:43.212] muffled <- grepl(pattern, "muffleWarning") [18:41:43.212] if (muffled) [18:41:43.212] invokeRestart("muffleWarning") [18:41:43.212] } [18:41:43.212] else if (inherits(cond, "condition")) { [18:41:43.212] if (!is.null(pattern)) { [18:41:43.212] computeRestarts <- base::computeRestarts [18:41:43.212] grepl <- base::grepl [18:41:43.212] restarts <- computeRestarts(cond) [18:41:43.212] for (restart in restarts) { [18:41:43.212] name <- restart$name [18:41:43.212] if (is.null(name)) [18:41:43.212] next [18:41:43.212] if (!grepl(pattern, name)) [18:41:43.212] next [18:41:43.212] invokeRestart(restart) [18:41:43.212] muffled <- TRUE [18:41:43.212] break [18:41:43.212] } [18:41:43.212] } [18:41:43.212] } [18:41:43.212] invisible(muffled) [18:41:43.212] } [18:41:43.212] muffleCondition(cond, pattern = "^muffle") [18:41:43.212] } [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] if (TRUE) { [18:41:43.212] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.212] { [18:41:43.212] inherits <- base::inherits [18:41:43.212] invokeRestart <- base::invokeRestart [18:41:43.212] is.null <- base::is.null [18:41:43.212] muffled <- FALSE [18:41:43.212] if (inherits(cond, "message")) { [18:41:43.212] muffled <- grepl(pattern, "muffleMessage") [18:41:43.212] if (muffled) [18:41:43.212] invokeRestart("muffleMessage") [18:41:43.212] } [18:41:43.212] else if (inherits(cond, "warning")) { [18:41:43.212] muffled <- grepl(pattern, "muffleWarning") [18:41:43.212] if (muffled) [18:41:43.212] invokeRestart("muffleWarning") [18:41:43.212] } [18:41:43.212] else if (inherits(cond, "condition")) { [18:41:43.212] if (!is.null(pattern)) { [18:41:43.212] computeRestarts <- base::computeRestarts [18:41:43.212] grepl <- base::grepl [18:41:43.212] restarts <- computeRestarts(cond) [18:41:43.212] for (restart in restarts) { [18:41:43.212] name <- restart$name [18:41:43.212] if (is.null(name)) [18:41:43.212] next [18:41:43.212] if (!grepl(pattern, name)) [18:41:43.212] next [18:41:43.212] invokeRestart(restart) [18:41:43.212] muffled <- TRUE [18:41:43.212] break [18:41:43.212] } [18:41:43.212] } [18:41:43.212] } [18:41:43.212] invisible(muffled) [18:41:43.212] } [18:41:43.212] muffleCondition(cond, pattern = "^muffle") [18:41:43.212] } [18:41:43.212] } [18:41:43.212] } [18:41:43.212] })) [18:41:43.212] }, error = function(ex) { [18:41:43.212] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.212] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.212] ...future.rng), started = ...future.startTime, [18:41:43.212] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.212] version = "1.8"), class = "FutureResult") [18:41:43.212] }, finally = { [18:41:43.212] if (!identical(...future.workdir, getwd())) [18:41:43.212] setwd(...future.workdir) [18:41:43.212] { [18:41:43.212] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.212] ...future.oldOptions$nwarnings <- NULL [18:41:43.212] } [18:41:43.212] base::options(...future.oldOptions) [18:41:43.212] if (.Platform$OS.type == "windows") { [18:41:43.212] old_names <- names(...future.oldEnvVars) [18:41:43.212] envs <- base::Sys.getenv() [18:41:43.212] names <- names(envs) [18:41:43.212] common <- intersect(names, old_names) [18:41:43.212] added <- setdiff(names, old_names) [18:41:43.212] removed <- setdiff(old_names, names) [18:41:43.212] changed <- common[...future.oldEnvVars[common] != [18:41:43.212] envs[common]] [18:41:43.212] NAMES <- toupper(changed) [18:41:43.212] args <- list() [18:41:43.212] for (kk in seq_along(NAMES)) { [18:41:43.212] name <- changed[[kk]] [18:41:43.212] NAME <- NAMES[[kk]] [18:41:43.212] if (name != NAME && is.element(NAME, old_names)) [18:41:43.212] next [18:41:43.212] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.212] } [18:41:43.212] NAMES <- toupper(added) [18:41:43.212] for (kk in seq_along(NAMES)) { [18:41:43.212] name <- added[[kk]] [18:41:43.212] NAME <- NAMES[[kk]] [18:41:43.212] if (name != NAME && is.element(NAME, old_names)) [18:41:43.212] next [18:41:43.212] args[[name]] <- "" [18:41:43.212] } [18:41:43.212] NAMES <- toupper(removed) [18:41:43.212] for (kk in seq_along(NAMES)) { [18:41:43.212] name <- removed[[kk]] [18:41:43.212] NAME <- NAMES[[kk]] [18:41:43.212] if (name != NAME && is.element(NAME, old_names)) [18:41:43.212] next [18:41:43.212] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.212] } [18:41:43.212] if (length(args) > 0) [18:41:43.212] base::do.call(base::Sys.setenv, args = args) [18:41:43.212] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.212] } [18:41:43.212] { [18:41:43.212] if (base::length(...future.futureOptionsAdded) > [18:41:43.212] 0L) { [18:41:43.212] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.212] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.212] base::options(opts) [18:41:43.212] } [18:41:43.212] { [18:41:43.212] { [18:41:43.212] NULL [18:41:43.212] RNGkind("Mersenne-Twister") [18:41:43.212] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.212] inherits = FALSE) [18:41:43.212] } [18:41:43.212] options(future.plan = NULL) [18:41:43.212] if (is.na(NA_character_)) [18:41:43.212] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.212] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.212] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.212] .init = FALSE) [18:41:43.212] } [18:41:43.212] } [18:41:43.212] } [18:41:43.212] }) [18:41:43.212] if (TRUE) { [18:41:43.212] base::sink(type = "output", split = FALSE) [18:41:43.212] if (TRUE) { [18:41:43.212] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.212] } [18:41:43.212] else { [18:41:43.212] ...future.result["stdout"] <- base::list(NULL) [18:41:43.212] } [18:41:43.212] base::close(...future.stdout) [18:41:43.212] ...future.stdout <- NULL [18:41:43.212] } [18:41:43.212] ...future.result$conditions <- ...future.conditions [18:41:43.212] ...future.result$finished <- base::Sys.time() [18:41:43.212] ...future.result [18:41:43.212] } [18:41:43.219] assign_globals() ... [18:41:43.219] List of 5 [18:41:43.219] $ ...future.FUN :function (x, ...) [18:41:43.219] $ future.call.arguments : list() [18:41:43.219] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.219] $ ...future.elements_ii :List of 3 [18:41:43.219] ..$ : chr "a" [18:41:43.219] ..$ : chr "b" [18:41:43.219] ..$ : chr "c" [18:41:43.219] $ ...future.seeds_ii : NULL [18:41:43.219] $ ...future.globals.maxSize: NULL [18:41:43.219] - attr(*, "where")=List of 5 [18:41:43.219] ..$ ...future.FUN : [18:41:43.219] ..$ future.call.arguments : [18:41:43.219] ..$ ...future.elements_ii : [18:41:43.219] ..$ ...future.seeds_ii : [18:41:43.219] ..$ ...future.globals.maxSize: [18:41:43.219] - attr(*, "resolved")= logi FALSE [18:41:43.219] - attr(*, "total_size")= num 5028 [18:41:43.219] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.219] - attr(*, "already-done")= logi TRUE [18:41:43.229] - copied '...future.FUN' to environment [18:41:43.229] - copied 'future.call.arguments' to environment [18:41:43.230] - copied '...future.elements_ii' to environment [18:41:43.230] - copied '...future.seeds_ii' to environment [18:41:43.230] - copied '...future.globals.maxSize' to environment [18:41:43.230] assign_globals() ... done [18:41:43.231] plan(): Setting new future strategy stack: [18:41:43.231] List of future strategies: [18:41:43.231] 1. sequential: [18:41:43.231] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.231] - tweaked: FALSE [18:41:43.231] - call: NULL [18:41:43.232] plan(): nbrOfWorkers() = 1 [18:41:43.234] plan(): Setting new future strategy stack: [18:41:43.234] List of future strategies: [18:41:43.234] 1. sequential: [18:41:43.234] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.234] - tweaked: FALSE [18:41:43.234] - call: plan(strategy) [18:41:43.235] plan(): nbrOfWorkers() = 1 [18:41:43.236] SequentialFuture started (and completed) [18:41:43.236] - Launch lazy future ... done [18:41:43.236] run() for 'SequentialFuture' ... done [18:41:43.237] Created future: [18:41:43.237] SequentialFuture: [18:41:43.237] Label: 'future_sapply-1' [18:41:43.237] Expression: [18:41:43.237] { [18:41:43.237] do.call(function(...) { [18:41:43.237] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.237] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.237] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.237] on.exit(options(oopts), add = TRUE) [18:41:43.237] } [18:41:43.237] { [18:41:43.237] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.237] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.237] ...future.FUN(...future.X_jj, ...) [18:41:43.237] }) [18:41:43.237] } [18:41:43.237] }, args = future.call.arguments) [18:41:43.237] } [18:41:43.237] Lazy evaluation: FALSE [18:41:43.237] Asynchronous evaluation: FALSE [18:41:43.237] Local evaluation: TRUE [18:41:43.237] Environment: R_GlobalEnv [18:41:43.237] Capture standard output: TRUE [18:41:43.237] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.237] Globals: 5 objects totaling 511 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.237] Packages: [18:41:43.237] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.237] Resolved: TRUE [18:41:43.237] Value: 177 bytes of class 'list' [18:41:43.237] Early signaling: FALSE [18:41:43.237] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.237] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.239] Chunk #1 of 1 ... DONE [18:41:43.239] Launching 1 futures (chunks) ... DONE [18:41:43.239] Resolving 1 futures (chunks) ... [18:41:43.239] resolve() on list ... [18:41:43.240] recursive: 0 [18:41:43.240] length: 1 [18:41:43.240] [18:41:43.240] resolved() for 'SequentialFuture' ... [18:41:43.241] - state: 'finished' [18:41:43.241] - run: TRUE [18:41:43.241] - result: 'FutureResult' [18:41:43.242] resolved() for 'SequentialFuture' ... done [18:41:43.242] Future #1 [18:41:43.242] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.243] - nx: 1 [18:41:43.243] - relay: TRUE [18:41:43.243] - stdout: TRUE [18:41:43.243] - signal: TRUE [18:41:43.244] - resignal: FALSE [18:41:43.244] - force: TRUE [18:41:43.244] - relayed: [n=1] FALSE [18:41:43.244] - queued futures: [n=1] FALSE [18:41:43.245] - until=1 [18:41:43.245] - relaying element #1 [18:41:43.245] - relayed: [n=1] TRUE [18:41:43.246] - queued futures: [n=1] TRUE [18:41:43.246] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.246] length: 0 (resolved future 1) [18:41:43.246] Relaying remaining futures [18:41:43.247] signalConditionsASAP(NULL, pos=0) ... [18:41:43.247] - nx: 1 [18:41:43.247] - relay: TRUE [18:41:43.247] - stdout: TRUE [18:41:43.248] - signal: TRUE [18:41:43.248] - resignal: FALSE [18:41:43.248] - force: TRUE [18:41:43.248] - relayed: [n=1] TRUE [18:41:43.249] - queued futures: [n=1] TRUE - flush all [18:41:43.249] - relayed: [n=1] TRUE [18:41:43.249] - queued futures: [n=1] TRUE [18:41:43.249] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.250] resolve() on list ... DONE [18:41:43.250] - Number of value chunks collected: 1 [18:41:43.250] Resolving 1 futures (chunks) ... DONE [18:41:43.251] Reducing values from 1 chunks ... [18:41:43.251] - Number of values collected after concatenation: 3 [18:41:43.251] - Number of values expected: 3 [18:41:43.251] Reducing values from 1 chunks ... DONE [18:41:43.252] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" $ y1:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" List of 2 $ y0:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" $ y2:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" [18:41:43.261] future_lapply() ... [18:41:43.262] Number of chunks: 1 [18:41:43.262] getGlobalsAndPackagesXApply() ... [18:41:43.263] - future.globals: TRUE [18:41:43.263] getGlobalsAndPackages() ... [18:41:43.263] Searching for globals... [18:41:43.265] - globals found: [1] 'FUN' [18:41:43.265] Searching for globals ... DONE [18:41:43.265] Resolving globals: FALSE [18:41:43.266] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.267] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.267] - globals: [1] 'FUN' [18:41:43.267] [18:41:43.268] getGlobalsAndPackages() ... DONE [18:41:43.268] - globals found/used: [n=1] 'FUN' [18:41:43.268] - needed namespaces: [n=0] [18:41:43.268] Finding globals ... DONE [18:41:43.269] - use_args: TRUE [18:41:43.269] - Getting '...' globals ... [18:41:43.270] resolve() on list ... [18:41:43.270] recursive: 0 [18:41:43.270] length: 1 [18:41:43.270] elements: '...' [18:41:43.271] length: 0 (resolved future 1) [18:41:43.271] resolve() on list ... DONE [18:41:43.271] - '...' content: [n=0] [18:41:43.271] List of 1 [18:41:43.271] $ ...: list() [18:41:43.271] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.271] - attr(*, "where")=List of 1 [18:41:43.271] ..$ ...: [18:41:43.271] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.271] - attr(*, "resolved")= logi TRUE [18:41:43.271] - attr(*, "total_size")= num NA [18:41:43.276] - Getting '...' globals ... DONE [18:41:43.276] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.277] List of 2 [18:41:43.277] $ ...future.FUN:function (x) [18:41:43.277] $ ... : list() [18:41:43.277] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.277] - attr(*, "where")=List of 2 [18:41:43.277] ..$ ...future.FUN: [18:41:43.277] ..$ ... : [18:41:43.277] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.277] - attr(*, "resolved")= logi FALSE [18:41:43.277] - attr(*, "total_size")= int 4788 [18:41:43.282] Packages to be attached in all futures: [n=0] [18:41:43.282] getGlobalsAndPackagesXApply() ... DONE [18:41:43.282] Number of futures (= number of chunks): 1 [18:41:43.283] Launching 1 futures (chunks) ... [18:41:43.283] Chunk #1 of 1 ... [18:41:43.283] - Finding globals in 'X' for chunk #1 ... [18:41:43.284] getGlobalsAndPackages() ... [18:41:43.284] Searching for globals... [18:41:43.284] [18:41:43.285] Searching for globals ... DONE [18:41:43.285] - globals: [0] [18:41:43.285] getGlobalsAndPackages() ... DONE [18:41:43.285] + additional globals found: [n=0] [18:41:43.286] + additional namespaces needed: [n=0] [18:41:43.286] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.286] - seeds: [18:41:43.286] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.287] getGlobalsAndPackages() ... [18:41:43.287] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.287] Resolving globals: FALSE [18:41:43.287] Tweak future expression to call with '...' arguments ... [18:41:43.288] { [18:41:43.288] do.call(function(...) { [18:41:43.288] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.288] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.288] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.288] on.exit(options(oopts), add = TRUE) [18:41:43.288] } [18:41:43.288] { [18:41:43.288] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.288] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.288] ...future.FUN(...future.X_jj, ...) [18:41:43.288] }) [18:41:43.288] } [18:41:43.288] }, args = future.call.arguments) [18:41:43.288] } [18:41:43.288] Tweak future expression to call with '...' arguments ... DONE [18:41:43.289] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.290] [18:41:43.290] getGlobalsAndPackages() ... DONE [18:41:43.290] run() for 'Future' ... [18:41:43.291] - state: 'created' [18:41:43.291] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.292] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.292] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.292] - Field: 'label' [18:41:43.293] - Field: 'local' [18:41:43.293] - Field: 'owner' [18:41:43.293] - Field: 'envir' [18:41:43.293] - Field: 'packages' [18:41:43.294] - Field: 'gc' [18:41:43.294] - Field: 'conditions' [18:41:43.294] - Field: 'expr' [18:41:43.295] - Field: 'uuid' [18:41:43.295] - Field: 'seed' [18:41:43.295] - Field: 'version' [18:41:43.295] - Field: 'result' [18:41:43.296] - Field: 'asynchronous' [18:41:43.296] - Field: 'calls' [18:41:43.296] - Field: 'globals' [18:41:43.297] - Field: 'stdout' [18:41:43.297] - Field: 'earlySignal' [18:41:43.297] - Field: 'lazy' [18:41:43.297] - Field: 'state' [18:41:43.298] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.298] - Launch lazy future ... [18:41:43.298] Packages needed by the future expression (n = 0): [18:41:43.299] Packages needed by future strategies (n = 0): [18:41:43.300] { [18:41:43.300] { [18:41:43.300] { [18:41:43.300] ...future.startTime <- base::Sys.time() [18:41:43.300] { [18:41:43.300] { [18:41:43.300] { [18:41:43.300] base::local({ [18:41:43.300] has_future <- base::requireNamespace("future", [18:41:43.300] quietly = TRUE) [18:41:43.300] if (has_future) { [18:41:43.300] ns <- base::getNamespace("future") [18:41:43.300] version <- ns[[".package"]][["version"]] [18:41:43.300] if (is.null(version)) [18:41:43.300] version <- utils::packageVersion("future") [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] version <- NULL [18:41:43.300] } [18:41:43.300] if (!has_future || version < "1.8.0") { [18:41:43.300] info <- base::c(r_version = base::gsub("R version ", [18:41:43.300] "", base::R.version$version.string), [18:41:43.300] platform = base::sprintf("%s (%s-bit)", [18:41:43.300] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.300] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.300] "release", "version")], collapse = " "), [18:41:43.300] hostname = base::Sys.info()[["nodename"]]) [18:41:43.300] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.300] info) [18:41:43.300] info <- base::paste(info, collapse = "; ") [18:41:43.300] if (!has_future) { [18:41:43.300] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.300] info) [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.300] info, version) [18:41:43.300] } [18:41:43.300] base::stop(msg) [18:41:43.300] } [18:41:43.300] }) [18:41:43.300] } [18:41:43.300] ...future.strategy.old <- future::plan("list") [18:41:43.300] options(future.plan = NULL) [18:41:43.300] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.300] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.300] } [18:41:43.300] ...future.workdir <- getwd() [18:41:43.300] } [18:41:43.300] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.300] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.300] } [18:41:43.300] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.300] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.300] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.300] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.300] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.300] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.300] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.300] base::names(...future.oldOptions)) [18:41:43.300] } [18:41:43.300] if (FALSE) { [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] if (TRUE) { [18:41:43.300] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.300] open = "w") [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.300] windows = "NUL", "/dev/null"), open = "w") [18:41:43.300] } [18:41:43.300] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.300] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.300] base::sink(type = "output", split = FALSE) [18:41:43.300] base::close(...future.stdout) [18:41:43.300] }, add = TRUE) [18:41:43.300] } [18:41:43.300] ...future.frame <- base::sys.nframe() [18:41:43.300] ...future.conditions <- base::list() [18:41:43.300] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.300] if (FALSE) { [18:41:43.300] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.300] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.300] } [18:41:43.300] ...future.result <- base::tryCatch({ [18:41:43.300] base::withCallingHandlers({ [18:41:43.300] ...future.value <- base::withVisible(base::local({ [18:41:43.300] do.call(function(...) { [18:41:43.300] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.300] if (!identical(...future.globals.maxSize.org, [18:41:43.300] ...future.globals.maxSize)) { [18:41:43.300] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.300] on.exit(options(oopts), add = TRUE) [18:41:43.300] } [18:41:43.300] { [18:41:43.300] lapply(seq_along(...future.elements_ii), [18:41:43.300] FUN = function(jj) { [18:41:43.300] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.300] ...future.FUN(...future.X_jj, ...) [18:41:43.300] }) [18:41:43.300] } [18:41:43.300] }, args = future.call.arguments) [18:41:43.300] })) [18:41:43.300] future::FutureResult(value = ...future.value$value, [18:41:43.300] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.300] ...future.rng), globalenv = if (FALSE) [18:41:43.300] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.300] ...future.globalenv.names)) [18:41:43.300] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.300] }, condition = base::local({ [18:41:43.300] c <- base::c [18:41:43.300] inherits <- base::inherits [18:41:43.300] invokeRestart <- base::invokeRestart [18:41:43.300] length <- base::length [18:41:43.300] list <- base::list [18:41:43.300] seq.int <- base::seq.int [18:41:43.300] signalCondition <- base::signalCondition [18:41:43.300] sys.calls <- base::sys.calls [18:41:43.300] `[[` <- base::`[[` [18:41:43.300] `+` <- base::`+` [18:41:43.300] `<<-` <- base::`<<-` [18:41:43.300] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.300] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.300] 3L)] [18:41:43.300] } [18:41:43.300] function(cond) { [18:41:43.300] is_error <- inherits(cond, "error") [18:41:43.300] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.300] NULL) [18:41:43.300] if (is_error) { [18:41:43.300] sessionInformation <- function() { [18:41:43.300] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.300] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.300] search = base::search(), system = base::Sys.info()) [18:41:43.300] } [18:41:43.300] ...future.conditions[[length(...future.conditions) + [18:41:43.300] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.300] cond$call), session = sessionInformation(), [18:41:43.300] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.300] signalCondition(cond) [18:41:43.300] } [18:41:43.300] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.300] "immediateCondition"))) { [18:41:43.300] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.300] ...future.conditions[[length(...future.conditions) + [18:41:43.300] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.300] if (TRUE && !signal) { [18:41:43.300] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.300] { [18:41:43.300] inherits <- base::inherits [18:41:43.300] invokeRestart <- base::invokeRestart [18:41:43.300] is.null <- base::is.null [18:41:43.300] muffled <- FALSE [18:41:43.300] if (inherits(cond, "message")) { [18:41:43.300] muffled <- grepl(pattern, "muffleMessage") [18:41:43.300] if (muffled) [18:41:43.300] invokeRestart("muffleMessage") [18:41:43.300] } [18:41:43.300] else if (inherits(cond, "warning")) { [18:41:43.300] muffled <- grepl(pattern, "muffleWarning") [18:41:43.300] if (muffled) [18:41:43.300] invokeRestart("muffleWarning") [18:41:43.300] } [18:41:43.300] else if (inherits(cond, "condition")) { [18:41:43.300] if (!is.null(pattern)) { [18:41:43.300] computeRestarts <- base::computeRestarts [18:41:43.300] grepl <- base::grepl [18:41:43.300] restarts <- computeRestarts(cond) [18:41:43.300] for (restart in restarts) { [18:41:43.300] name <- restart$name [18:41:43.300] if (is.null(name)) [18:41:43.300] next [18:41:43.300] if (!grepl(pattern, name)) [18:41:43.300] next [18:41:43.300] invokeRestart(restart) [18:41:43.300] muffled <- TRUE [18:41:43.300] break [18:41:43.300] } [18:41:43.300] } [18:41:43.300] } [18:41:43.300] invisible(muffled) [18:41:43.300] } [18:41:43.300] muffleCondition(cond, pattern = "^muffle") [18:41:43.300] } [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] if (TRUE) { [18:41:43.300] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.300] { [18:41:43.300] inherits <- base::inherits [18:41:43.300] invokeRestart <- base::invokeRestart [18:41:43.300] is.null <- base::is.null [18:41:43.300] muffled <- FALSE [18:41:43.300] if (inherits(cond, "message")) { [18:41:43.300] muffled <- grepl(pattern, "muffleMessage") [18:41:43.300] if (muffled) [18:41:43.300] invokeRestart("muffleMessage") [18:41:43.300] } [18:41:43.300] else if (inherits(cond, "warning")) { [18:41:43.300] muffled <- grepl(pattern, "muffleWarning") [18:41:43.300] if (muffled) [18:41:43.300] invokeRestart("muffleWarning") [18:41:43.300] } [18:41:43.300] else if (inherits(cond, "condition")) { [18:41:43.300] if (!is.null(pattern)) { [18:41:43.300] computeRestarts <- base::computeRestarts [18:41:43.300] grepl <- base::grepl [18:41:43.300] restarts <- computeRestarts(cond) [18:41:43.300] for (restart in restarts) { [18:41:43.300] name <- restart$name [18:41:43.300] if (is.null(name)) [18:41:43.300] next [18:41:43.300] if (!grepl(pattern, name)) [18:41:43.300] next [18:41:43.300] invokeRestart(restart) [18:41:43.300] muffled <- TRUE [18:41:43.300] break [18:41:43.300] } [18:41:43.300] } [18:41:43.300] } [18:41:43.300] invisible(muffled) [18:41:43.300] } [18:41:43.300] muffleCondition(cond, pattern = "^muffle") [18:41:43.300] } [18:41:43.300] } [18:41:43.300] } [18:41:43.300] })) [18:41:43.300] }, error = function(ex) { [18:41:43.300] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.300] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.300] ...future.rng), started = ...future.startTime, [18:41:43.300] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.300] version = "1.8"), class = "FutureResult") [18:41:43.300] }, finally = { [18:41:43.300] if (!identical(...future.workdir, getwd())) [18:41:43.300] setwd(...future.workdir) [18:41:43.300] { [18:41:43.300] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.300] ...future.oldOptions$nwarnings <- NULL [18:41:43.300] } [18:41:43.300] base::options(...future.oldOptions) [18:41:43.300] if (.Platform$OS.type == "windows") { [18:41:43.300] old_names <- names(...future.oldEnvVars) [18:41:43.300] envs <- base::Sys.getenv() [18:41:43.300] names <- names(envs) [18:41:43.300] common <- intersect(names, old_names) [18:41:43.300] added <- setdiff(names, old_names) [18:41:43.300] removed <- setdiff(old_names, names) [18:41:43.300] changed <- common[...future.oldEnvVars[common] != [18:41:43.300] envs[common]] [18:41:43.300] NAMES <- toupper(changed) [18:41:43.300] args <- list() [18:41:43.300] for (kk in seq_along(NAMES)) { [18:41:43.300] name <- changed[[kk]] [18:41:43.300] NAME <- NAMES[[kk]] [18:41:43.300] if (name != NAME && is.element(NAME, old_names)) [18:41:43.300] next [18:41:43.300] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.300] } [18:41:43.300] NAMES <- toupper(added) [18:41:43.300] for (kk in seq_along(NAMES)) { [18:41:43.300] name <- added[[kk]] [18:41:43.300] NAME <- NAMES[[kk]] [18:41:43.300] if (name != NAME && is.element(NAME, old_names)) [18:41:43.300] next [18:41:43.300] args[[name]] <- "" [18:41:43.300] } [18:41:43.300] NAMES <- toupper(removed) [18:41:43.300] for (kk in seq_along(NAMES)) { [18:41:43.300] name <- removed[[kk]] [18:41:43.300] NAME <- NAMES[[kk]] [18:41:43.300] if (name != NAME && is.element(NAME, old_names)) [18:41:43.300] next [18:41:43.300] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.300] } [18:41:43.300] if (length(args) > 0) [18:41:43.300] base::do.call(base::Sys.setenv, args = args) [18:41:43.300] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.300] } [18:41:43.300] { [18:41:43.300] if (base::length(...future.futureOptionsAdded) > [18:41:43.300] 0L) { [18:41:43.300] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.300] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.300] base::options(opts) [18:41:43.300] } [18:41:43.300] { [18:41:43.300] { [18:41:43.300] NULL [18:41:43.300] RNGkind("Mersenne-Twister") [18:41:43.300] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.300] inherits = FALSE) [18:41:43.300] } [18:41:43.300] options(future.plan = NULL) [18:41:43.300] if (is.na(NA_character_)) [18:41:43.300] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.300] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.300] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.300] .init = FALSE) [18:41:43.300] } [18:41:43.300] } [18:41:43.300] } [18:41:43.300] }) [18:41:43.300] if (TRUE) { [18:41:43.300] base::sink(type = "output", split = FALSE) [18:41:43.300] if (TRUE) { [18:41:43.300] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.300] } [18:41:43.300] else { [18:41:43.300] ...future.result["stdout"] <- base::list(NULL) [18:41:43.300] } [18:41:43.300] base::close(...future.stdout) [18:41:43.300] ...future.stdout <- NULL [18:41:43.300] } [18:41:43.300] ...future.result$conditions <- ...future.conditions [18:41:43.300] ...future.result$finished <- base::Sys.time() [18:41:43.300] ...future.result [18:41:43.300] } [18:41:43.306] assign_globals() ... [18:41:43.306] List of 5 [18:41:43.306] $ ...future.FUN :function (x) [18:41:43.306] $ future.call.arguments : list() [18:41:43.306] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.306] $ ...future.elements_ii :List of 3 [18:41:43.306] ..$ : chr "a" [18:41:43.306] ..$ : chr "b" [18:41:43.306] ..$ : chr "c" [18:41:43.306] $ ...future.seeds_ii : NULL [18:41:43.306] $ ...future.globals.maxSize: NULL [18:41:43.306] - attr(*, "where")=List of 5 [18:41:43.306] ..$ ...future.FUN : [18:41:43.306] ..$ future.call.arguments : [18:41:43.306] ..$ ...future.elements_ii : [18:41:43.306] ..$ ...future.seeds_ii : [18:41:43.306] ..$ ...future.globals.maxSize: [18:41:43.306] - attr(*, "resolved")= logi FALSE [18:41:43.306] - attr(*, "total_size")= num 4788 [18:41:43.306] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.306] - attr(*, "already-done")= logi TRUE [18:41:43.316] - copied '...future.FUN' to environment [18:41:43.317] - copied 'future.call.arguments' to environment [18:41:43.317] - copied '...future.elements_ii' to environment [18:41:43.317] - copied '...future.seeds_ii' to environment [18:41:43.317] - copied '...future.globals.maxSize' to environment [18:41:43.318] assign_globals() ... done [18:41:43.318] plan(): Setting new future strategy stack: [18:41:43.319] List of future strategies: [18:41:43.319] 1. sequential: [18:41:43.319] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.319] - tweaked: FALSE [18:41:43.319] - call: NULL [18:41:43.319] plan(): nbrOfWorkers() = 1 [18:41:43.324] plan(): Setting new future strategy stack: [18:41:43.325] List of future strategies: [18:41:43.325] 1. sequential: [18:41:43.325] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.325] - tweaked: FALSE [18:41:43.325] - call: plan(strategy) [18:41:43.326] plan(): nbrOfWorkers() = 1 [18:41:43.326] SequentialFuture started (and completed) [18:41:43.326] - Launch lazy future ... done [18:41:43.327] run() for 'SequentialFuture' ... done [18:41:43.327] Created future: [18:41:43.327] SequentialFuture: [18:41:43.327] Label: 'future_sapply-1' [18:41:43.327] Expression: [18:41:43.327] { [18:41:43.327] do.call(function(...) { [18:41:43.327] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.327] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.327] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.327] on.exit(options(oopts), add = TRUE) [18:41:43.327] } [18:41:43.327] { [18:41:43.327] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.327] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.327] ...future.FUN(...future.X_jj, ...) [18:41:43.327] }) [18:41:43.327] } [18:41:43.327] }, args = future.call.arguments) [18:41:43.327] } [18:41:43.327] Lazy evaluation: FALSE [18:41:43.327] Asynchronous evaluation: FALSE [18:41:43.327] Local evaluation: TRUE [18:41:43.327] Environment: R_GlobalEnv [18:41:43.327] Capture standard output: TRUE [18:41:43.327] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.327] Globals: 5 objects totaling 418 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.327] Packages: [18:41:43.327] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.327] Resolved: TRUE [18:41:43.327] Value: 82 bytes of class 'list' [18:41:43.327] Early signaling: FALSE [18:41:43.327] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.327] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.329] Chunk #1 of 1 ... DONE [18:41:43.329] Launching 1 futures (chunks) ... DONE [18:41:43.329] Resolving 1 futures (chunks) ... [18:41:43.330] resolve() on list ... [18:41:43.330] recursive: 0 [18:41:43.330] length: 1 [18:41:43.330] [18:41:43.331] resolved() for 'SequentialFuture' ... [18:41:43.331] - state: 'finished' [18:41:43.331] - run: TRUE [18:41:43.331] - result: 'FutureResult' [18:41:43.332] resolved() for 'SequentialFuture' ... done [18:41:43.332] Future #1 [18:41:43.332] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.333] - nx: 1 [18:41:43.333] - relay: TRUE [18:41:43.333] - stdout: TRUE [18:41:43.333] - signal: TRUE [18:41:43.334] - resignal: FALSE [18:41:43.334] - force: TRUE [18:41:43.334] - relayed: [n=1] FALSE [18:41:43.334] - queued futures: [n=1] FALSE [18:41:43.335] - until=1 [18:41:43.335] - relaying element #1 [18:41:43.335] - relayed: [n=1] TRUE [18:41:43.336] - queued futures: [n=1] TRUE [18:41:43.336] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.336] length: 0 (resolved future 1) [18:41:43.336] Relaying remaining futures [18:41:43.337] signalConditionsASAP(NULL, pos=0) ... [18:41:43.337] - nx: 1 [18:41:43.337] - relay: TRUE [18:41:43.337] - stdout: TRUE [18:41:43.338] - signal: TRUE [18:41:43.338] - resignal: FALSE [18:41:43.338] - force: TRUE [18:41:43.338] - relayed: [n=1] TRUE [18:41:43.338] - queued futures: [n=1] TRUE - flush all [18:41:43.339] - relayed: [n=1] TRUE [18:41:43.339] - queued futures: [n=1] TRUE [18:41:43.339] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.340] resolve() on list ... DONE [18:41:43.340] - Number of value chunks collected: 1 [18:41:43.340] Resolving 1 futures (chunks) ... DONE [18:41:43.341] Reducing values from 1 chunks ... [18:41:43.341] - Number of values collected after concatenation: 3 [18:41:43.341] - Number of values expected: 3 [18:41:43.341] Reducing values from 1 chunks ... DONE [18:41:43.341] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:43.343] future_lapply() ... [18:41:43.344] Number of chunks: 1 [18:41:43.344] getGlobalsAndPackagesXApply() ... [18:41:43.345] - future.globals: TRUE [18:41:43.345] getGlobalsAndPackages() ... [18:41:43.345] Searching for globals... [18:41:43.347] - globals found: [2] 'FUN', 'UseMethod' [18:41:43.347] Searching for globals ... DONE [18:41:43.348] Resolving globals: FALSE [18:41:43.348] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:43.349] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:43.349] - globals: [1] 'FUN' [18:41:43.350] [18:41:43.350] getGlobalsAndPackages() ... DONE [18:41:43.350] - globals found/used: [n=1] 'FUN' [18:41:43.350] - needed namespaces: [n=0] [18:41:43.351] Finding globals ... DONE [18:41:43.351] - use_args: TRUE [18:41:43.351] - Getting '...' globals ... [18:41:43.352] resolve() on list ... [18:41:43.352] recursive: 0 [18:41:43.352] length: 1 [18:41:43.353] elements: '...' [18:41:43.353] length: 0 (resolved future 1) [18:41:43.353] resolve() on list ... DONE [18:41:43.353] - '...' content: [n=0] [18:41:43.354] List of 1 [18:41:43.354] $ ...: list() [18:41:43.354] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.354] - attr(*, "where")=List of 1 [18:41:43.354] ..$ ...: [18:41:43.354] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.354] - attr(*, "resolved")= logi TRUE [18:41:43.354] - attr(*, "total_size")= num NA [18:41:43.358] - Getting '...' globals ... DONE [18:41:43.358] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.359] List of 2 [18:41:43.359] $ ...future.FUN:function (x, ...) [18:41:43.359] $ ... : list() [18:41:43.359] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.359] - attr(*, "where")=List of 2 [18:41:43.359] ..$ ...future.FUN: [18:41:43.359] ..$ ... : [18:41:43.359] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.359] - attr(*, "resolved")= logi FALSE [18:41:43.359] - attr(*, "total_size")= int 5028 [18:41:43.364] Packages to be attached in all futures: [n=0] [18:41:43.364] getGlobalsAndPackagesXApply() ... DONE [18:41:43.365] Number of futures (= number of chunks): 1 [18:41:43.365] Launching 1 futures (chunks) ... [18:41:43.365] Chunk #1 of 1 ... [18:41:43.365] - Finding globals in 'X' for chunk #1 ... [18:41:43.366] getGlobalsAndPackages() ... [18:41:43.366] Searching for globals... [18:41:43.366] [18:41:43.367] Searching for globals ... DONE [18:41:43.367] - globals: [0] [18:41:43.367] getGlobalsAndPackages() ... DONE [18:41:43.367] + additional globals found: [n=0] [18:41:43.368] + additional namespaces needed: [n=0] [18:41:43.368] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.368] - seeds: [18:41:43.368] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.369] getGlobalsAndPackages() ... [18:41:43.369] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.369] Resolving globals: FALSE [18:41:43.370] Tweak future expression to call with '...' arguments ... [18:41:43.370] { [18:41:43.370] do.call(function(...) { [18:41:43.370] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.370] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.370] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.370] on.exit(options(oopts), add = TRUE) [18:41:43.370] } [18:41:43.370] { [18:41:43.370] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.370] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.370] ...future.FUN(...future.X_jj, ...) [18:41:43.370] }) [18:41:43.370] } [18:41:43.370] }, args = future.call.arguments) [18:41:43.370] } [18:41:43.371] Tweak future expression to call with '...' arguments ... DONE [18:41:43.371] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.372] [18:41:43.372] getGlobalsAndPackages() ... DONE [18:41:43.372] run() for 'Future' ... [18:41:43.373] - state: 'created' [18:41:43.373] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.374] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.374] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.374] - Field: 'label' [18:41:43.375] - Field: 'local' [18:41:43.375] - Field: 'owner' [18:41:43.375] - Field: 'envir' [18:41:43.375] - Field: 'packages' [18:41:43.376] - Field: 'gc' [18:41:43.376] - Field: 'conditions' [18:41:43.376] - Field: 'expr' [18:41:43.377] - Field: 'uuid' [18:41:43.377] - Field: 'seed' [18:41:43.377] - Field: 'version' [18:41:43.377] - Field: 'result' [18:41:43.378] - Field: 'asynchronous' [18:41:43.378] - Field: 'calls' [18:41:43.378] - Field: 'globals' [18:41:43.379] - Field: 'stdout' [18:41:43.379] - Field: 'earlySignal' [18:41:43.379] - Field: 'lazy' [18:41:43.379] - Field: 'state' [18:41:43.380] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.380] - Launch lazy future ... [18:41:43.380] Packages needed by the future expression (n = 0): [18:41:43.381] Packages needed by future strategies (n = 0): [18:41:43.382] { [18:41:43.382] { [18:41:43.382] { [18:41:43.382] ...future.startTime <- base::Sys.time() [18:41:43.382] { [18:41:43.382] { [18:41:43.382] { [18:41:43.382] base::local({ [18:41:43.382] has_future <- base::requireNamespace("future", [18:41:43.382] quietly = TRUE) [18:41:43.382] if (has_future) { [18:41:43.382] ns <- base::getNamespace("future") [18:41:43.382] version <- ns[[".package"]][["version"]] [18:41:43.382] if (is.null(version)) [18:41:43.382] version <- utils::packageVersion("future") [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] version <- NULL [18:41:43.382] } [18:41:43.382] if (!has_future || version < "1.8.0") { [18:41:43.382] info <- base::c(r_version = base::gsub("R version ", [18:41:43.382] "", base::R.version$version.string), [18:41:43.382] platform = base::sprintf("%s (%s-bit)", [18:41:43.382] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.382] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.382] "release", "version")], collapse = " "), [18:41:43.382] hostname = base::Sys.info()[["nodename"]]) [18:41:43.382] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.382] info) [18:41:43.382] info <- base::paste(info, collapse = "; ") [18:41:43.382] if (!has_future) { [18:41:43.382] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.382] info) [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.382] info, version) [18:41:43.382] } [18:41:43.382] base::stop(msg) [18:41:43.382] } [18:41:43.382] }) [18:41:43.382] } [18:41:43.382] ...future.strategy.old <- future::plan("list") [18:41:43.382] options(future.plan = NULL) [18:41:43.382] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.382] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.382] } [18:41:43.382] ...future.workdir <- getwd() [18:41:43.382] } [18:41:43.382] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.382] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.382] } [18:41:43.382] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.382] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.382] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.382] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.382] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.382] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.382] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.382] base::names(...future.oldOptions)) [18:41:43.382] } [18:41:43.382] if (FALSE) { [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] if (TRUE) { [18:41:43.382] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.382] open = "w") [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.382] windows = "NUL", "/dev/null"), open = "w") [18:41:43.382] } [18:41:43.382] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.382] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.382] base::sink(type = "output", split = FALSE) [18:41:43.382] base::close(...future.stdout) [18:41:43.382] }, add = TRUE) [18:41:43.382] } [18:41:43.382] ...future.frame <- base::sys.nframe() [18:41:43.382] ...future.conditions <- base::list() [18:41:43.382] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.382] if (FALSE) { [18:41:43.382] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.382] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.382] } [18:41:43.382] ...future.result <- base::tryCatch({ [18:41:43.382] base::withCallingHandlers({ [18:41:43.382] ...future.value <- base::withVisible(base::local({ [18:41:43.382] do.call(function(...) { [18:41:43.382] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.382] if (!identical(...future.globals.maxSize.org, [18:41:43.382] ...future.globals.maxSize)) { [18:41:43.382] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.382] on.exit(options(oopts), add = TRUE) [18:41:43.382] } [18:41:43.382] { [18:41:43.382] lapply(seq_along(...future.elements_ii), [18:41:43.382] FUN = function(jj) { [18:41:43.382] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.382] ...future.FUN(...future.X_jj, ...) [18:41:43.382] }) [18:41:43.382] } [18:41:43.382] }, args = future.call.arguments) [18:41:43.382] })) [18:41:43.382] future::FutureResult(value = ...future.value$value, [18:41:43.382] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.382] ...future.rng), globalenv = if (FALSE) [18:41:43.382] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.382] ...future.globalenv.names)) [18:41:43.382] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.382] }, condition = base::local({ [18:41:43.382] c <- base::c [18:41:43.382] inherits <- base::inherits [18:41:43.382] invokeRestart <- base::invokeRestart [18:41:43.382] length <- base::length [18:41:43.382] list <- base::list [18:41:43.382] seq.int <- base::seq.int [18:41:43.382] signalCondition <- base::signalCondition [18:41:43.382] sys.calls <- base::sys.calls [18:41:43.382] `[[` <- base::`[[` [18:41:43.382] `+` <- base::`+` [18:41:43.382] `<<-` <- base::`<<-` [18:41:43.382] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.382] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.382] 3L)] [18:41:43.382] } [18:41:43.382] function(cond) { [18:41:43.382] is_error <- inherits(cond, "error") [18:41:43.382] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.382] NULL) [18:41:43.382] if (is_error) { [18:41:43.382] sessionInformation <- function() { [18:41:43.382] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.382] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.382] search = base::search(), system = base::Sys.info()) [18:41:43.382] } [18:41:43.382] ...future.conditions[[length(...future.conditions) + [18:41:43.382] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.382] cond$call), session = sessionInformation(), [18:41:43.382] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.382] signalCondition(cond) [18:41:43.382] } [18:41:43.382] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.382] "immediateCondition"))) { [18:41:43.382] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.382] ...future.conditions[[length(...future.conditions) + [18:41:43.382] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.382] if (TRUE && !signal) { [18:41:43.382] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.382] { [18:41:43.382] inherits <- base::inherits [18:41:43.382] invokeRestart <- base::invokeRestart [18:41:43.382] is.null <- base::is.null [18:41:43.382] muffled <- FALSE [18:41:43.382] if (inherits(cond, "message")) { [18:41:43.382] muffled <- grepl(pattern, "muffleMessage") [18:41:43.382] if (muffled) [18:41:43.382] invokeRestart("muffleMessage") [18:41:43.382] } [18:41:43.382] else if (inherits(cond, "warning")) { [18:41:43.382] muffled <- grepl(pattern, "muffleWarning") [18:41:43.382] if (muffled) [18:41:43.382] invokeRestart("muffleWarning") [18:41:43.382] } [18:41:43.382] else if (inherits(cond, "condition")) { [18:41:43.382] if (!is.null(pattern)) { [18:41:43.382] computeRestarts <- base::computeRestarts [18:41:43.382] grepl <- base::grepl [18:41:43.382] restarts <- computeRestarts(cond) [18:41:43.382] for (restart in restarts) { [18:41:43.382] name <- restart$name [18:41:43.382] if (is.null(name)) [18:41:43.382] next [18:41:43.382] if (!grepl(pattern, name)) [18:41:43.382] next [18:41:43.382] invokeRestart(restart) [18:41:43.382] muffled <- TRUE [18:41:43.382] break [18:41:43.382] } [18:41:43.382] } [18:41:43.382] } [18:41:43.382] invisible(muffled) [18:41:43.382] } [18:41:43.382] muffleCondition(cond, pattern = "^muffle") [18:41:43.382] } [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] if (TRUE) { [18:41:43.382] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.382] { [18:41:43.382] inherits <- base::inherits [18:41:43.382] invokeRestart <- base::invokeRestart [18:41:43.382] is.null <- base::is.null [18:41:43.382] muffled <- FALSE [18:41:43.382] if (inherits(cond, "message")) { [18:41:43.382] muffled <- grepl(pattern, "muffleMessage") [18:41:43.382] if (muffled) [18:41:43.382] invokeRestart("muffleMessage") [18:41:43.382] } [18:41:43.382] else if (inherits(cond, "warning")) { [18:41:43.382] muffled <- grepl(pattern, "muffleWarning") [18:41:43.382] if (muffled) [18:41:43.382] invokeRestart("muffleWarning") [18:41:43.382] } [18:41:43.382] else if (inherits(cond, "condition")) { [18:41:43.382] if (!is.null(pattern)) { [18:41:43.382] computeRestarts <- base::computeRestarts [18:41:43.382] grepl <- base::grepl [18:41:43.382] restarts <- computeRestarts(cond) [18:41:43.382] for (restart in restarts) { [18:41:43.382] name <- restart$name [18:41:43.382] if (is.null(name)) [18:41:43.382] next [18:41:43.382] if (!grepl(pattern, name)) [18:41:43.382] next [18:41:43.382] invokeRestart(restart) [18:41:43.382] muffled <- TRUE [18:41:43.382] break [18:41:43.382] } [18:41:43.382] } [18:41:43.382] } [18:41:43.382] invisible(muffled) [18:41:43.382] } [18:41:43.382] muffleCondition(cond, pattern = "^muffle") [18:41:43.382] } [18:41:43.382] } [18:41:43.382] } [18:41:43.382] })) [18:41:43.382] }, error = function(ex) { [18:41:43.382] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.382] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.382] ...future.rng), started = ...future.startTime, [18:41:43.382] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.382] version = "1.8"), class = "FutureResult") [18:41:43.382] }, finally = { [18:41:43.382] if (!identical(...future.workdir, getwd())) [18:41:43.382] setwd(...future.workdir) [18:41:43.382] { [18:41:43.382] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.382] ...future.oldOptions$nwarnings <- NULL [18:41:43.382] } [18:41:43.382] base::options(...future.oldOptions) [18:41:43.382] if (.Platform$OS.type == "windows") { [18:41:43.382] old_names <- names(...future.oldEnvVars) [18:41:43.382] envs <- base::Sys.getenv() [18:41:43.382] names <- names(envs) [18:41:43.382] common <- intersect(names, old_names) [18:41:43.382] added <- setdiff(names, old_names) [18:41:43.382] removed <- setdiff(old_names, names) [18:41:43.382] changed <- common[...future.oldEnvVars[common] != [18:41:43.382] envs[common]] [18:41:43.382] NAMES <- toupper(changed) [18:41:43.382] args <- list() [18:41:43.382] for (kk in seq_along(NAMES)) { [18:41:43.382] name <- changed[[kk]] [18:41:43.382] NAME <- NAMES[[kk]] [18:41:43.382] if (name != NAME && is.element(NAME, old_names)) [18:41:43.382] next [18:41:43.382] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.382] } [18:41:43.382] NAMES <- toupper(added) [18:41:43.382] for (kk in seq_along(NAMES)) { [18:41:43.382] name <- added[[kk]] [18:41:43.382] NAME <- NAMES[[kk]] [18:41:43.382] if (name != NAME && is.element(NAME, old_names)) [18:41:43.382] next [18:41:43.382] args[[name]] <- "" [18:41:43.382] } [18:41:43.382] NAMES <- toupper(removed) [18:41:43.382] for (kk in seq_along(NAMES)) { [18:41:43.382] name <- removed[[kk]] [18:41:43.382] NAME <- NAMES[[kk]] [18:41:43.382] if (name != NAME && is.element(NAME, old_names)) [18:41:43.382] next [18:41:43.382] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.382] } [18:41:43.382] if (length(args) > 0) [18:41:43.382] base::do.call(base::Sys.setenv, args = args) [18:41:43.382] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.382] } [18:41:43.382] { [18:41:43.382] if (base::length(...future.futureOptionsAdded) > [18:41:43.382] 0L) { [18:41:43.382] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.382] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.382] base::options(opts) [18:41:43.382] } [18:41:43.382] { [18:41:43.382] { [18:41:43.382] NULL [18:41:43.382] RNGkind("Mersenne-Twister") [18:41:43.382] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.382] inherits = FALSE) [18:41:43.382] } [18:41:43.382] options(future.plan = NULL) [18:41:43.382] if (is.na(NA_character_)) [18:41:43.382] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.382] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.382] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.382] .init = FALSE) [18:41:43.382] } [18:41:43.382] } [18:41:43.382] } [18:41:43.382] }) [18:41:43.382] if (TRUE) { [18:41:43.382] base::sink(type = "output", split = FALSE) [18:41:43.382] if (TRUE) { [18:41:43.382] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.382] } [18:41:43.382] else { [18:41:43.382] ...future.result["stdout"] <- base::list(NULL) [18:41:43.382] } [18:41:43.382] base::close(...future.stdout) [18:41:43.382] ...future.stdout <- NULL [18:41:43.382] } [18:41:43.382] ...future.result$conditions <- ...future.conditions [18:41:43.382] ...future.result$finished <- base::Sys.time() [18:41:43.382] ...future.result [18:41:43.382] } [18:41:43.388] assign_globals() ... [18:41:43.388] List of 5 [18:41:43.388] $ ...future.FUN :function (x, ...) [18:41:43.388] $ future.call.arguments : list() [18:41:43.388] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.388] $ ...future.elements_ii :List of 3 [18:41:43.388] ..$ : chr "a" [18:41:43.388] ..$ : chr "b" [18:41:43.388] ..$ : chr "c" [18:41:43.388] $ ...future.seeds_ii : NULL [18:41:43.388] $ ...future.globals.maxSize: NULL [18:41:43.388] - attr(*, "where")=List of 5 [18:41:43.388] ..$ ...future.FUN : [18:41:43.388] ..$ future.call.arguments : [18:41:43.388] ..$ ...future.elements_ii : [18:41:43.388] ..$ ...future.seeds_ii : [18:41:43.388] ..$ ...future.globals.maxSize: [18:41:43.388] - attr(*, "resolved")= logi FALSE [18:41:43.388] - attr(*, "total_size")= num 5028 [18:41:43.388] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.388] - attr(*, "already-done")= logi TRUE [18:41:43.398] - copied '...future.FUN' to environment [18:41:43.399] - copied 'future.call.arguments' to environment [18:41:43.399] - copied '...future.elements_ii' to environment [18:41:43.399] - copied '...future.seeds_ii' to environment [18:41:43.399] - copied '...future.globals.maxSize' to environment [18:41:43.400] assign_globals() ... done [18:41:43.400] plan(): Setting new future strategy stack: [18:41:43.400] List of future strategies: [18:41:43.400] 1. sequential: [18:41:43.400] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.400] - tweaked: FALSE [18:41:43.400] - call: NULL [18:41:43.401] plan(): nbrOfWorkers() = 1 [18:41:43.403] plan(): Setting new future strategy stack: [18:41:43.404] List of future strategies: [18:41:43.404] 1. sequential: [18:41:43.404] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.404] - tweaked: FALSE [18:41:43.404] - call: plan(strategy) [18:41:43.405] plan(): nbrOfWorkers() = 1 [18:41:43.405] SequentialFuture started (and completed) [18:41:43.405] - Launch lazy future ... done [18:41:43.406] run() for 'SequentialFuture' ... done [18:41:43.406] Created future: [18:41:43.406] SequentialFuture: [18:41:43.406] Label: 'future_sapply-1' [18:41:43.406] Expression: [18:41:43.406] { [18:41:43.406] do.call(function(...) { [18:41:43.406] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.406] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.406] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.406] on.exit(options(oopts), add = TRUE) [18:41:43.406] } [18:41:43.406] { [18:41:43.406] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.406] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.406] ...future.FUN(...future.X_jj, ...) [18:41:43.406] }) [18:41:43.406] } [18:41:43.406] }, args = future.call.arguments) [18:41:43.406] } [18:41:43.406] Lazy evaluation: FALSE [18:41:43.406] Asynchronous evaluation: FALSE [18:41:43.406] Local evaluation: TRUE [18:41:43.406] Environment: R_GlobalEnv [18:41:43.406] Capture standard output: TRUE [18:41:43.406] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.406] Globals: 5 objects totaling 511 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.406] Packages: [18:41:43.406] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.406] Resolved: TRUE [18:41:43.406] Value: 177 bytes of class 'list' [18:41:43.406] Early signaling: FALSE [18:41:43.406] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.406] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.408] Chunk #1 of 1 ... DONE [18:41:43.408] Launching 1 futures (chunks) ... DONE [18:41:43.408] Resolving 1 futures (chunks) ... [18:41:43.409] resolve() on list ... [18:41:43.409] recursive: 0 [18:41:43.409] length: 1 [18:41:43.409] [18:41:43.410] resolved() for 'SequentialFuture' ... [18:41:43.410] - state: 'finished' [18:41:43.410] - run: TRUE [18:41:43.411] - result: 'FutureResult' [18:41:43.411] resolved() for 'SequentialFuture' ... done [18:41:43.411] Future #1 [18:41:43.412] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.412] - nx: 1 [18:41:43.412] - relay: TRUE [18:41:43.412] - stdout: TRUE [18:41:43.412] - signal: TRUE [18:41:43.413] - resignal: FALSE [18:41:43.413] - force: TRUE [18:41:43.413] - relayed: [n=1] FALSE [18:41:43.413] - queued futures: [n=1] FALSE [18:41:43.414] - until=1 [18:41:43.414] - relaying element #1 [18:41:43.414] - relayed: [n=1] TRUE [18:41:43.415] - queued futures: [n=1] TRUE [18:41:43.415] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.415] length: 0 (resolved future 1) [18:41:43.415] Relaying remaining futures [18:41:43.416] signalConditionsASAP(NULL, pos=0) ... [18:41:43.416] - nx: 1 [18:41:43.416] - relay: TRUE [18:41:43.416] - stdout: TRUE [18:41:43.417] - signal: TRUE [18:41:43.417] - resignal: FALSE [18:41:43.417] - force: TRUE [18:41:43.417] - relayed: [n=1] TRUE [18:41:43.418] - queued futures: [n=1] TRUE - flush all [18:41:43.418] - relayed: [n=1] TRUE [18:41:43.418] - queued futures: [n=1] TRUE [18:41:43.419] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.419] resolve() on list ... DONE [18:41:43.419] - Number of value chunks collected: 1 [18:41:43.419] Resolving 1 futures (chunks) ... DONE [18:41:43.420] Reducing values from 1 chunks ... [18:41:43.420] - Number of values collected after concatenation: 3 [18:41:43.420] - Number of values expected: 3 [18:41:43.420] Reducing values from 1 chunks ... DONE [18:41:43.421] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:43.422] future_lapply() ... [18:41:43.423] Number of chunks: 1 [18:41:43.424] getGlobalsAndPackagesXApply() ... [18:41:43.424] - future.globals: TRUE [18:41:43.424] getGlobalsAndPackages() ... [18:41:43.424] Searching for globals... [18:41:43.426] - globals found: [1] 'FUN' [18:41:43.426] Searching for globals ... DONE [18:41:43.427] Resolving globals: FALSE [18:41:43.427] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.428] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.428] - globals: [1] 'FUN' [18:41:43.429] [18:41:43.429] getGlobalsAndPackages() ... DONE [18:41:43.429] - globals found/used: [n=1] 'FUN' [18:41:43.429] - needed namespaces: [n=0] [18:41:43.430] Finding globals ... DONE [18:41:43.430] - use_args: TRUE [18:41:43.430] - Getting '...' globals ... [18:41:43.431] resolve() on list ... [18:41:43.431] recursive: 0 [18:41:43.431] length: 1 [18:41:43.432] elements: '...' [18:41:43.432] length: 0 (resolved future 1) [18:41:43.432] resolve() on list ... DONE [18:41:43.432] - '...' content: [n=0] [18:41:43.433] List of 1 [18:41:43.433] $ ...: list() [18:41:43.433] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.433] - attr(*, "where")=List of 1 [18:41:43.433] ..$ ...: [18:41:43.433] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.433] - attr(*, "resolved")= logi TRUE [18:41:43.433] - attr(*, "total_size")= num NA [18:41:43.437] - Getting '...' globals ... DONE [18:41:43.437] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.438] List of 2 [18:41:43.438] $ ...future.FUN:function (x) [18:41:43.438] $ ... : list() [18:41:43.438] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.438] - attr(*, "where")=List of 2 [18:41:43.438] ..$ ...future.FUN: [18:41:43.438] ..$ ... : [18:41:43.438] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.438] - attr(*, "resolved")= logi FALSE [18:41:43.438] - attr(*, "total_size")= int 4788 [18:41:43.443] Packages to be attached in all futures: [n=0] [18:41:43.443] getGlobalsAndPackagesXApply() ... DONE [18:41:43.443] Number of futures (= number of chunks): 1 [18:41:43.444] Launching 1 futures (chunks) ... [18:41:43.444] Chunk #1 of 1 ... [18:41:43.444] - Finding globals in 'X' for chunk #1 ... [18:41:43.444] getGlobalsAndPackages() ... [18:41:43.445] Searching for globals... [18:41:43.445] [18:41:43.445] Searching for globals ... DONE [18:41:43.446] - globals: [0] [18:41:43.446] getGlobalsAndPackages() ... DONE [18:41:43.446] + additional globals found: [n=0] [18:41:43.446] + additional namespaces needed: [n=0] [18:41:43.447] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.447] - seeds: [18:41:43.447] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.447] getGlobalsAndPackages() ... [18:41:43.448] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.448] Resolving globals: FALSE [18:41:43.448] Tweak future expression to call with '...' arguments ... [18:41:43.448] { [18:41:43.448] do.call(function(...) { [18:41:43.448] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.448] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.448] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.448] on.exit(options(oopts), add = TRUE) [18:41:43.448] } [18:41:43.448] { [18:41:43.448] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.448] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.448] ...future.FUN(...future.X_jj, ...) [18:41:43.448] }) [18:41:43.448] } [18:41:43.448] }, args = future.call.arguments) [18:41:43.448] } [18:41:43.449] Tweak future expression to call with '...' arguments ... DONE [18:41:43.450] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.450] [18:41:43.450] getGlobalsAndPackages() ... DONE [18:41:43.451] run() for 'Future' ... [18:41:43.451] - state: 'created' [18:41:43.451] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.452] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.452] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.453] - Field: 'label' [18:41:43.453] - Field: 'local' [18:41:43.453] - Field: 'owner' [18:41:43.453] - Field: 'envir' [18:41:43.454] - Field: 'packages' [18:41:43.454] - Field: 'gc' [18:41:43.454] - Field: 'conditions' [18:41:43.454] - Field: 'expr' [18:41:43.455] - Field: 'uuid' [18:41:43.455] - Field: 'seed' [18:41:43.455] - Field: 'version' [18:41:43.455] - Field: 'result' [18:41:43.456] - Field: 'asynchronous' [18:41:43.456] - Field: 'calls' [18:41:43.456] - Field: 'globals' [18:41:43.456] - Field: 'stdout' [18:41:43.457] - Field: 'earlySignal' [18:41:43.457] - Field: 'lazy' [18:41:43.457] - Field: 'state' [18:41:43.458] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.458] - Launch lazy future ... [18:41:43.458] Packages needed by the future expression (n = 0): [18:41:43.458] Packages needed by future strategies (n = 0): [18:41:43.459] { [18:41:43.459] { [18:41:43.459] { [18:41:43.459] ...future.startTime <- base::Sys.time() [18:41:43.459] { [18:41:43.459] { [18:41:43.459] { [18:41:43.459] base::local({ [18:41:43.459] has_future <- base::requireNamespace("future", [18:41:43.459] quietly = TRUE) [18:41:43.459] if (has_future) { [18:41:43.459] ns <- base::getNamespace("future") [18:41:43.459] version <- ns[[".package"]][["version"]] [18:41:43.459] if (is.null(version)) [18:41:43.459] version <- utils::packageVersion("future") [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] version <- NULL [18:41:43.459] } [18:41:43.459] if (!has_future || version < "1.8.0") { [18:41:43.459] info <- base::c(r_version = base::gsub("R version ", [18:41:43.459] "", base::R.version$version.string), [18:41:43.459] platform = base::sprintf("%s (%s-bit)", [18:41:43.459] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.459] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.459] "release", "version")], collapse = " "), [18:41:43.459] hostname = base::Sys.info()[["nodename"]]) [18:41:43.459] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.459] info) [18:41:43.459] info <- base::paste(info, collapse = "; ") [18:41:43.459] if (!has_future) { [18:41:43.459] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.459] info) [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.459] info, version) [18:41:43.459] } [18:41:43.459] base::stop(msg) [18:41:43.459] } [18:41:43.459] }) [18:41:43.459] } [18:41:43.459] ...future.strategy.old <- future::plan("list") [18:41:43.459] options(future.plan = NULL) [18:41:43.459] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.459] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.459] } [18:41:43.459] ...future.workdir <- getwd() [18:41:43.459] } [18:41:43.459] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.459] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.459] } [18:41:43.459] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.459] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.459] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.459] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.459] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.459] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.459] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.459] base::names(...future.oldOptions)) [18:41:43.459] } [18:41:43.459] if (FALSE) { [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] if (TRUE) { [18:41:43.459] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.459] open = "w") [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.459] windows = "NUL", "/dev/null"), open = "w") [18:41:43.459] } [18:41:43.459] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.459] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.459] base::sink(type = "output", split = FALSE) [18:41:43.459] base::close(...future.stdout) [18:41:43.459] }, add = TRUE) [18:41:43.459] } [18:41:43.459] ...future.frame <- base::sys.nframe() [18:41:43.459] ...future.conditions <- base::list() [18:41:43.459] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.459] if (FALSE) { [18:41:43.459] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.459] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.459] } [18:41:43.459] ...future.result <- base::tryCatch({ [18:41:43.459] base::withCallingHandlers({ [18:41:43.459] ...future.value <- base::withVisible(base::local({ [18:41:43.459] do.call(function(...) { [18:41:43.459] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.459] if (!identical(...future.globals.maxSize.org, [18:41:43.459] ...future.globals.maxSize)) { [18:41:43.459] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.459] on.exit(options(oopts), add = TRUE) [18:41:43.459] } [18:41:43.459] { [18:41:43.459] lapply(seq_along(...future.elements_ii), [18:41:43.459] FUN = function(jj) { [18:41:43.459] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.459] ...future.FUN(...future.X_jj, ...) [18:41:43.459] }) [18:41:43.459] } [18:41:43.459] }, args = future.call.arguments) [18:41:43.459] })) [18:41:43.459] future::FutureResult(value = ...future.value$value, [18:41:43.459] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.459] ...future.rng), globalenv = if (FALSE) [18:41:43.459] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.459] ...future.globalenv.names)) [18:41:43.459] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.459] }, condition = base::local({ [18:41:43.459] c <- base::c [18:41:43.459] inherits <- base::inherits [18:41:43.459] invokeRestart <- base::invokeRestart [18:41:43.459] length <- base::length [18:41:43.459] list <- base::list [18:41:43.459] seq.int <- base::seq.int [18:41:43.459] signalCondition <- base::signalCondition [18:41:43.459] sys.calls <- base::sys.calls [18:41:43.459] `[[` <- base::`[[` [18:41:43.459] `+` <- base::`+` [18:41:43.459] `<<-` <- base::`<<-` [18:41:43.459] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.459] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.459] 3L)] [18:41:43.459] } [18:41:43.459] function(cond) { [18:41:43.459] is_error <- inherits(cond, "error") [18:41:43.459] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.459] NULL) [18:41:43.459] if (is_error) { [18:41:43.459] sessionInformation <- function() { [18:41:43.459] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.459] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.459] search = base::search(), system = base::Sys.info()) [18:41:43.459] } [18:41:43.459] ...future.conditions[[length(...future.conditions) + [18:41:43.459] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.459] cond$call), session = sessionInformation(), [18:41:43.459] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.459] signalCondition(cond) [18:41:43.459] } [18:41:43.459] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.459] "immediateCondition"))) { [18:41:43.459] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.459] ...future.conditions[[length(...future.conditions) + [18:41:43.459] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.459] if (TRUE && !signal) { [18:41:43.459] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.459] { [18:41:43.459] inherits <- base::inherits [18:41:43.459] invokeRestart <- base::invokeRestart [18:41:43.459] is.null <- base::is.null [18:41:43.459] muffled <- FALSE [18:41:43.459] if (inherits(cond, "message")) { [18:41:43.459] muffled <- grepl(pattern, "muffleMessage") [18:41:43.459] if (muffled) [18:41:43.459] invokeRestart("muffleMessage") [18:41:43.459] } [18:41:43.459] else if (inherits(cond, "warning")) { [18:41:43.459] muffled <- grepl(pattern, "muffleWarning") [18:41:43.459] if (muffled) [18:41:43.459] invokeRestart("muffleWarning") [18:41:43.459] } [18:41:43.459] else if (inherits(cond, "condition")) { [18:41:43.459] if (!is.null(pattern)) { [18:41:43.459] computeRestarts <- base::computeRestarts [18:41:43.459] grepl <- base::grepl [18:41:43.459] restarts <- computeRestarts(cond) [18:41:43.459] for (restart in restarts) { [18:41:43.459] name <- restart$name [18:41:43.459] if (is.null(name)) [18:41:43.459] next [18:41:43.459] if (!grepl(pattern, name)) [18:41:43.459] next [18:41:43.459] invokeRestart(restart) [18:41:43.459] muffled <- TRUE [18:41:43.459] break [18:41:43.459] } [18:41:43.459] } [18:41:43.459] } [18:41:43.459] invisible(muffled) [18:41:43.459] } [18:41:43.459] muffleCondition(cond, pattern = "^muffle") [18:41:43.459] } [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] if (TRUE) { [18:41:43.459] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.459] { [18:41:43.459] inherits <- base::inherits [18:41:43.459] invokeRestart <- base::invokeRestart [18:41:43.459] is.null <- base::is.null [18:41:43.459] muffled <- FALSE [18:41:43.459] if (inherits(cond, "message")) { [18:41:43.459] muffled <- grepl(pattern, "muffleMessage") [18:41:43.459] if (muffled) [18:41:43.459] invokeRestart("muffleMessage") [18:41:43.459] } [18:41:43.459] else if (inherits(cond, "warning")) { [18:41:43.459] muffled <- grepl(pattern, "muffleWarning") [18:41:43.459] if (muffled) [18:41:43.459] invokeRestart("muffleWarning") [18:41:43.459] } [18:41:43.459] else if (inherits(cond, "condition")) { [18:41:43.459] if (!is.null(pattern)) { [18:41:43.459] computeRestarts <- base::computeRestarts [18:41:43.459] grepl <- base::grepl [18:41:43.459] restarts <- computeRestarts(cond) [18:41:43.459] for (restart in restarts) { [18:41:43.459] name <- restart$name [18:41:43.459] if (is.null(name)) [18:41:43.459] next [18:41:43.459] if (!grepl(pattern, name)) [18:41:43.459] next [18:41:43.459] invokeRestart(restart) [18:41:43.459] muffled <- TRUE [18:41:43.459] break [18:41:43.459] } [18:41:43.459] } [18:41:43.459] } [18:41:43.459] invisible(muffled) [18:41:43.459] } [18:41:43.459] muffleCondition(cond, pattern = "^muffle") [18:41:43.459] } [18:41:43.459] } [18:41:43.459] } [18:41:43.459] })) [18:41:43.459] }, error = function(ex) { [18:41:43.459] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.459] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.459] ...future.rng), started = ...future.startTime, [18:41:43.459] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.459] version = "1.8"), class = "FutureResult") [18:41:43.459] }, finally = { [18:41:43.459] if (!identical(...future.workdir, getwd())) [18:41:43.459] setwd(...future.workdir) [18:41:43.459] { [18:41:43.459] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.459] ...future.oldOptions$nwarnings <- NULL [18:41:43.459] } [18:41:43.459] base::options(...future.oldOptions) [18:41:43.459] if (.Platform$OS.type == "windows") { [18:41:43.459] old_names <- names(...future.oldEnvVars) [18:41:43.459] envs <- base::Sys.getenv() [18:41:43.459] names <- names(envs) [18:41:43.459] common <- intersect(names, old_names) [18:41:43.459] added <- setdiff(names, old_names) [18:41:43.459] removed <- setdiff(old_names, names) [18:41:43.459] changed <- common[...future.oldEnvVars[common] != [18:41:43.459] envs[common]] [18:41:43.459] NAMES <- toupper(changed) [18:41:43.459] args <- list() [18:41:43.459] for (kk in seq_along(NAMES)) { [18:41:43.459] name <- changed[[kk]] [18:41:43.459] NAME <- NAMES[[kk]] [18:41:43.459] if (name != NAME && is.element(NAME, old_names)) [18:41:43.459] next [18:41:43.459] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.459] } [18:41:43.459] NAMES <- toupper(added) [18:41:43.459] for (kk in seq_along(NAMES)) { [18:41:43.459] name <- added[[kk]] [18:41:43.459] NAME <- NAMES[[kk]] [18:41:43.459] if (name != NAME && is.element(NAME, old_names)) [18:41:43.459] next [18:41:43.459] args[[name]] <- "" [18:41:43.459] } [18:41:43.459] NAMES <- toupper(removed) [18:41:43.459] for (kk in seq_along(NAMES)) { [18:41:43.459] name <- removed[[kk]] [18:41:43.459] NAME <- NAMES[[kk]] [18:41:43.459] if (name != NAME && is.element(NAME, old_names)) [18:41:43.459] next [18:41:43.459] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.459] } [18:41:43.459] if (length(args) > 0) [18:41:43.459] base::do.call(base::Sys.setenv, args = args) [18:41:43.459] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.459] } [18:41:43.459] { [18:41:43.459] if (base::length(...future.futureOptionsAdded) > [18:41:43.459] 0L) { [18:41:43.459] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.459] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.459] base::options(opts) [18:41:43.459] } [18:41:43.459] { [18:41:43.459] { [18:41:43.459] NULL [18:41:43.459] RNGkind("Mersenne-Twister") [18:41:43.459] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.459] inherits = FALSE) [18:41:43.459] } [18:41:43.459] options(future.plan = NULL) [18:41:43.459] if (is.na(NA_character_)) [18:41:43.459] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.459] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.459] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.459] .init = FALSE) [18:41:43.459] } [18:41:43.459] } [18:41:43.459] } [18:41:43.459] }) [18:41:43.459] if (TRUE) { [18:41:43.459] base::sink(type = "output", split = FALSE) [18:41:43.459] if (TRUE) { [18:41:43.459] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.459] } [18:41:43.459] else { [18:41:43.459] ...future.result["stdout"] <- base::list(NULL) [18:41:43.459] } [18:41:43.459] base::close(...future.stdout) [18:41:43.459] ...future.stdout <- NULL [18:41:43.459] } [18:41:43.459] ...future.result$conditions <- ...future.conditions [18:41:43.459] ...future.result$finished <- base::Sys.time() [18:41:43.459] ...future.result [18:41:43.459] } [18:41:43.465] assign_globals() ... [18:41:43.466] List of 5 [18:41:43.466] $ ...future.FUN :function (x) [18:41:43.466] $ future.call.arguments : list() [18:41:43.466] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.466] $ ...future.elements_ii :List of 3 [18:41:43.466] ..$ : chr "a" [18:41:43.466] ..$ : chr "b" [18:41:43.466] ..$ : chr "c" [18:41:43.466] $ ...future.seeds_ii : NULL [18:41:43.466] $ ...future.globals.maxSize: NULL [18:41:43.466] - attr(*, "where")=List of 5 [18:41:43.466] ..$ ...future.FUN : [18:41:43.466] ..$ future.call.arguments : [18:41:43.466] ..$ ...future.elements_ii : [18:41:43.466] ..$ ...future.seeds_ii : [18:41:43.466] ..$ ...future.globals.maxSize: [18:41:43.466] - attr(*, "resolved")= logi FALSE [18:41:43.466] - attr(*, "total_size")= num 4788 [18:41:43.466] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.466] - attr(*, "already-done")= logi TRUE [18:41:43.475] - copied '...future.FUN' to environment [18:41:43.475] - copied 'future.call.arguments' to environment [18:41:43.476] - copied '...future.elements_ii' to environment [18:41:43.476] - copied '...future.seeds_ii' to environment [18:41:43.476] - copied '...future.globals.maxSize' to environment [18:41:43.476] assign_globals() ... done [18:41:43.477] plan(): Setting new future strategy stack: [18:41:43.477] List of future strategies: [18:41:43.477] 1. sequential: [18:41:43.477] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.477] - tweaked: FALSE [18:41:43.477] - call: NULL [18:41:43.478] plan(): nbrOfWorkers() = 1 [18:41:43.480] plan(): Setting new future strategy stack: [18:41:43.480] List of future strategies: [18:41:43.480] 1. sequential: [18:41:43.480] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.480] - tweaked: FALSE [18:41:43.480] - call: plan(strategy) [18:41:43.481] plan(): nbrOfWorkers() = 1 [18:41:43.482] SequentialFuture started (and completed) [18:41:43.482] - Launch lazy future ... done [18:41:43.482] run() for 'SequentialFuture' ... done [18:41:43.482] Created future: [18:41:43.483] SequentialFuture: [18:41:43.483] Label: 'future_sapply-1' [18:41:43.483] Expression: [18:41:43.483] { [18:41:43.483] do.call(function(...) { [18:41:43.483] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.483] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.483] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.483] on.exit(options(oopts), add = TRUE) [18:41:43.483] } [18:41:43.483] { [18:41:43.483] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.483] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.483] ...future.FUN(...future.X_jj, ...) [18:41:43.483] }) [18:41:43.483] } [18:41:43.483] }, args = future.call.arguments) [18:41:43.483] } [18:41:43.483] Lazy evaluation: FALSE [18:41:43.483] Asynchronous evaluation: FALSE [18:41:43.483] Local evaluation: TRUE [18:41:43.483] Environment: R_GlobalEnv [18:41:43.483] Capture standard output: TRUE [18:41:43.483] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.483] Globals: 5 objects totaling 418 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.483] Packages: [18:41:43.483] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.483] Resolved: TRUE [18:41:43.483] Value: 82 bytes of class 'list' [18:41:43.483] Early signaling: FALSE [18:41:43.483] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.483] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.484] Chunk #1 of 1 ... DONE [18:41:43.485] Launching 1 futures (chunks) ... DONE [18:41:43.485] Resolving 1 futures (chunks) ... [18:41:43.485] resolve() on list ... [18:41:43.485] recursive: 0 [18:41:43.486] length: 1 [18:41:43.486] [18:41:43.486] resolved() for 'SequentialFuture' ... [18:41:43.486] - state: 'finished' [18:41:43.487] - run: TRUE [18:41:43.487] - result: 'FutureResult' [18:41:43.487] resolved() for 'SequentialFuture' ... done [18:41:43.487] Future #1 [18:41:43.488] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.488] - nx: 1 [18:41:43.488] - relay: TRUE [18:41:43.489] - stdout: TRUE [18:41:43.489] - signal: TRUE [18:41:43.489] - resignal: FALSE [18:41:43.489] - force: TRUE [18:41:43.489] - relayed: [n=1] FALSE [18:41:43.490] - queued futures: [n=1] FALSE [18:41:43.490] - until=1 [18:41:43.490] - relaying element #1 [18:41:43.491] - relayed: [n=1] TRUE [18:41:43.491] - queued futures: [n=1] TRUE [18:41:43.491] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.492] length: 0 (resolved future 1) [18:41:43.492] Relaying remaining futures [18:41:43.492] signalConditionsASAP(NULL, pos=0) ... [18:41:43.492] - nx: 1 [18:41:43.493] - relay: TRUE [18:41:43.493] - stdout: TRUE [18:41:43.493] - signal: TRUE [18:41:43.493] - resignal: FALSE [18:41:43.493] - force: TRUE [18:41:43.494] - relayed: [n=1] TRUE [18:41:43.497] - queued futures: [n=1] TRUE - flush all [18:41:43.498] - relayed: [n=1] TRUE [18:41:43.498] - queued futures: [n=1] TRUE [18:41:43.498] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.499] resolve() on list ... DONE [18:41:43.499] - Number of value chunks collected: 1 [18:41:43.499] Resolving 1 futures (chunks) ... DONE [18:41:43.499] Reducing values from 1 chunks ... [18:41:43.500] - Number of values collected after concatenation: 3 [18:41:43.500] - Number of values expected: 3 [18:41:43.500] Reducing values from 1 chunks ... DONE [18:41:43.500] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:43.502] future_lapply() ... [18:41:43.503] Number of chunks: 1 [18:41:43.503] getGlobalsAndPackagesXApply() ... [18:41:43.504] - future.globals: TRUE [18:41:43.504] getGlobalsAndPackages() ... [18:41:43.504] Searching for globals... [18:41:43.506] - globals found: [2] 'FUN', 'UseMethod' [18:41:43.506] Searching for globals ... DONE [18:41:43.507] Resolving globals: FALSE [18:41:43.507] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:43.508] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:43.508] - globals: [1] 'FUN' [18:41:43.509] [18:41:43.509] getGlobalsAndPackages() ... DONE [18:41:43.509] - globals found/used: [n=1] 'FUN' [18:41:43.509] - needed namespaces: [n=0] [18:41:43.510] Finding globals ... DONE [18:41:43.510] - use_args: TRUE [18:41:43.510] - Getting '...' globals ... [18:41:43.511] resolve() on list ... [18:41:43.511] recursive: 0 [18:41:43.511] length: 1 [18:41:43.512] elements: '...' [18:41:43.512] length: 0 (resolved future 1) [18:41:43.512] resolve() on list ... DONE [18:41:43.512] - '...' content: [n=0] [18:41:43.513] List of 1 [18:41:43.513] $ ...: list() [18:41:43.513] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.513] - attr(*, "where")=List of 1 [18:41:43.513] ..$ ...: [18:41:43.513] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.513] - attr(*, "resolved")= logi TRUE [18:41:43.513] - attr(*, "total_size")= num NA [18:41:43.517] - Getting '...' globals ... DONE [18:41:43.517] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.518] List of 2 [18:41:43.518] $ ...future.FUN:function (x, ...) [18:41:43.518] $ ... : list() [18:41:43.518] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.518] - attr(*, "where")=List of 2 [18:41:43.518] ..$ ...future.FUN: [18:41:43.518] ..$ ... : [18:41:43.518] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.518] - attr(*, "resolved")= logi FALSE [18:41:43.518] - attr(*, "total_size")= int 5028 [18:41:43.523] Packages to be attached in all futures: [n=0] [18:41:43.523] getGlobalsAndPackagesXApply() ... DONE [18:41:43.524] Number of futures (= number of chunks): 1 [18:41:43.524] Launching 1 futures (chunks) ... [18:41:43.524] Chunk #1 of 1 ... [18:41:43.525] - Finding globals in 'X' for chunk #1 ... [18:41:43.525] getGlobalsAndPackages() ... [18:41:43.525] Searching for globals... [18:41:43.526] [18:41:43.526] Searching for globals ... DONE [18:41:43.526] - globals: [0] [18:41:43.526] getGlobalsAndPackages() ... DONE [18:41:43.527] + additional globals found: [n=0] [18:41:43.527] + additional namespaces needed: [n=0] [18:41:43.527] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.527] - seeds: [18:41:43.528] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.528] getGlobalsAndPackages() ... [18:41:43.528] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.528] Resolving globals: FALSE [18:41:43.529] Tweak future expression to call with '...' arguments ... [18:41:43.529] { [18:41:43.529] do.call(function(...) { [18:41:43.529] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.529] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.529] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.529] on.exit(options(oopts), add = TRUE) [18:41:43.529] } [18:41:43.529] { [18:41:43.529] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.529] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.529] ...future.FUN(...future.X_jj, ...) [18:41:43.529] }) [18:41:43.529] } [18:41:43.529] }, args = future.call.arguments) [18:41:43.529] } [18:41:43.530] Tweak future expression to call with '...' arguments ... DONE [18:41:43.530] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.531] [18:41:43.531] getGlobalsAndPackages() ... DONE [18:41:43.531] run() for 'Future' ... [18:41:43.532] - state: 'created' [18:41:43.532] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.533] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.533] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.533] - Field: 'label' [18:41:43.534] - Field: 'local' [18:41:43.534] - Field: 'owner' [18:41:43.534] - Field: 'envir' [18:41:43.534] - Field: 'packages' [18:41:43.535] - Field: 'gc' [18:41:43.535] - Field: 'conditions' [18:41:43.535] - Field: 'expr' [18:41:43.536] - Field: 'uuid' [18:41:43.536] - Field: 'seed' [18:41:43.536] - Field: 'version' [18:41:43.536] - Field: 'result' [18:41:43.537] - Field: 'asynchronous' [18:41:43.537] - Field: 'calls' [18:41:43.537] - Field: 'globals' [18:41:43.538] - Field: 'stdout' [18:41:43.538] - Field: 'earlySignal' [18:41:43.538] - Field: 'lazy' [18:41:43.538] - Field: 'state' [18:41:43.539] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.539] - Launch lazy future ... [18:41:43.539] Packages needed by the future expression (n = 0): [18:41:43.540] Packages needed by future strategies (n = 0): [18:41:43.540] { [18:41:43.540] { [18:41:43.540] { [18:41:43.540] ...future.startTime <- base::Sys.time() [18:41:43.540] { [18:41:43.540] { [18:41:43.540] { [18:41:43.540] base::local({ [18:41:43.540] has_future <- base::requireNamespace("future", [18:41:43.540] quietly = TRUE) [18:41:43.540] if (has_future) { [18:41:43.540] ns <- base::getNamespace("future") [18:41:43.540] version <- ns[[".package"]][["version"]] [18:41:43.540] if (is.null(version)) [18:41:43.540] version <- utils::packageVersion("future") [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] version <- NULL [18:41:43.540] } [18:41:43.540] if (!has_future || version < "1.8.0") { [18:41:43.540] info <- base::c(r_version = base::gsub("R version ", [18:41:43.540] "", base::R.version$version.string), [18:41:43.540] platform = base::sprintf("%s (%s-bit)", [18:41:43.540] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.540] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.540] "release", "version")], collapse = " "), [18:41:43.540] hostname = base::Sys.info()[["nodename"]]) [18:41:43.540] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.540] info) [18:41:43.540] info <- base::paste(info, collapse = "; ") [18:41:43.540] if (!has_future) { [18:41:43.540] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.540] info) [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.540] info, version) [18:41:43.540] } [18:41:43.540] base::stop(msg) [18:41:43.540] } [18:41:43.540] }) [18:41:43.540] } [18:41:43.540] ...future.strategy.old <- future::plan("list") [18:41:43.540] options(future.plan = NULL) [18:41:43.540] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.540] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.540] } [18:41:43.540] ...future.workdir <- getwd() [18:41:43.540] } [18:41:43.540] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.540] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.540] } [18:41:43.540] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.540] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.540] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.540] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.540] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.540] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.540] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.540] base::names(...future.oldOptions)) [18:41:43.540] } [18:41:43.540] if (FALSE) { [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] if (TRUE) { [18:41:43.540] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.540] open = "w") [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.540] windows = "NUL", "/dev/null"), open = "w") [18:41:43.540] } [18:41:43.540] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.540] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.540] base::sink(type = "output", split = FALSE) [18:41:43.540] base::close(...future.stdout) [18:41:43.540] }, add = TRUE) [18:41:43.540] } [18:41:43.540] ...future.frame <- base::sys.nframe() [18:41:43.540] ...future.conditions <- base::list() [18:41:43.540] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.540] if (FALSE) { [18:41:43.540] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.540] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.540] } [18:41:43.540] ...future.result <- base::tryCatch({ [18:41:43.540] base::withCallingHandlers({ [18:41:43.540] ...future.value <- base::withVisible(base::local({ [18:41:43.540] do.call(function(...) { [18:41:43.540] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.540] if (!identical(...future.globals.maxSize.org, [18:41:43.540] ...future.globals.maxSize)) { [18:41:43.540] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.540] on.exit(options(oopts), add = TRUE) [18:41:43.540] } [18:41:43.540] { [18:41:43.540] lapply(seq_along(...future.elements_ii), [18:41:43.540] FUN = function(jj) { [18:41:43.540] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.540] ...future.FUN(...future.X_jj, ...) [18:41:43.540] }) [18:41:43.540] } [18:41:43.540] }, args = future.call.arguments) [18:41:43.540] })) [18:41:43.540] future::FutureResult(value = ...future.value$value, [18:41:43.540] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.540] ...future.rng), globalenv = if (FALSE) [18:41:43.540] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.540] ...future.globalenv.names)) [18:41:43.540] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.540] }, condition = base::local({ [18:41:43.540] c <- base::c [18:41:43.540] inherits <- base::inherits [18:41:43.540] invokeRestart <- base::invokeRestart [18:41:43.540] length <- base::length [18:41:43.540] list <- base::list [18:41:43.540] seq.int <- base::seq.int [18:41:43.540] signalCondition <- base::signalCondition [18:41:43.540] sys.calls <- base::sys.calls [18:41:43.540] `[[` <- base::`[[` [18:41:43.540] `+` <- base::`+` [18:41:43.540] `<<-` <- base::`<<-` [18:41:43.540] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.540] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.540] 3L)] [18:41:43.540] } [18:41:43.540] function(cond) { [18:41:43.540] is_error <- inherits(cond, "error") [18:41:43.540] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.540] NULL) [18:41:43.540] if (is_error) { [18:41:43.540] sessionInformation <- function() { [18:41:43.540] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.540] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.540] search = base::search(), system = base::Sys.info()) [18:41:43.540] } [18:41:43.540] ...future.conditions[[length(...future.conditions) + [18:41:43.540] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.540] cond$call), session = sessionInformation(), [18:41:43.540] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.540] signalCondition(cond) [18:41:43.540] } [18:41:43.540] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.540] "immediateCondition"))) { [18:41:43.540] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.540] ...future.conditions[[length(...future.conditions) + [18:41:43.540] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.540] if (TRUE && !signal) { [18:41:43.540] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.540] { [18:41:43.540] inherits <- base::inherits [18:41:43.540] invokeRestart <- base::invokeRestart [18:41:43.540] is.null <- base::is.null [18:41:43.540] muffled <- FALSE [18:41:43.540] if (inherits(cond, "message")) { [18:41:43.540] muffled <- grepl(pattern, "muffleMessage") [18:41:43.540] if (muffled) [18:41:43.540] invokeRestart("muffleMessage") [18:41:43.540] } [18:41:43.540] else if (inherits(cond, "warning")) { [18:41:43.540] muffled <- grepl(pattern, "muffleWarning") [18:41:43.540] if (muffled) [18:41:43.540] invokeRestart("muffleWarning") [18:41:43.540] } [18:41:43.540] else if (inherits(cond, "condition")) { [18:41:43.540] if (!is.null(pattern)) { [18:41:43.540] computeRestarts <- base::computeRestarts [18:41:43.540] grepl <- base::grepl [18:41:43.540] restarts <- computeRestarts(cond) [18:41:43.540] for (restart in restarts) { [18:41:43.540] name <- restart$name [18:41:43.540] if (is.null(name)) [18:41:43.540] next [18:41:43.540] if (!grepl(pattern, name)) [18:41:43.540] next [18:41:43.540] invokeRestart(restart) [18:41:43.540] muffled <- TRUE [18:41:43.540] break [18:41:43.540] } [18:41:43.540] } [18:41:43.540] } [18:41:43.540] invisible(muffled) [18:41:43.540] } [18:41:43.540] muffleCondition(cond, pattern = "^muffle") [18:41:43.540] } [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] if (TRUE) { [18:41:43.540] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.540] { [18:41:43.540] inherits <- base::inherits [18:41:43.540] invokeRestart <- base::invokeRestart [18:41:43.540] is.null <- base::is.null [18:41:43.540] muffled <- FALSE [18:41:43.540] if (inherits(cond, "message")) { [18:41:43.540] muffled <- grepl(pattern, "muffleMessage") [18:41:43.540] if (muffled) [18:41:43.540] invokeRestart("muffleMessage") [18:41:43.540] } [18:41:43.540] else if (inherits(cond, "warning")) { [18:41:43.540] muffled <- grepl(pattern, "muffleWarning") [18:41:43.540] if (muffled) [18:41:43.540] invokeRestart("muffleWarning") [18:41:43.540] } [18:41:43.540] else if (inherits(cond, "condition")) { [18:41:43.540] if (!is.null(pattern)) { [18:41:43.540] computeRestarts <- base::computeRestarts [18:41:43.540] grepl <- base::grepl [18:41:43.540] restarts <- computeRestarts(cond) [18:41:43.540] for (restart in restarts) { [18:41:43.540] name <- restart$name [18:41:43.540] if (is.null(name)) [18:41:43.540] next [18:41:43.540] if (!grepl(pattern, name)) [18:41:43.540] next [18:41:43.540] invokeRestart(restart) [18:41:43.540] muffled <- TRUE [18:41:43.540] break [18:41:43.540] } [18:41:43.540] } [18:41:43.540] } [18:41:43.540] invisible(muffled) [18:41:43.540] } [18:41:43.540] muffleCondition(cond, pattern = "^muffle") [18:41:43.540] } [18:41:43.540] } [18:41:43.540] } [18:41:43.540] })) [18:41:43.540] }, error = function(ex) { [18:41:43.540] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.540] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.540] ...future.rng), started = ...future.startTime, [18:41:43.540] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.540] version = "1.8"), class = "FutureResult") [18:41:43.540] }, finally = { [18:41:43.540] if (!identical(...future.workdir, getwd())) [18:41:43.540] setwd(...future.workdir) [18:41:43.540] { [18:41:43.540] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.540] ...future.oldOptions$nwarnings <- NULL [18:41:43.540] } [18:41:43.540] base::options(...future.oldOptions) [18:41:43.540] if (.Platform$OS.type == "windows") { [18:41:43.540] old_names <- names(...future.oldEnvVars) [18:41:43.540] envs <- base::Sys.getenv() [18:41:43.540] names <- names(envs) [18:41:43.540] common <- intersect(names, old_names) [18:41:43.540] added <- setdiff(names, old_names) [18:41:43.540] removed <- setdiff(old_names, names) [18:41:43.540] changed <- common[...future.oldEnvVars[common] != [18:41:43.540] envs[common]] [18:41:43.540] NAMES <- toupper(changed) [18:41:43.540] args <- list() [18:41:43.540] for (kk in seq_along(NAMES)) { [18:41:43.540] name <- changed[[kk]] [18:41:43.540] NAME <- NAMES[[kk]] [18:41:43.540] if (name != NAME && is.element(NAME, old_names)) [18:41:43.540] next [18:41:43.540] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.540] } [18:41:43.540] NAMES <- toupper(added) [18:41:43.540] for (kk in seq_along(NAMES)) { [18:41:43.540] name <- added[[kk]] [18:41:43.540] NAME <- NAMES[[kk]] [18:41:43.540] if (name != NAME && is.element(NAME, old_names)) [18:41:43.540] next [18:41:43.540] args[[name]] <- "" [18:41:43.540] } [18:41:43.540] NAMES <- toupper(removed) [18:41:43.540] for (kk in seq_along(NAMES)) { [18:41:43.540] name <- removed[[kk]] [18:41:43.540] NAME <- NAMES[[kk]] [18:41:43.540] if (name != NAME && is.element(NAME, old_names)) [18:41:43.540] next [18:41:43.540] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.540] } [18:41:43.540] if (length(args) > 0) [18:41:43.540] base::do.call(base::Sys.setenv, args = args) [18:41:43.540] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.540] } [18:41:43.540] { [18:41:43.540] if (base::length(...future.futureOptionsAdded) > [18:41:43.540] 0L) { [18:41:43.540] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.540] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.540] base::options(opts) [18:41:43.540] } [18:41:43.540] { [18:41:43.540] { [18:41:43.540] NULL [18:41:43.540] RNGkind("Mersenne-Twister") [18:41:43.540] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.540] inherits = FALSE) [18:41:43.540] } [18:41:43.540] options(future.plan = NULL) [18:41:43.540] if (is.na(NA_character_)) [18:41:43.540] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.540] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.540] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.540] .init = FALSE) [18:41:43.540] } [18:41:43.540] } [18:41:43.540] } [18:41:43.540] }) [18:41:43.540] if (TRUE) { [18:41:43.540] base::sink(type = "output", split = FALSE) [18:41:43.540] if (TRUE) { [18:41:43.540] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.540] } [18:41:43.540] else { [18:41:43.540] ...future.result["stdout"] <- base::list(NULL) [18:41:43.540] } [18:41:43.540] base::close(...future.stdout) [18:41:43.540] ...future.stdout <- NULL [18:41:43.540] } [18:41:43.540] ...future.result$conditions <- ...future.conditions [18:41:43.540] ...future.result$finished <- base::Sys.time() [18:41:43.540] ...future.result [18:41:43.540] } [18:41:43.547] assign_globals() ... [18:41:43.547] List of 5 [18:41:43.547] $ ...future.FUN :function (x, ...) [18:41:43.547] $ future.call.arguments : list() [18:41:43.547] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.547] $ ...future.elements_ii :List of 3 [18:41:43.547] ..$ : chr "a" [18:41:43.547] ..$ : chr "b" [18:41:43.547] ..$ : chr "c" [18:41:43.547] $ ...future.seeds_ii : NULL [18:41:43.547] $ ...future.globals.maxSize: NULL [18:41:43.547] - attr(*, "where")=List of 5 [18:41:43.547] ..$ ...future.FUN : [18:41:43.547] ..$ future.call.arguments : [18:41:43.547] ..$ ...future.elements_ii : [18:41:43.547] ..$ ...future.seeds_ii : [18:41:43.547] ..$ ...future.globals.maxSize: [18:41:43.547] - attr(*, "resolved")= logi FALSE [18:41:43.547] - attr(*, "total_size")= num 5028 [18:41:43.547] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.547] - attr(*, "already-done")= logi TRUE [18:41:43.557] - copied '...future.FUN' to environment [18:41:43.557] - copied 'future.call.arguments' to environment [18:41:43.557] - copied '...future.elements_ii' to environment [18:41:43.558] - copied '...future.seeds_ii' to environment [18:41:43.558] - copied '...future.globals.maxSize' to environment [18:41:43.558] assign_globals() ... done [18:41:43.559] plan(): Setting new future strategy stack: [18:41:43.559] List of future strategies: [18:41:43.559] 1. sequential: [18:41:43.559] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.559] - tweaked: FALSE [18:41:43.559] - call: NULL [18:41:43.560] plan(): nbrOfWorkers() = 1 [18:41:43.562] plan(): Setting new future strategy stack: [18:41:43.562] List of future strategies: [18:41:43.562] 1. sequential: [18:41:43.562] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.562] - tweaked: FALSE [18:41:43.562] - call: plan(strategy) [18:41:43.563] plan(): nbrOfWorkers() = 1 [18:41:43.563] SequentialFuture started (and completed) [18:41:43.564] - Launch lazy future ... done [18:41:43.564] run() for 'SequentialFuture' ... done [18:41:43.564] Created future: [18:41:43.564] SequentialFuture: [18:41:43.564] Label: 'future_sapply-1' [18:41:43.564] Expression: [18:41:43.564] { [18:41:43.564] do.call(function(...) { [18:41:43.564] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.564] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.564] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.564] on.exit(options(oopts), add = TRUE) [18:41:43.564] } [18:41:43.564] { [18:41:43.564] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.564] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.564] ...future.FUN(...future.X_jj, ...) [18:41:43.564] }) [18:41:43.564] } [18:41:43.564] }, args = future.call.arguments) [18:41:43.564] } [18:41:43.564] Lazy evaluation: FALSE [18:41:43.564] Asynchronous evaluation: FALSE [18:41:43.564] Local evaluation: TRUE [18:41:43.564] Environment: R_GlobalEnv [18:41:43.564] Capture standard output: TRUE [18:41:43.564] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.564] Globals: 5 objects totaling 511 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.564] Packages: [18:41:43.564] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.564] Resolved: TRUE [18:41:43.564] Value: 177 bytes of class 'list' [18:41:43.564] Early signaling: FALSE [18:41:43.564] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.564] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.566] Chunk #1 of 1 ... DONE [18:41:43.566] Launching 1 futures (chunks) ... DONE [18:41:43.567] Resolving 1 futures (chunks) ... [18:41:43.567] resolve() on list ... [18:41:43.567] recursive: 0 [18:41:43.567] length: 1 [18:41:43.568] [18:41:43.568] resolved() for 'SequentialFuture' ... [18:41:43.568] - state: 'finished' [18:41:43.569] - run: TRUE [18:41:43.569] - result: 'FutureResult' [18:41:43.569] resolved() for 'SequentialFuture' ... done [18:41:43.569] Future #1 [18:41:43.570] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.570] - nx: 1 [18:41:43.570] - relay: TRUE [18:41:43.571] - stdout: TRUE [18:41:43.571] - signal: TRUE [18:41:43.571] - resignal: FALSE [18:41:43.571] - force: TRUE [18:41:43.571] - relayed: [n=1] FALSE [18:41:43.572] - queued futures: [n=1] FALSE [18:41:43.572] - until=1 [18:41:43.572] - relaying element #1 [18:41:43.573] - relayed: [n=1] TRUE [18:41:43.573] - queued futures: [n=1] TRUE [18:41:43.573] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.573] length: 0 (resolved future 1) [18:41:43.574] Relaying remaining futures [18:41:43.574] signalConditionsASAP(NULL, pos=0) ... [18:41:43.574] - nx: 1 [18:41:43.574] - relay: TRUE [18:41:43.575] - stdout: TRUE [18:41:43.575] - signal: TRUE [18:41:43.575] - resignal: FALSE [18:41:43.575] - force: TRUE [18:41:43.576] - relayed: [n=1] TRUE [18:41:43.576] - queued futures: [n=1] TRUE - flush all [18:41:43.576] - relayed: [n=1] TRUE [18:41:43.577] - queued futures: [n=1] TRUE [18:41:43.577] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.577] resolve() on list ... DONE [18:41:43.577] - Number of value chunks collected: 1 [18:41:43.578] Resolving 1 futures (chunks) ... DONE [18:41:43.578] Reducing values from 1 chunks ... [18:41:43.578] - Number of values collected after concatenation: 3 [18:41:43.578] - Number of values expected: 3 [18:41:43.579] Reducing values from 1 chunks ... DONE [18:41:43.579] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:43.580] future_lapply() ... [18:41:43.581] Number of chunks: 1 [18:41:43.582] getGlobalsAndPackagesXApply() ... [18:41:43.582] - future.globals: TRUE [18:41:43.582] getGlobalsAndPackages() ... [18:41:43.582] Searching for globals... [18:41:43.584] - globals found: [1] 'FUN' [18:41:43.585] Searching for globals ... DONE [18:41:43.585] Resolving globals: FALSE [18:41:43.585] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.586] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.586] - globals: [1] 'FUN' [18:41:43.587] [18:41:43.587] getGlobalsAndPackages() ... DONE [18:41:43.587] - globals found/used: [n=1] 'FUN' [18:41:43.587] - needed namespaces: [n=0] [18:41:43.588] Finding globals ... DONE [18:41:43.588] - use_args: TRUE [18:41:43.588] - Getting '...' globals ... [18:41:43.589] resolve() on list ... [18:41:43.589] recursive: 0 [18:41:43.589] length: 1 [18:41:43.590] elements: '...' [18:41:43.590] length: 0 (resolved future 1) [18:41:43.590] resolve() on list ... DONE [18:41:43.590] - '...' content: [n=0] [18:41:43.591] List of 1 [18:41:43.591] $ ...: list() [18:41:43.591] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.591] - attr(*, "where")=List of 1 [18:41:43.591] ..$ ...: [18:41:43.591] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.591] - attr(*, "resolved")= logi TRUE [18:41:43.591] - attr(*, "total_size")= num NA [18:41:43.595] - Getting '...' globals ... DONE [18:41:43.595] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.596] List of 2 [18:41:43.596] $ ...future.FUN:function (x) [18:41:43.596] $ ... : list() [18:41:43.596] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.596] - attr(*, "where")=List of 2 [18:41:43.596] ..$ ...future.FUN: [18:41:43.596] ..$ ... : [18:41:43.596] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.596] - attr(*, "resolved")= logi FALSE [18:41:43.596] - attr(*, "total_size")= int 4788 [18:41:43.601] Packages to be attached in all futures: [n=0] [18:41:43.601] getGlobalsAndPackagesXApply() ... DONE [18:41:43.601] Number of futures (= number of chunks): 1 [18:41:43.602] Launching 1 futures (chunks) ... [18:41:43.602] Chunk #1 of 1 ... [18:41:43.602] - Finding globals in 'X' for chunk #1 ... [18:41:43.603] getGlobalsAndPackages() ... [18:41:43.603] Searching for globals... [18:41:43.603] [18:41:43.603] Searching for globals ... DONE [18:41:43.604] - globals: [0] [18:41:43.604] getGlobalsAndPackages() ... DONE [18:41:43.604] + additional globals found: [n=0] [18:41:43.604] + additional namespaces needed: [n=0] [18:41:43.605] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.605] - seeds: [18:41:43.605] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.605] getGlobalsAndPackages() ... [18:41:43.606] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.606] Resolving globals: FALSE [18:41:43.606] Tweak future expression to call with '...' arguments ... [18:41:43.606] { [18:41:43.606] do.call(function(...) { [18:41:43.606] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.606] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.606] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.606] on.exit(options(oopts), add = TRUE) [18:41:43.606] } [18:41:43.606] { [18:41:43.606] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.606] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.606] ...future.FUN(...future.X_jj, ...) [18:41:43.606] }) [18:41:43.606] } [18:41:43.606] }, args = future.call.arguments) [18:41:43.606] } [18:41:43.607] Tweak future expression to call with '...' arguments ... DONE [18:41:43.608] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.608] [18:41:43.608] getGlobalsAndPackages() ... DONE [18:41:43.609] run() for 'Future' ... [18:41:43.609] - state: 'created' [18:41:43.609] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.610] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.610] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.611] - Field: 'label' [18:41:43.611] - Field: 'local' [18:41:43.611] - Field: 'owner' [18:41:43.611] - Field: 'envir' [18:41:43.612] - Field: 'packages' [18:41:43.612] - Field: 'gc' [18:41:43.612] - Field: 'conditions' [18:41:43.612] - Field: 'expr' [18:41:43.613] - Field: 'uuid' [18:41:43.613] - Field: 'seed' [18:41:43.613] - Field: 'version' [18:41:43.614] - Field: 'result' [18:41:43.614] - Field: 'asynchronous' [18:41:43.614] - Field: 'calls' [18:41:43.615] - Field: 'globals' [18:41:43.615] - Field: 'stdout' [18:41:43.615] - Field: 'earlySignal' [18:41:43.616] - Field: 'lazy' [18:41:43.616] - Field: 'state' [18:41:43.616] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.617] - Launch lazy future ... [18:41:43.617] Packages needed by the future expression (n = 0): [18:41:43.617] Packages needed by future strategies (n = 0): [18:41:43.618] { [18:41:43.618] { [18:41:43.618] { [18:41:43.618] ...future.startTime <- base::Sys.time() [18:41:43.618] { [18:41:43.618] { [18:41:43.618] { [18:41:43.618] base::local({ [18:41:43.618] has_future <- base::requireNamespace("future", [18:41:43.618] quietly = TRUE) [18:41:43.618] if (has_future) { [18:41:43.618] ns <- base::getNamespace("future") [18:41:43.618] version <- ns[[".package"]][["version"]] [18:41:43.618] if (is.null(version)) [18:41:43.618] version <- utils::packageVersion("future") [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] version <- NULL [18:41:43.618] } [18:41:43.618] if (!has_future || version < "1.8.0") { [18:41:43.618] info <- base::c(r_version = base::gsub("R version ", [18:41:43.618] "", base::R.version$version.string), [18:41:43.618] platform = base::sprintf("%s (%s-bit)", [18:41:43.618] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.618] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.618] "release", "version")], collapse = " "), [18:41:43.618] hostname = base::Sys.info()[["nodename"]]) [18:41:43.618] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.618] info) [18:41:43.618] info <- base::paste(info, collapse = "; ") [18:41:43.618] if (!has_future) { [18:41:43.618] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.618] info) [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.618] info, version) [18:41:43.618] } [18:41:43.618] base::stop(msg) [18:41:43.618] } [18:41:43.618] }) [18:41:43.618] } [18:41:43.618] ...future.strategy.old <- future::plan("list") [18:41:43.618] options(future.plan = NULL) [18:41:43.618] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.618] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.618] } [18:41:43.618] ...future.workdir <- getwd() [18:41:43.618] } [18:41:43.618] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.618] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.618] } [18:41:43.618] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.618] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.618] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.618] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.618] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.618] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.618] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.618] base::names(...future.oldOptions)) [18:41:43.618] } [18:41:43.618] if (FALSE) { [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] if (TRUE) { [18:41:43.618] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.618] open = "w") [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.618] windows = "NUL", "/dev/null"), open = "w") [18:41:43.618] } [18:41:43.618] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.618] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.618] base::sink(type = "output", split = FALSE) [18:41:43.618] base::close(...future.stdout) [18:41:43.618] }, add = TRUE) [18:41:43.618] } [18:41:43.618] ...future.frame <- base::sys.nframe() [18:41:43.618] ...future.conditions <- base::list() [18:41:43.618] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.618] if (FALSE) { [18:41:43.618] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.618] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.618] } [18:41:43.618] ...future.result <- base::tryCatch({ [18:41:43.618] base::withCallingHandlers({ [18:41:43.618] ...future.value <- base::withVisible(base::local({ [18:41:43.618] do.call(function(...) { [18:41:43.618] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.618] if (!identical(...future.globals.maxSize.org, [18:41:43.618] ...future.globals.maxSize)) { [18:41:43.618] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.618] on.exit(options(oopts), add = TRUE) [18:41:43.618] } [18:41:43.618] { [18:41:43.618] lapply(seq_along(...future.elements_ii), [18:41:43.618] FUN = function(jj) { [18:41:43.618] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.618] ...future.FUN(...future.X_jj, ...) [18:41:43.618] }) [18:41:43.618] } [18:41:43.618] }, args = future.call.arguments) [18:41:43.618] })) [18:41:43.618] future::FutureResult(value = ...future.value$value, [18:41:43.618] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.618] ...future.rng), globalenv = if (FALSE) [18:41:43.618] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.618] ...future.globalenv.names)) [18:41:43.618] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.618] }, condition = base::local({ [18:41:43.618] c <- base::c [18:41:43.618] inherits <- base::inherits [18:41:43.618] invokeRestart <- base::invokeRestart [18:41:43.618] length <- base::length [18:41:43.618] list <- base::list [18:41:43.618] seq.int <- base::seq.int [18:41:43.618] signalCondition <- base::signalCondition [18:41:43.618] sys.calls <- base::sys.calls [18:41:43.618] `[[` <- base::`[[` [18:41:43.618] `+` <- base::`+` [18:41:43.618] `<<-` <- base::`<<-` [18:41:43.618] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.618] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.618] 3L)] [18:41:43.618] } [18:41:43.618] function(cond) { [18:41:43.618] is_error <- inherits(cond, "error") [18:41:43.618] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.618] NULL) [18:41:43.618] if (is_error) { [18:41:43.618] sessionInformation <- function() { [18:41:43.618] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.618] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.618] search = base::search(), system = base::Sys.info()) [18:41:43.618] } [18:41:43.618] ...future.conditions[[length(...future.conditions) + [18:41:43.618] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.618] cond$call), session = sessionInformation(), [18:41:43.618] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.618] signalCondition(cond) [18:41:43.618] } [18:41:43.618] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.618] "immediateCondition"))) { [18:41:43.618] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.618] ...future.conditions[[length(...future.conditions) + [18:41:43.618] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.618] if (TRUE && !signal) { [18:41:43.618] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.618] { [18:41:43.618] inherits <- base::inherits [18:41:43.618] invokeRestart <- base::invokeRestart [18:41:43.618] is.null <- base::is.null [18:41:43.618] muffled <- FALSE [18:41:43.618] if (inherits(cond, "message")) { [18:41:43.618] muffled <- grepl(pattern, "muffleMessage") [18:41:43.618] if (muffled) [18:41:43.618] invokeRestart("muffleMessage") [18:41:43.618] } [18:41:43.618] else if (inherits(cond, "warning")) { [18:41:43.618] muffled <- grepl(pattern, "muffleWarning") [18:41:43.618] if (muffled) [18:41:43.618] invokeRestart("muffleWarning") [18:41:43.618] } [18:41:43.618] else if (inherits(cond, "condition")) { [18:41:43.618] if (!is.null(pattern)) { [18:41:43.618] computeRestarts <- base::computeRestarts [18:41:43.618] grepl <- base::grepl [18:41:43.618] restarts <- computeRestarts(cond) [18:41:43.618] for (restart in restarts) { [18:41:43.618] name <- restart$name [18:41:43.618] if (is.null(name)) [18:41:43.618] next [18:41:43.618] if (!grepl(pattern, name)) [18:41:43.618] next [18:41:43.618] invokeRestart(restart) [18:41:43.618] muffled <- TRUE [18:41:43.618] break [18:41:43.618] } [18:41:43.618] } [18:41:43.618] } [18:41:43.618] invisible(muffled) [18:41:43.618] } [18:41:43.618] muffleCondition(cond, pattern = "^muffle") [18:41:43.618] } [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] if (TRUE) { [18:41:43.618] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.618] { [18:41:43.618] inherits <- base::inherits [18:41:43.618] invokeRestart <- base::invokeRestart [18:41:43.618] is.null <- base::is.null [18:41:43.618] muffled <- FALSE [18:41:43.618] if (inherits(cond, "message")) { [18:41:43.618] muffled <- grepl(pattern, "muffleMessage") [18:41:43.618] if (muffled) [18:41:43.618] invokeRestart("muffleMessage") [18:41:43.618] } [18:41:43.618] else if (inherits(cond, "warning")) { [18:41:43.618] muffled <- grepl(pattern, "muffleWarning") [18:41:43.618] if (muffled) [18:41:43.618] invokeRestart("muffleWarning") [18:41:43.618] } [18:41:43.618] else if (inherits(cond, "condition")) { [18:41:43.618] if (!is.null(pattern)) { [18:41:43.618] computeRestarts <- base::computeRestarts [18:41:43.618] grepl <- base::grepl [18:41:43.618] restarts <- computeRestarts(cond) [18:41:43.618] for (restart in restarts) { [18:41:43.618] name <- restart$name [18:41:43.618] if (is.null(name)) [18:41:43.618] next [18:41:43.618] if (!grepl(pattern, name)) [18:41:43.618] next [18:41:43.618] invokeRestart(restart) [18:41:43.618] muffled <- TRUE [18:41:43.618] break [18:41:43.618] } [18:41:43.618] } [18:41:43.618] } [18:41:43.618] invisible(muffled) [18:41:43.618] } [18:41:43.618] muffleCondition(cond, pattern = "^muffle") [18:41:43.618] } [18:41:43.618] } [18:41:43.618] } [18:41:43.618] })) [18:41:43.618] }, error = function(ex) { [18:41:43.618] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.618] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.618] ...future.rng), started = ...future.startTime, [18:41:43.618] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.618] version = "1.8"), class = "FutureResult") [18:41:43.618] }, finally = { [18:41:43.618] if (!identical(...future.workdir, getwd())) [18:41:43.618] setwd(...future.workdir) [18:41:43.618] { [18:41:43.618] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.618] ...future.oldOptions$nwarnings <- NULL [18:41:43.618] } [18:41:43.618] base::options(...future.oldOptions) [18:41:43.618] if (.Platform$OS.type == "windows") { [18:41:43.618] old_names <- names(...future.oldEnvVars) [18:41:43.618] envs <- base::Sys.getenv() [18:41:43.618] names <- names(envs) [18:41:43.618] common <- intersect(names, old_names) [18:41:43.618] added <- setdiff(names, old_names) [18:41:43.618] removed <- setdiff(old_names, names) [18:41:43.618] changed <- common[...future.oldEnvVars[common] != [18:41:43.618] envs[common]] [18:41:43.618] NAMES <- toupper(changed) [18:41:43.618] args <- list() [18:41:43.618] for (kk in seq_along(NAMES)) { [18:41:43.618] name <- changed[[kk]] [18:41:43.618] NAME <- NAMES[[kk]] [18:41:43.618] if (name != NAME && is.element(NAME, old_names)) [18:41:43.618] next [18:41:43.618] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.618] } [18:41:43.618] NAMES <- toupper(added) [18:41:43.618] for (kk in seq_along(NAMES)) { [18:41:43.618] name <- added[[kk]] [18:41:43.618] NAME <- NAMES[[kk]] [18:41:43.618] if (name != NAME && is.element(NAME, old_names)) [18:41:43.618] next [18:41:43.618] args[[name]] <- "" [18:41:43.618] } [18:41:43.618] NAMES <- toupper(removed) [18:41:43.618] for (kk in seq_along(NAMES)) { [18:41:43.618] name <- removed[[kk]] [18:41:43.618] NAME <- NAMES[[kk]] [18:41:43.618] if (name != NAME && is.element(NAME, old_names)) [18:41:43.618] next [18:41:43.618] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.618] } [18:41:43.618] if (length(args) > 0) [18:41:43.618] base::do.call(base::Sys.setenv, args = args) [18:41:43.618] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.618] } [18:41:43.618] { [18:41:43.618] if (base::length(...future.futureOptionsAdded) > [18:41:43.618] 0L) { [18:41:43.618] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.618] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.618] base::options(opts) [18:41:43.618] } [18:41:43.618] { [18:41:43.618] { [18:41:43.618] NULL [18:41:43.618] RNGkind("Mersenne-Twister") [18:41:43.618] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.618] inherits = FALSE) [18:41:43.618] } [18:41:43.618] options(future.plan = NULL) [18:41:43.618] if (is.na(NA_character_)) [18:41:43.618] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.618] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.618] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.618] .init = FALSE) [18:41:43.618] } [18:41:43.618] } [18:41:43.618] } [18:41:43.618] }) [18:41:43.618] if (TRUE) { [18:41:43.618] base::sink(type = "output", split = FALSE) [18:41:43.618] if (TRUE) { [18:41:43.618] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.618] } [18:41:43.618] else { [18:41:43.618] ...future.result["stdout"] <- base::list(NULL) [18:41:43.618] } [18:41:43.618] base::close(...future.stdout) [18:41:43.618] ...future.stdout <- NULL [18:41:43.618] } [18:41:43.618] ...future.result$conditions <- ...future.conditions [18:41:43.618] ...future.result$finished <- base::Sys.time() [18:41:43.618] ...future.result [18:41:43.618] } [18:41:43.625] assign_globals() ... [18:41:43.625] List of 5 [18:41:43.625] $ ...future.FUN :function (x) [18:41:43.625] $ future.call.arguments : list() [18:41:43.625] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.625] $ ...future.elements_ii :List of 3 [18:41:43.625] ..$ : chr "a" [18:41:43.625] ..$ : chr "b" [18:41:43.625] ..$ : chr "c" [18:41:43.625] $ ...future.seeds_ii : NULL [18:41:43.625] $ ...future.globals.maxSize: NULL [18:41:43.625] - attr(*, "where")=List of 5 [18:41:43.625] ..$ ...future.FUN : [18:41:43.625] ..$ future.call.arguments : [18:41:43.625] ..$ ...future.elements_ii : [18:41:43.625] ..$ ...future.seeds_ii : [18:41:43.625] ..$ ...future.globals.maxSize: [18:41:43.625] - attr(*, "resolved")= logi FALSE [18:41:43.625] - attr(*, "total_size")= num 4788 [18:41:43.625] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.625] - attr(*, "already-done")= logi TRUE [18:41:43.636] - copied '...future.FUN' to environment [18:41:43.636] - copied 'future.call.arguments' to environment [18:41:43.636] - copied '...future.elements_ii' to environment [18:41:43.637] - copied '...future.seeds_ii' to environment [18:41:43.637] - copied '...future.globals.maxSize' to environment [18:41:43.637] assign_globals() ... done [18:41:43.638] plan(): Setting new future strategy stack: [18:41:43.638] List of future strategies: [18:41:43.638] 1. sequential: [18:41:43.638] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.638] - tweaked: FALSE [18:41:43.638] - call: NULL [18:41:43.639] plan(): nbrOfWorkers() = 1 [18:41:43.641] plan(): Setting new future strategy stack: [18:41:43.642] List of future strategies: [18:41:43.642] 1. sequential: [18:41:43.642] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.642] - tweaked: FALSE [18:41:43.642] - call: plan(strategy) [18:41:43.643] plan(): nbrOfWorkers() = 1 [18:41:43.643] SequentialFuture started (and completed) [18:41:43.643] - Launch lazy future ... done [18:41:43.644] run() for 'SequentialFuture' ... done [18:41:43.644] Created future: [18:41:43.644] SequentialFuture: [18:41:43.644] Label: 'future_sapply-1' [18:41:43.644] Expression: [18:41:43.644] { [18:41:43.644] do.call(function(...) { [18:41:43.644] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.644] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.644] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.644] on.exit(options(oopts), add = TRUE) [18:41:43.644] } [18:41:43.644] { [18:41:43.644] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.644] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.644] ...future.FUN(...future.X_jj, ...) [18:41:43.644] }) [18:41:43.644] } [18:41:43.644] }, args = future.call.arguments) [18:41:43.644] } [18:41:43.644] Lazy evaluation: FALSE [18:41:43.644] Asynchronous evaluation: FALSE [18:41:43.644] Local evaluation: TRUE [18:41:43.644] Environment: R_GlobalEnv [18:41:43.644] Capture standard output: TRUE [18:41:43.644] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.644] Globals: 5 objects totaling 418 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.644] Packages: [18:41:43.644] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.644] Resolved: TRUE [18:41:43.644] Value: 82 bytes of class 'list' [18:41:43.644] Early signaling: FALSE [18:41:43.644] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.644] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.646] Chunk #1 of 1 ... DONE [18:41:43.646] Launching 1 futures (chunks) ... DONE [18:41:43.647] Resolving 1 futures (chunks) ... [18:41:43.647] resolve() on list ... [18:41:43.647] recursive: 0 [18:41:43.647] length: 1 [18:41:43.648] [18:41:43.648] resolved() for 'SequentialFuture' ... [18:41:43.648] - state: 'finished' [18:41:43.649] - run: TRUE [18:41:43.649] - result: 'FutureResult' [18:41:43.649] resolved() for 'SequentialFuture' ... done [18:41:43.650] Future #1 [18:41:43.650] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.650] - nx: 1 [18:41:43.650] - relay: TRUE [18:41:43.651] - stdout: TRUE [18:41:43.651] - signal: TRUE [18:41:43.651] - resignal: FALSE [18:41:43.651] - force: TRUE [18:41:43.652] - relayed: [n=1] FALSE [18:41:43.652] - queued futures: [n=1] FALSE [18:41:43.652] - until=1 [18:41:43.652] - relaying element #1 [18:41:43.653] - relayed: [n=1] TRUE [18:41:43.653] - queued futures: [n=1] TRUE [18:41:43.653] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.654] length: 0 (resolved future 1) [18:41:43.654] Relaying remaining futures [18:41:43.654] signalConditionsASAP(NULL, pos=0) ... [18:41:43.655] - nx: 1 [18:41:43.655] - relay: TRUE [18:41:43.655] - stdout: TRUE [18:41:43.655] - signal: TRUE [18:41:43.656] - resignal: FALSE [18:41:43.656] - force: TRUE [18:41:43.656] - relayed: [n=1] TRUE [18:41:43.656] - queued futures: [n=1] TRUE - flush all [18:41:43.657] - relayed: [n=1] TRUE [18:41:43.657] - queued futures: [n=1] TRUE [18:41:43.657] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.657] resolve() on list ... DONE [18:41:43.658] - Number of value chunks collected: 1 [18:41:43.658] Resolving 1 futures (chunks) ... DONE [18:41:43.658] Reducing values from 1 chunks ... [18:41:43.659] - Number of values collected after concatenation: 3 [18:41:43.659] - Number of values expected: 3 [18:41:43.659] Reducing values from 1 chunks ... DONE [18:41:43.659] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: chr "a" ..$ b: chr "b" ..$ c: chr "c" $ y1:List of 3 ..$ a: chr "a" ..$ b: chr "b" ..$ c: chr "c" List of 2 $ y0:List of 3 ..$ a: chr "a" ..$ b: chr "b" ..$ c: chr "c" $ y2:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" [18:41:43.675] future_lapply() ... [18:41:43.676] Number of chunks: 1 [18:41:43.676] getGlobalsAndPackagesXApply() ... [18:41:43.677] - future.globals: TRUE [18:41:43.677] getGlobalsAndPackages() ... [18:41:43.677] Searching for globals... [18:41:43.679] - globals found: [2] 'FUN', 'UseMethod' [18:41:43.679] Searching for globals ... DONE [18:41:43.680] Resolving globals: FALSE [18:41:43.680] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:43.681] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:43.681] - globals: [1] 'FUN' [18:41:43.682] [18:41:43.682] getGlobalsAndPackages() ... DONE [18:41:43.682] - globals found/used: [n=1] 'FUN' [18:41:43.682] - needed namespaces: [n=0] [18:41:43.683] Finding globals ... DONE [18:41:43.683] - use_args: TRUE [18:41:43.683] - Getting '...' globals ... [18:41:43.684] resolve() on list ... [18:41:43.684] recursive: 0 [18:41:43.685] length: 1 [18:41:43.685] elements: '...' [18:41:43.685] length: 0 (resolved future 1) [18:41:43.685] resolve() on list ... DONE [18:41:43.686] - '...' content: [n=0] [18:41:43.686] List of 1 [18:41:43.686] $ ...: list() [18:41:43.686] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.686] - attr(*, "where")=List of 1 [18:41:43.686] ..$ ...: [18:41:43.686] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.686] - attr(*, "resolved")= logi TRUE [18:41:43.686] - attr(*, "total_size")= num NA [18:41:43.691] - Getting '...' globals ... DONE [18:41:43.691] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.691] List of 2 [18:41:43.691] $ ...future.FUN:function (x, ...) [18:41:43.691] $ ... : list() [18:41:43.691] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.691] - attr(*, "where")=List of 2 [18:41:43.691] ..$ ...future.FUN: [18:41:43.691] ..$ ... : [18:41:43.691] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.691] - attr(*, "resolved")= logi FALSE [18:41:43.691] - attr(*, "total_size")= int 5028 [18:41:43.697] Packages to be attached in all futures: [n=0] [18:41:43.697] getGlobalsAndPackagesXApply() ... DONE [18:41:43.698] Number of futures (= number of chunks): 1 [18:41:43.698] Launching 1 futures (chunks) ... [18:41:43.699] Chunk #1 of 1 ... [18:41:43.699] - Finding globals in 'X' for chunk #1 ... [18:41:43.699] getGlobalsAndPackages() ... [18:41:43.699] Searching for globals... [18:41:43.700] [18:41:43.700] Searching for globals ... DONE [18:41:43.701] - globals: [0] [18:41:43.701] getGlobalsAndPackages() ... DONE [18:41:43.701] + additional globals found: [n=0] [18:41:43.701] + additional namespaces needed: [n=0] [18:41:43.702] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.702] - seeds: [18:41:43.702] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.703] getGlobalsAndPackages() ... [18:41:43.703] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.703] Resolving globals: FALSE [18:41:43.704] Tweak future expression to call with '...' arguments ... [18:41:43.704] { [18:41:43.704] do.call(function(...) { [18:41:43.704] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.704] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.704] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.704] on.exit(options(oopts), add = TRUE) [18:41:43.704] } [18:41:43.704] { [18:41:43.704] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.704] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.704] ...future.FUN(...future.X_jj, ...) [18:41:43.704] }) [18:41:43.704] } [18:41:43.704] }, args = future.call.arguments) [18:41:43.704] } [18:41:43.705] Tweak future expression to call with '...' arguments ... DONE [18:41:43.706] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.706] [18:41:43.706] getGlobalsAndPackages() ... DONE [18:41:43.707] run() for 'Future' ... [18:41:43.707] - state: 'created' [18:41:43.708] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.708] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.709] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.709] - Field: 'label' [18:41:43.709] - Field: 'local' [18:41:43.710] - Field: 'owner' [18:41:43.710] - Field: 'envir' [18:41:43.710] - Field: 'packages' [18:41:43.711] - Field: 'gc' [18:41:43.711] - Field: 'conditions' [18:41:43.711] - Field: 'expr' [18:41:43.711] - Field: 'uuid' [18:41:43.712] - Field: 'seed' [18:41:43.712] - Field: 'version' [18:41:43.712] - Field: 'result' [18:41:43.713] - Field: 'asynchronous' [18:41:43.713] - Field: 'calls' [18:41:43.713] - Field: 'globals' [18:41:43.714] - Field: 'stdout' [18:41:43.714] - Field: 'earlySignal' [18:41:43.714] - Field: 'lazy' [18:41:43.715] - Field: 'state' [18:41:43.715] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.715] - Launch lazy future ... [18:41:43.716] Packages needed by the future expression (n = 0): [18:41:43.716] Packages needed by future strategies (n = 0): [18:41:43.717] { [18:41:43.717] { [18:41:43.717] { [18:41:43.717] ...future.startTime <- base::Sys.time() [18:41:43.717] { [18:41:43.717] { [18:41:43.717] { [18:41:43.717] base::local({ [18:41:43.717] has_future <- base::requireNamespace("future", [18:41:43.717] quietly = TRUE) [18:41:43.717] if (has_future) { [18:41:43.717] ns <- base::getNamespace("future") [18:41:43.717] version <- ns[[".package"]][["version"]] [18:41:43.717] if (is.null(version)) [18:41:43.717] version <- utils::packageVersion("future") [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] version <- NULL [18:41:43.717] } [18:41:43.717] if (!has_future || version < "1.8.0") { [18:41:43.717] info <- base::c(r_version = base::gsub("R version ", [18:41:43.717] "", base::R.version$version.string), [18:41:43.717] platform = base::sprintf("%s (%s-bit)", [18:41:43.717] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.717] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.717] "release", "version")], collapse = " "), [18:41:43.717] hostname = base::Sys.info()[["nodename"]]) [18:41:43.717] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.717] info) [18:41:43.717] info <- base::paste(info, collapse = "; ") [18:41:43.717] if (!has_future) { [18:41:43.717] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.717] info) [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.717] info, version) [18:41:43.717] } [18:41:43.717] base::stop(msg) [18:41:43.717] } [18:41:43.717] }) [18:41:43.717] } [18:41:43.717] ...future.strategy.old <- future::plan("list") [18:41:43.717] options(future.plan = NULL) [18:41:43.717] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.717] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.717] } [18:41:43.717] ...future.workdir <- getwd() [18:41:43.717] } [18:41:43.717] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.717] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.717] } [18:41:43.717] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.717] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.717] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.717] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.717] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.717] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.717] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.717] base::names(...future.oldOptions)) [18:41:43.717] } [18:41:43.717] if (FALSE) { [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] if (TRUE) { [18:41:43.717] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.717] open = "w") [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.717] windows = "NUL", "/dev/null"), open = "w") [18:41:43.717] } [18:41:43.717] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.717] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.717] base::sink(type = "output", split = FALSE) [18:41:43.717] base::close(...future.stdout) [18:41:43.717] }, add = TRUE) [18:41:43.717] } [18:41:43.717] ...future.frame <- base::sys.nframe() [18:41:43.717] ...future.conditions <- base::list() [18:41:43.717] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.717] if (FALSE) { [18:41:43.717] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.717] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.717] } [18:41:43.717] ...future.result <- base::tryCatch({ [18:41:43.717] base::withCallingHandlers({ [18:41:43.717] ...future.value <- base::withVisible(base::local({ [18:41:43.717] do.call(function(...) { [18:41:43.717] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.717] if (!identical(...future.globals.maxSize.org, [18:41:43.717] ...future.globals.maxSize)) { [18:41:43.717] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.717] on.exit(options(oopts), add = TRUE) [18:41:43.717] } [18:41:43.717] { [18:41:43.717] lapply(seq_along(...future.elements_ii), [18:41:43.717] FUN = function(jj) { [18:41:43.717] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.717] ...future.FUN(...future.X_jj, ...) [18:41:43.717] }) [18:41:43.717] } [18:41:43.717] }, args = future.call.arguments) [18:41:43.717] })) [18:41:43.717] future::FutureResult(value = ...future.value$value, [18:41:43.717] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.717] ...future.rng), globalenv = if (FALSE) [18:41:43.717] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.717] ...future.globalenv.names)) [18:41:43.717] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.717] }, condition = base::local({ [18:41:43.717] c <- base::c [18:41:43.717] inherits <- base::inherits [18:41:43.717] invokeRestart <- base::invokeRestart [18:41:43.717] length <- base::length [18:41:43.717] list <- base::list [18:41:43.717] seq.int <- base::seq.int [18:41:43.717] signalCondition <- base::signalCondition [18:41:43.717] sys.calls <- base::sys.calls [18:41:43.717] `[[` <- base::`[[` [18:41:43.717] `+` <- base::`+` [18:41:43.717] `<<-` <- base::`<<-` [18:41:43.717] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.717] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.717] 3L)] [18:41:43.717] } [18:41:43.717] function(cond) { [18:41:43.717] is_error <- inherits(cond, "error") [18:41:43.717] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.717] NULL) [18:41:43.717] if (is_error) { [18:41:43.717] sessionInformation <- function() { [18:41:43.717] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.717] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.717] search = base::search(), system = base::Sys.info()) [18:41:43.717] } [18:41:43.717] ...future.conditions[[length(...future.conditions) + [18:41:43.717] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.717] cond$call), session = sessionInformation(), [18:41:43.717] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.717] signalCondition(cond) [18:41:43.717] } [18:41:43.717] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.717] "immediateCondition"))) { [18:41:43.717] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.717] ...future.conditions[[length(...future.conditions) + [18:41:43.717] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.717] if (TRUE && !signal) { [18:41:43.717] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.717] { [18:41:43.717] inherits <- base::inherits [18:41:43.717] invokeRestart <- base::invokeRestart [18:41:43.717] is.null <- base::is.null [18:41:43.717] muffled <- FALSE [18:41:43.717] if (inherits(cond, "message")) { [18:41:43.717] muffled <- grepl(pattern, "muffleMessage") [18:41:43.717] if (muffled) [18:41:43.717] invokeRestart("muffleMessage") [18:41:43.717] } [18:41:43.717] else if (inherits(cond, "warning")) { [18:41:43.717] muffled <- grepl(pattern, "muffleWarning") [18:41:43.717] if (muffled) [18:41:43.717] invokeRestart("muffleWarning") [18:41:43.717] } [18:41:43.717] else if (inherits(cond, "condition")) { [18:41:43.717] if (!is.null(pattern)) { [18:41:43.717] computeRestarts <- base::computeRestarts [18:41:43.717] grepl <- base::grepl [18:41:43.717] restarts <- computeRestarts(cond) [18:41:43.717] for (restart in restarts) { [18:41:43.717] name <- restart$name [18:41:43.717] if (is.null(name)) [18:41:43.717] next [18:41:43.717] if (!grepl(pattern, name)) [18:41:43.717] next [18:41:43.717] invokeRestart(restart) [18:41:43.717] muffled <- TRUE [18:41:43.717] break [18:41:43.717] } [18:41:43.717] } [18:41:43.717] } [18:41:43.717] invisible(muffled) [18:41:43.717] } [18:41:43.717] muffleCondition(cond, pattern = "^muffle") [18:41:43.717] } [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] if (TRUE) { [18:41:43.717] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.717] { [18:41:43.717] inherits <- base::inherits [18:41:43.717] invokeRestart <- base::invokeRestart [18:41:43.717] is.null <- base::is.null [18:41:43.717] muffled <- FALSE [18:41:43.717] if (inherits(cond, "message")) { [18:41:43.717] muffled <- grepl(pattern, "muffleMessage") [18:41:43.717] if (muffled) [18:41:43.717] invokeRestart("muffleMessage") [18:41:43.717] } [18:41:43.717] else if (inherits(cond, "warning")) { [18:41:43.717] muffled <- grepl(pattern, "muffleWarning") [18:41:43.717] if (muffled) [18:41:43.717] invokeRestart("muffleWarning") [18:41:43.717] } [18:41:43.717] else if (inherits(cond, "condition")) { [18:41:43.717] if (!is.null(pattern)) { [18:41:43.717] computeRestarts <- base::computeRestarts [18:41:43.717] grepl <- base::grepl [18:41:43.717] restarts <- computeRestarts(cond) [18:41:43.717] for (restart in restarts) { [18:41:43.717] name <- restart$name [18:41:43.717] if (is.null(name)) [18:41:43.717] next [18:41:43.717] if (!grepl(pattern, name)) [18:41:43.717] next [18:41:43.717] invokeRestart(restart) [18:41:43.717] muffled <- TRUE [18:41:43.717] break [18:41:43.717] } [18:41:43.717] } [18:41:43.717] } [18:41:43.717] invisible(muffled) [18:41:43.717] } [18:41:43.717] muffleCondition(cond, pattern = "^muffle") [18:41:43.717] } [18:41:43.717] } [18:41:43.717] } [18:41:43.717] })) [18:41:43.717] }, error = function(ex) { [18:41:43.717] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.717] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.717] ...future.rng), started = ...future.startTime, [18:41:43.717] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.717] version = "1.8"), class = "FutureResult") [18:41:43.717] }, finally = { [18:41:43.717] if (!identical(...future.workdir, getwd())) [18:41:43.717] setwd(...future.workdir) [18:41:43.717] { [18:41:43.717] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.717] ...future.oldOptions$nwarnings <- NULL [18:41:43.717] } [18:41:43.717] base::options(...future.oldOptions) [18:41:43.717] if (.Platform$OS.type == "windows") { [18:41:43.717] old_names <- names(...future.oldEnvVars) [18:41:43.717] envs <- base::Sys.getenv() [18:41:43.717] names <- names(envs) [18:41:43.717] common <- intersect(names, old_names) [18:41:43.717] added <- setdiff(names, old_names) [18:41:43.717] removed <- setdiff(old_names, names) [18:41:43.717] changed <- common[...future.oldEnvVars[common] != [18:41:43.717] envs[common]] [18:41:43.717] NAMES <- toupper(changed) [18:41:43.717] args <- list() [18:41:43.717] for (kk in seq_along(NAMES)) { [18:41:43.717] name <- changed[[kk]] [18:41:43.717] NAME <- NAMES[[kk]] [18:41:43.717] if (name != NAME && is.element(NAME, old_names)) [18:41:43.717] next [18:41:43.717] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.717] } [18:41:43.717] NAMES <- toupper(added) [18:41:43.717] for (kk in seq_along(NAMES)) { [18:41:43.717] name <- added[[kk]] [18:41:43.717] NAME <- NAMES[[kk]] [18:41:43.717] if (name != NAME && is.element(NAME, old_names)) [18:41:43.717] next [18:41:43.717] args[[name]] <- "" [18:41:43.717] } [18:41:43.717] NAMES <- toupper(removed) [18:41:43.717] for (kk in seq_along(NAMES)) { [18:41:43.717] name <- removed[[kk]] [18:41:43.717] NAME <- NAMES[[kk]] [18:41:43.717] if (name != NAME && is.element(NAME, old_names)) [18:41:43.717] next [18:41:43.717] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.717] } [18:41:43.717] if (length(args) > 0) [18:41:43.717] base::do.call(base::Sys.setenv, args = args) [18:41:43.717] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.717] } [18:41:43.717] { [18:41:43.717] if (base::length(...future.futureOptionsAdded) > [18:41:43.717] 0L) { [18:41:43.717] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.717] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.717] base::options(opts) [18:41:43.717] } [18:41:43.717] { [18:41:43.717] { [18:41:43.717] NULL [18:41:43.717] RNGkind("Mersenne-Twister") [18:41:43.717] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.717] inherits = FALSE) [18:41:43.717] } [18:41:43.717] options(future.plan = NULL) [18:41:43.717] if (is.na(NA_character_)) [18:41:43.717] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.717] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.717] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.717] .init = FALSE) [18:41:43.717] } [18:41:43.717] } [18:41:43.717] } [18:41:43.717] }) [18:41:43.717] if (TRUE) { [18:41:43.717] base::sink(type = "output", split = FALSE) [18:41:43.717] if (TRUE) { [18:41:43.717] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.717] } [18:41:43.717] else { [18:41:43.717] ...future.result["stdout"] <- base::list(NULL) [18:41:43.717] } [18:41:43.717] base::close(...future.stdout) [18:41:43.717] ...future.stdout <- NULL [18:41:43.717] } [18:41:43.717] ...future.result$conditions <- ...future.conditions [18:41:43.717] ...future.result$finished <- base::Sys.time() [18:41:43.717] ...future.result [18:41:43.717] } [18:41:43.724] assign_globals() ... [18:41:43.724] List of 5 [18:41:43.724] $ ...future.FUN :function (x, ...) [18:41:43.724] $ future.call.arguments : list() [18:41:43.724] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.724] $ ...future.elements_ii :List of 3 [18:41:43.724] ..$ : chr "a" [18:41:43.724] ..$ : chr "b" [18:41:43.724] ..$ : chr "c" [18:41:43.724] $ ...future.seeds_ii : NULL [18:41:43.724] $ ...future.globals.maxSize: NULL [18:41:43.724] - attr(*, "where")=List of 5 [18:41:43.724] ..$ ...future.FUN : [18:41:43.724] ..$ future.call.arguments : [18:41:43.724] ..$ ...future.elements_ii : [18:41:43.724] ..$ ...future.seeds_ii : [18:41:43.724] ..$ ...future.globals.maxSize: [18:41:43.724] - attr(*, "resolved")= logi FALSE [18:41:43.724] - attr(*, "total_size")= num 5028 [18:41:43.724] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.724] - attr(*, "already-done")= logi TRUE [18:41:43.735] - copied '...future.FUN' to environment [18:41:43.736] - copied 'future.call.arguments' to environment [18:41:43.736] - copied '...future.elements_ii' to environment [18:41:43.736] - copied '...future.seeds_ii' to environment [18:41:43.737] - copied '...future.globals.maxSize' to environment [18:41:43.737] assign_globals() ... done [18:41:43.738] plan(): Setting new future strategy stack: [18:41:43.738] List of future strategies: [18:41:43.738] 1. sequential: [18:41:43.738] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.738] - tweaked: FALSE [18:41:43.738] - call: NULL [18:41:43.739] plan(): nbrOfWorkers() = 1 [18:41:43.740] plan(): Setting new future strategy stack: [18:41:43.740] List of future strategies: [18:41:43.740] 1. sequential: [18:41:43.740] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.740] - tweaked: FALSE [18:41:43.740] - call: plan(strategy) [18:41:43.741] plan(): nbrOfWorkers() = 1 [18:41:43.741] SequentialFuture started (and completed) [18:41:43.741] - Launch lazy future ... done [18:41:43.742] run() for 'SequentialFuture' ... done [18:41:43.742] Created future: [18:41:43.742] SequentialFuture: [18:41:43.742] Label: 'future_sapply-1' [18:41:43.742] Expression: [18:41:43.742] { [18:41:43.742] do.call(function(...) { [18:41:43.742] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.742] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.742] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.742] on.exit(options(oopts), add = TRUE) [18:41:43.742] } [18:41:43.742] { [18:41:43.742] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.742] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.742] ...future.FUN(...future.X_jj, ...) [18:41:43.742] }) [18:41:43.742] } [18:41:43.742] }, args = future.call.arguments) [18:41:43.742] } [18:41:43.742] Lazy evaluation: FALSE [18:41:43.742] Asynchronous evaluation: FALSE [18:41:43.742] Local evaluation: TRUE [18:41:43.742] Environment: R_GlobalEnv [18:41:43.742] Capture standard output: TRUE [18:41:43.742] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.742] Globals: 5 objects totaling 511 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.742] Packages: [18:41:43.742] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.742] Resolved: TRUE [18:41:43.742] Value: 177 bytes of class 'list' [18:41:43.742] Early signaling: FALSE [18:41:43.742] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.742] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.743] Chunk #1 of 1 ... DONE [18:41:43.743] Launching 1 futures (chunks) ... DONE [18:41:43.743] Resolving 1 futures (chunks) ... [18:41:43.744] resolve() on list ... [18:41:43.744] recursive: 0 [18:41:43.744] length: 1 [18:41:43.744] [18:41:43.744] resolved() for 'SequentialFuture' ... [18:41:43.744] - state: 'finished' [18:41:43.745] - run: TRUE [18:41:43.745] - result: 'FutureResult' [18:41:43.745] resolved() for 'SequentialFuture' ... done [18:41:43.745] Future #1 [18:41:43.745] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.745] - nx: 1 [18:41:43.746] - relay: TRUE [18:41:43.746] - stdout: TRUE [18:41:43.746] - signal: TRUE [18:41:43.746] - resignal: FALSE [18:41:43.746] - force: TRUE [18:41:43.746] - relayed: [n=1] FALSE [18:41:43.747] - queued futures: [n=1] FALSE [18:41:43.747] - until=1 [18:41:43.747] - relaying element #1 [18:41:43.747] - relayed: [n=1] TRUE [18:41:43.747] - queued futures: [n=1] TRUE [18:41:43.747] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.748] length: 0 (resolved future 1) [18:41:43.748] Relaying remaining futures [18:41:43.748] signalConditionsASAP(NULL, pos=0) ... [18:41:43.748] - nx: 1 [18:41:43.748] - relay: TRUE [18:41:43.748] - stdout: TRUE [18:41:43.749] - signal: TRUE [18:41:43.749] - resignal: FALSE [18:41:43.749] - force: TRUE [18:41:43.749] - relayed: [n=1] TRUE [18:41:43.749] - queued futures: [n=1] TRUE - flush all [18:41:43.749] - relayed: [n=1] TRUE [18:41:43.750] - queued futures: [n=1] TRUE [18:41:43.750] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.750] resolve() on list ... DONE [18:41:43.750] - Number of value chunks collected: 1 [18:41:43.750] Resolving 1 futures (chunks) ... DONE [18:41:43.750] Reducing values from 1 chunks ... [18:41:43.751] - Number of values collected after concatenation: 3 [18:41:43.751] - Number of values expected: 3 [18:41:43.751] Reducing values from 1 chunks ... DONE [18:41:43.751] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: chr [1, 1] "a" ..$ b: chr [1, 1] "b" ..$ c: chr [1, 1] "c" $ y1:List of 3 ..$ a: chr [1, 1] "a" ..$ b: chr [1, 1] "b" ..$ c: chr [1, 1] "c" List of 2 $ y0:List of 3 ..$ a: chr [1, 1] "a" ..$ b: chr [1, 1] "b" ..$ c: chr [1, 1] "c" $ y2:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" [18:41:43.757] future_lapply() ... [18:41:43.758] Number of chunks: 1 [18:41:43.758] getGlobalsAndPackagesXApply() ... [18:41:43.758] - future.globals: TRUE [18:41:43.759] getGlobalsAndPackages() ... [18:41:43.759] Searching for globals... [18:41:43.760] - globals found: [1] 'FUN' [18:41:43.760] Searching for globals ... DONE [18:41:43.760] Resolving globals: FALSE [18:41:43.761] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.761] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.761] - globals: [1] 'FUN' [18:41:43.762] [18:41:43.762] getGlobalsAndPackages() ... DONE [18:41:43.762] - globals found/used: [n=1] 'FUN' [18:41:43.762] - needed namespaces: [n=0] [18:41:43.762] Finding globals ... DONE [18:41:43.762] - use_args: TRUE [18:41:43.763] - Getting '...' globals ... [18:41:43.763] resolve() on list ... [18:41:43.763] recursive: 0 [18:41:43.763] length: 1 [18:41:43.763] elements: '...' [18:41:43.764] length: 0 (resolved future 1) [18:41:43.764] resolve() on list ... DONE [18:41:43.764] - '...' content: [n=0] [18:41:43.764] List of 1 [18:41:43.764] $ ...: list() [18:41:43.764] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.764] - attr(*, "where")=List of 1 [18:41:43.764] ..$ ...: [18:41:43.764] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.764] - attr(*, "resolved")= logi TRUE [18:41:43.764] - attr(*, "total_size")= num NA [18:41:43.767] - Getting '...' globals ... DONE [18:41:43.767] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.767] List of 2 [18:41:43.767] $ ...future.FUN:function (x) [18:41:43.767] $ ... : list() [18:41:43.767] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.767] - attr(*, "where")=List of 2 [18:41:43.767] ..$ ...future.FUN: [18:41:43.767] ..$ ... : [18:41:43.767] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.767] - attr(*, "resolved")= logi FALSE [18:41:43.767] - attr(*, "total_size")= int 4788 [18:41:43.771] Packages to be attached in all futures: [n=0] [18:41:43.771] getGlobalsAndPackagesXApply() ... DONE [18:41:43.771] Number of futures (= number of chunks): 1 [18:41:43.771] Launching 1 futures (chunks) ... [18:41:43.772] Chunk #1 of 1 ... [18:41:43.772] - Finding globals in 'X' for chunk #1 ... [18:41:43.772] getGlobalsAndPackages() ... [18:41:43.772] Searching for globals... [18:41:43.773] [18:41:43.773] Searching for globals ... DONE [18:41:43.773] - globals: [0] [18:41:43.773] getGlobalsAndPackages() ... DONE [18:41:43.773] + additional globals found: [n=0] [18:41:43.774] + additional namespaces needed: [n=0] [18:41:43.774] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.774] - seeds: [18:41:43.774] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.774] getGlobalsAndPackages() ... [18:41:43.774] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.775] Resolving globals: FALSE [18:41:43.775] Tweak future expression to call with '...' arguments ... [18:41:43.775] { [18:41:43.775] do.call(function(...) { [18:41:43.775] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.775] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.775] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.775] on.exit(options(oopts), add = TRUE) [18:41:43.775] } [18:41:43.775] { [18:41:43.775] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.775] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.775] ...future.FUN(...future.X_jj, ...) [18:41:43.775] }) [18:41:43.775] } [18:41:43.775] }, args = future.call.arguments) [18:41:43.775] } [18:41:43.775] Tweak future expression to call with '...' arguments ... DONE [18:41:43.776] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.776] [18:41:43.776] getGlobalsAndPackages() ... DONE [18:41:43.777] run() for 'Future' ... [18:41:43.777] - state: 'created' [18:41:43.777] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.777] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.778] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.778] - Field: 'label' [18:41:43.778] - Field: 'local' [18:41:43.778] - Field: 'owner' [18:41:43.778] - Field: 'envir' [18:41:43.778] - Field: 'packages' [18:41:43.779] - Field: 'gc' [18:41:43.779] - Field: 'conditions' [18:41:43.779] - Field: 'expr' [18:41:43.779] - Field: 'uuid' [18:41:43.779] - Field: 'seed' [18:41:43.780] - Field: 'version' [18:41:43.780] - Field: 'result' [18:41:43.780] - Field: 'asynchronous' [18:41:43.780] - Field: 'calls' [18:41:43.780] - Field: 'globals' [18:41:43.780] - Field: 'stdout' [18:41:43.781] - Field: 'earlySignal' [18:41:43.781] - Field: 'lazy' [18:41:43.781] - Field: 'state' [18:41:43.781] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.781] - Launch lazy future ... [18:41:43.782] Packages needed by the future expression (n = 0): [18:41:43.782] Packages needed by future strategies (n = 0): [18:41:43.782] { [18:41:43.782] { [18:41:43.782] { [18:41:43.782] ...future.startTime <- base::Sys.time() [18:41:43.782] { [18:41:43.782] { [18:41:43.782] { [18:41:43.782] base::local({ [18:41:43.782] has_future <- base::requireNamespace("future", [18:41:43.782] quietly = TRUE) [18:41:43.782] if (has_future) { [18:41:43.782] ns <- base::getNamespace("future") [18:41:43.782] version <- ns[[".package"]][["version"]] [18:41:43.782] if (is.null(version)) [18:41:43.782] version <- utils::packageVersion("future") [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] version <- NULL [18:41:43.782] } [18:41:43.782] if (!has_future || version < "1.8.0") { [18:41:43.782] info <- base::c(r_version = base::gsub("R version ", [18:41:43.782] "", base::R.version$version.string), [18:41:43.782] platform = base::sprintf("%s (%s-bit)", [18:41:43.782] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.782] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.782] "release", "version")], collapse = " "), [18:41:43.782] hostname = base::Sys.info()[["nodename"]]) [18:41:43.782] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.782] info) [18:41:43.782] info <- base::paste(info, collapse = "; ") [18:41:43.782] if (!has_future) { [18:41:43.782] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.782] info) [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.782] info, version) [18:41:43.782] } [18:41:43.782] base::stop(msg) [18:41:43.782] } [18:41:43.782] }) [18:41:43.782] } [18:41:43.782] ...future.strategy.old <- future::plan("list") [18:41:43.782] options(future.plan = NULL) [18:41:43.782] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.782] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.782] } [18:41:43.782] ...future.workdir <- getwd() [18:41:43.782] } [18:41:43.782] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.782] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.782] } [18:41:43.782] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.782] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.782] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.782] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.782] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.782] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.782] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.782] base::names(...future.oldOptions)) [18:41:43.782] } [18:41:43.782] if (FALSE) { [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] if (TRUE) { [18:41:43.782] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.782] open = "w") [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.782] windows = "NUL", "/dev/null"), open = "w") [18:41:43.782] } [18:41:43.782] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.782] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.782] base::sink(type = "output", split = FALSE) [18:41:43.782] base::close(...future.stdout) [18:41:43.782] }, add = TRUE) [18:41:43.782] } [18:41:43.782] ...future.frame <- base::sys.nframe() [18:41:43.782] ...future.conditions <- base::list() [18:41:43.782] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.782] if (FALSE) { [18:41:43.782] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.782] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.782] } [18:41:43.782] ...future.result <- base::tryCatch({ [18:41:43.782] base::withCallingHandlers({ [18:41:43.782] ...future.value <- base::withVisible(base::local({ [18:41:43.782] do.call(function(...) { [18:41:43.782] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.782] if (!identical(...future.globals.maxSize.org, [18:41:43.782] ...future.globals.maxSize)) { [18:41:43.782] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.782] on.exit(options(oopts), add = TRUE) [18:41:43.782] } [18:41:43.782] { [18:41:43.782] lapply(seq_along(...future.elements_ii), [18:41:43.782] FUN = function(jj) { [18:41:43.782] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.782] ...future.FUN(...future.X_jj, ...) [18:41:43.782] }) [18:41:43.782] } [18:41:43.782] }, args = future.call.arguments) [18:41:43.782] })) [18:41:43.782] future::FutureResult(value = ...future.value$value, [18:41:43.782] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.782] ...future.rng), globalenv = if (FALSE) [18:41:43.782] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.782] ...future.globalenv.names)) [18:41:43.782] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.782] }, condition = base::local({ [18:41:43.782] c <- base::c [18:41:43.782] inherits <- base::inherits [18:41:43.782] invokeRestart <- base::invokeRestart [18:41:43.782] length <- base::length [18:41:43.782] list <- base::list [18:41:43.782] seq.int <- base::seq.int [18:41:43.782] signalCondition <- base::signalCondition [18:41:43.782] sys.calls <- base::sys.calls [18:41:43.782] `[[` <- base::`[[` [18:41:43.782] `+` <- base::`+` [18:41:43.782] `<<-` <- base::`<<-` [18:41:43.782] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.782] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.782] 3L)] [18:41:43.782] } [18:41:43.782] function(cond) { [18:41:43.782] is_error <- inherits(cond, "error") [18:41:43.782] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.782] NULL) [18:41:43.782] if (is_error) { [18:41:43.782] sessionInformation <- function() { [18:41:43.782] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.782] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.782] search = base::search(), system = base::Sys.info()) [18:41:43.782] } [18:41:43.782] ...future.conditions[[length(...future.conditions) + [18:41:43.782] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.782] cond$call), session = sessionInformation(), [18:41:43.782] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.782] signalCondition(cond) [18:41:43.782] } [18:41:43.782] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.782] "immediateCondition"))) { [18:41:43.782] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.782] ...future.conditions[[length(...future.conditions) + [18:41:43.782] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.782] if (TRUE && !signal) { [18:41:43.782] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.782] { [18:41:43.782] inherits <- base::inherits [18:41:43.782] invokeRestart <- base::invokeRestart [18:41:43.782] is.null <- base::is.null [18:41:43.782] muffled <- FALSE [18:41:43.782] if (inherits(cond, "message")) { [18:41:43.782] muffled <- grepl(pattern, "muffleMessage") [18:41:43.782] if (muffled) [18:41:43.782] invokeRestart("muffleMessage") [18:41:43.782] } [18:41:43.782] else if (inherits(cond, "warning")) { [18:41:43.782] muffled <- grepl(pattern, "muffleWarning") [18:41:43.782] if (muffled) [18:41:43.782] invokeRestart("muffleWarning") [18:41:43.782] } [18:41:43.782] else if (inherits(cond, "condition")) { [18:41:43.782] if (!is.null(pattern)) { [18:41:43.782] computeRestarts <- base::computeRestarts [18:41:43.782] grepl <- base::grepl [18:41:43.782] restarts <- computeRestarts(cond) [18:41:43.782] for (restart in restarts) { [18:41:43.782] name <- restart$name [18:41:43.782] if (is.null(name)) [18:41:43.782] next [18:41:43.782] if (!grepl(pattern, name)) [18:41:43.782] next [18:41:43.782] invokeRestart(restart) [18:41:43.782] muffled <- TRUE [18:41:43.782] break [18:41:43.782] } [18:41:43.782] } [18:41:43.782] } [18:41:43.782] invisible(muffled) [18:41:43.782] } [18:41:43.782] muffleCondition(cond, pattern = "^muffle") [18:41:43.782] } [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] if (TRUE) { [18:41:43.782] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.782] { [18:41:43.782] inherits <- base::inherits [18:41:43.782] invokeRestart <- base::invokeRestart [18:41:43.782] is.null <- base::is.null [18:41:43.782] muffled <- FALSE [18:41:43.782] if (inherits(cond, "message")) { [18:41:43.782] muffled <- grepl(pattern, "muffleMessage") [18:41:43.782] if (muffled) [18:41:43.782] invokeRestart("muffleMessage") [18:41:43.782] } [18:41:43.782] else if (inherits(cond, "warning")) { [18:41:43.782] muffled <- grepl(pattern, "muffleWarning") [18:41:43.782] if (muffled) [18:41:43.782] invokeRestart("muffleWarning") [18:41:43.782] } [18:41:43.782] else if (inherits(cond, "condition")) { [18:41:43.782] if (!is.null(pattern)) { [18:41:43.782] computeRestarts <- base::computeRestarts [18:41:43.782] grepl <- base::grepl [18:41:43.782] restarts <- computeRestarts(cond) [18:41:43.782] for (restart in restarts) { [18:41:43.782] name <- restart$name [18:41:43.782] if (is.null(name)) [18:41:43.782] next [18:41:43.782] if (!grepl(pattern, name)) [18:41:43.782] next [18:41:43.782] invokeRestart(restart) [18:41:43.782] muffled <- TRUE [18:41:43.782] break [18:41:43.782] } [18:41:43.782] } [18:41:43.782] } [18:41:43.782] invisible(muffled) [18:41:43.782] } [18:41:43.782] muffleCondition(cond, pattern = "^muffle") [18:41:43.782] } [18:41:43.782] } [18:41:43.782] } [18:41:43.782] })) [18:41:43.782] }, error = function(ex) { [18:41:43.782] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.782] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.782] ...future.rng), started = ...future.startTime, [18:41:43.782] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.782] version = "1.8"), class = "FutureResult") [18:41:43.782] }, finally = { [18:41:43.782] if (!identical(...future.workdir, getwd())) [18:41:43.782] setwd(...future.workdir) [18:41:43.782] { [18:41:43.782] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.782] ...future.oldOptions$nwarnings <- NULL [18:41:43.782] } [18:41:43.782] base::options(...future.oldOptions) [18:41:43.782] if (.Platform$OS.type == "windows") { [18:41:43.782] old_names <- names(...future.oldEnvVars) [18:41:43.782] envs <- base::Sys.getenv() [18:41:43.782] names <- names(envs) [18:41:43.782] common <- intersect(names, old_names) [18:41:43.782] added <- setdiff(names, old_names) [18:41:43.782] removed <- setdiff(old_names, names) [18:41:43.782] changed <- common[...future.oldEnvVars[common] != [18:41:43.782] envs[common]] [18:41:43.782] NAMES <- toupper(changed) [18:41:43.782] args <- list() [18:41:43.782] for (kk in seq_along(NAMES)) { [18:41:43.782] name <- changed[[kk]] [18:41:43.782] NAME <- NAMES[[kk]] [18:41:43.782] if (name != NAME && is.element(NAME, old_names)) [18:41:43.782] next [18:41:43.782] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.782] } [18:41:43.782] NAMES <- toupper(added) [18:41:43.782] for (kk in seq_along(NAMES)) { [18:41:43.782] name <- added[[kk]] [18:41:43.782] NAME <- NAMES[[kk]] [18:41:43.782] if (name != NAME && is.element(NAME, old_names)) [18:41:43.782] next [18:41:43.782] args[[name]] <- "" [18:41:43.782] } [18:41:43.782] NAMES <- toupper(removed) [18:41:43.782] for (kk in seq_along(NAMES)) { [18:41:43.782] name <- removed[[kk]] [18:41:43.782] NAME <- NAMES[[kk]] [18:41:43.782] if (name != NAME && is.element(NAME, old_names)) [18:41:43.782] next [18:41:43.782] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.782] } [18:41:43.782] if (length(args) > 0) [18:41:43.782] base::do.call(base::Sys.setenv, args = args) [18:41:43.782] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.782] } [18:41:43.782] { [18:41:43.782] if (base::length(...future.futureOptionsAdded) > [18:41:43.782] 0L) { [18:41:43.782] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.782] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.782] base::options(opts) [18:41:43.782] } [18:41:43.782] { [18:41:43.782] { [18:41:43.782] NULL [18:41:43.782] RNGkind("Mersenne-Twister") [18:41:43.782] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.782] inherits = FALSE) [18:41:43.782] } [18:41:43.782] options(future.plan = NULL) [18:41:43.782] if (is.na(NA_character_)) [18:41:43.782] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.782] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.782] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.782] .init = FALSE) [18:41:43.782] } [18:41:43.782] } [18:41:43.782] } [18:41:43.782] }) [18:41:43.782] if (TRUE) { [18:41:43.782] base::sink(type = "output", split = FALSE) [18:41:43.782] if (TRUE) { [18:41:43.782] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.782] } [18:41:43.782] else { [18:41:43.782] ...future.result["stdout"] <- base::list(NULL) [18:41:43.782] } [18:41:43.782] base::close(...future.stdout) [18:41:43.782] ...future.stdout <- NULL [18:41:43.782] } [18:41:43.782] ...future.result$conditions <- ...future.conditions [18:41:43.782] ...future.result$finished <- base::Sys.time() [18:41:43.782] ...future.result [18:41:43.782] } [18:41:43.786] assign_globals() ... [18:41:43.787] List of 5 [18:41:43.787] $ ...future.FUN :function (x) [18:41:43.787] $ future.call.arguments : list() [18:41:43.787] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.787] $ ...future.elements_ii :List of 3 [18:41:43.787] ..$ : chr "a" [18:41:43.787] ..$ : chr "b" [18:41:43.787] ..$ : chr "c" [18:41:43.787] $ ...future.seeds_ii : NULL [18:41:43.787] $ ...future.globals.maxSize: NULL [18:41:43.787] - attr(*, "where")=List of 5 [18:41:43.787] ..$ ...future.FUN : [18:41:43.787] ..$ future.call.arguments : [18:41:43.787] ..$ ...future.elements_ii : [18:41:43.787] ..$ ...future.seeds_ii : [18:41:43.787] ..$ ...future.globals.maxSize: [18:41:43.787] - attr(*, "resolved")= logi FALSE [18:41:43.787] - attr(*, "total_size")= num 4788 [18:41:43.787] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.787] - attr(*, "already-done")= logi TRUE [18:41:43.793] - copied '...future.FUN' to environment [18:41:43.793] - copied 'future.call.arguments' to environment [18:41:43.793] - copied '...future.elements_ii' to environment [18:41:43.793] - copied '...future.seeds_ii' to environment [18:41:43.793] - copied '...future.globals.maxSize' to environment [18:41:43.794] assign_globals() ... done [18:41:43.794] plan(): Setting new future strategy stack: [18:41:43.794] List of future strategies: [18:41:43.794] 1. sequential: [18:41:43.794] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.794] - tweaked: FALSE [18:41:43.794] - call: NULL [18:41:43.795] plan(): nbrOfWorkers() = 1 [18:41:43.796] plan(): Setting new future strategy stack: [18:41:43.796] List of future strategies: [18:41:43.796] 1. sequential: [18:41:43.796] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.796] - tweaked: FALSE [18:41:43.796] - call: plan(strategy) [18:41:43.797] plan(): nbrOfWorkers() = 1 [18:41:43.797] SequentialFuture started (and completed) [18:41:43.797] - Launch lazy future ... done [18:41:43.798] run() for 'SequentialFuture' ... done [18:41:43.798] Created future: [18:41:43.798] SequentialFuture: [18:41:43.798] Label: 'future_sapply-1' [18:41:43.798] Expression: [18:41:43.798] { [18:41:43.798] do.call(function(...) { [18:41:43.798] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.798] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.798] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.798] on.exit(options(oopts), add = TRUE) [18:41:43.798] } [18:41:43.798] { [18:41:43.798] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.798] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.798] ...future.FUN(...future.X_jj, ...) [18:41:43.798] }) [18:41:43.798] } [18:41:43.798] }, args = future.call.arguments) [18:41:43.798] } [18:41:43.798] Lazy evaluation: FALSE [18:41:43.798] Asynchronous evaluation: FALSE [18:41:43.798] Local evaluation: TRUE [18:41:43.798] Environment: R_GlobalEnv [18:41:43.798] Capture standard output: TRUE [18:41:43.798] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.798] Globals: 5 objects totaling 418 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.798] Packages: [18:41:43.798] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.798] Resolved: TRUE [18:41:43.798] Value: 82 bytes of class 'list' [18:41:43.798] Early signaling: FALSE [18:41:43.798] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.798] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.799] Chunk #1 of 1 ... DONE [18:41:43.799] Launching 1 futures (chunks) ... DONE [18:41:43.799] Resolving 1 futures (chunks) ... [18:41:43.800] resolve() on list ... [18:41:43.800] recursive: 0 [18:41:43.800] length: 1 [18:41:43.800] [18:41:43.800] resolved() for 'SequentialFuture' ... [18:41:43.800] - state: 'finished' [18:41:43.801] - run: TRUE [18:41:43.801] - result: 'FutureResult' [18:41:43.801] resolved() for 'SequentialFuture' ... done [18:41:43.801] Future #1 [18:41:43.801] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.802] - nx: 1 [18:41:43.802] - relay: TRUE [18:41:43.802] - stdout: TRUE [18:41:43.802] - signal: TRUE [18:41:43.802] - resignal: FALSE [18:41:43.802] - force: TRUE [18:41:43.803] - relayed: [n=1] FALSE [18:41:43.803] - queued futures: [n=1] FALSE [18:41:43.803] - until=1 [18:41:43.803] - relaying element #1 [18:41:43.803] - relayed: [n=1] TRUE [18:41:43.803] - queued futures: [n=1] TRUE [18:41:43.804] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.804] length: 0 (resolved future 1) [18:41:43.804] Relaying remaining futures [18:41:43.804] signalConditionsASAP(NULL, pos=0) ... [18:41:43.804] - nx: 1 [18:41:43.804] - relay: TRUE [18:41:43.805] - stdout: TRUE [18:41:43.805] - signal: TRUE [18:41:43.805] - resignal: FALSE [18:41:43.805] - force: TRUE [18:41:43.805] - relayed: [n=1] TRUE [18:41:43.805] - queued futures: [n=1] TRUE - flush all [18:41:43.806] - relayed: [n=1] TRUE [18:41:43.806] - queued futures: [n=1] TRUE [18:41:43.806] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.806] resolve() on list ... DONE [18:41:43.806] - Number of value chunks collected: 1 [18:41:43.806] Resolving 1 futures (chunks) ... DONE [18:41:43.807] Reducing values from 1 chunks ... [18:41:43.807] - Number of values collected after concatenation: 3 [18:41:43.807] - Number of values expected: 3 [18:41:43.807] Reducing values from 1 chunks ... DONE [18:41:43.807] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:43.809] future_lapply() ... [18:41:43.812] Number of chunks: 1 [18:41:43.812] getGlobalsAndPackagesXApply() ... [18:41:43.812] - future.globals: TRUE [18:41:43.812] getGlobalsAndPackages() ... [18:41:43.813] Searching for globals... [18:41:43.814] - globals found: [2] 'FUN', 'UseMethod' [18:41:43.814] Searching for globals ... DONE [18:41:43.814] Resolving globals: FALSE [18:41:43.815] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:43.815] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:43.816] - globals: [1] 'FUN' [18:41:43.816] [18:41:43.816] getGlobalsAndPackages() ... DONE [18:41:43.816] - globals found/used: [n=1] 'FUN' [18:41:43.816] - needed namespaces: [n=0] [18:41:43.816] Finding globals ... DONE [18:41:43.817] - use_args: TRUE [18:41:43.817] - Getting '...' globals ... [18:41:43.817] resolve() on list ... [18:41:43.817] recursive: 0 [18:41:43.818] length: 1 [18:41:43.818] elements: '...' [18:41:43.818] length: 0 (resolved future 1) [18:41:43.818] resolve() on list ... DONE [18:41:43.818] - '...' content: [n=0] [18:41:43.818] List of 1 [18:41:43.818] $ ...: list() [18:41:43.818] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.818] - attr(*, "where")=List of 1 [18:41:43.818] ..$ ...: [18:41:43.818] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.818] - attr(*, "resolved")= logi TRUE [18:41:43.818] - attr(*, "total_size")= num NA [18:41:43.821] - Getting '...' globals ... DONE [18:41:43.821] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.822] List of 2 [18:41:43.822] $ ...future.FUN:function (x, ...) [18:41:43.822] $ ... : list() [18:41:43.822] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.822] - attr(*, "where")=List of 2 [18:41:43.822] ..$ ...future.FUN: [18:41:43.822] ..$ ... : [18:41:43.822] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.822] - attr(*, "resolved")= logi FALSE [18:41:43.822] - attr(*, "total_size")= int 5028 [18:41:43.825] Packages to be attached in all futures: [n=0] [18:41:43.825] getGlobalsAndPackagesXApply() ... DONE [18:41:43.825] Number of futures (= number of chunks): 1 [18:41:43.826] Launching 1 futures (chunks) ... [18:41:43.826] Chunk #1 of 1 ... [18:41:43.826] - Finding globals in 'X' for chunk #1 ... [18:41:43.826] getGlobalsAndPackages() ... [18:41:43.826] Searching for globals... [18:41:43.827] [18:41:43.827] Searching for globals ... DONE [18:41:43.827] - globals: [0] [18:41:43.827] getGlobalsAndPackages() ... DONE [18:41:43.827] + additional globals found: [n=0] [18:41:43.827] + additional namespaces needed: [n=0] [18:41:43.828] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.828] - seeds: [18:41:43.828] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.828] getGlobalsAndPackages() ... [18:41:43.828] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.828] Resolving globals: FALSE [18:41:43.829] Tweak future expression to call with '...' arguments ... [18:41:43.829] { [18:41:43.829] do.call(function(...) { [18:41:43.829] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.829] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.829] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.829] on.exit(options(oopts), add = TRUE) [18:41:43.829] } [18:41:43.829] { [18:41:43.829] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.829] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.829] ...future.FUN(...future.X_jj, ...) [18:41:43.829] }) [18:41:43.829] } [18:41:43.829] }, args = future.call.arguments) [18:41:43.829] } [18:41:43.829] Tweak future expression to call with '...' arguments ... DONE [18:41:43.830] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.830] [18:41:43.830] getGlobalsAndPackages() ... DONE [18:41:43.830] run() for 'Future' ... [18:41:43.831] - state: 'created' [18:41:43.831] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.831] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.831] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.832] - Field: 'label' [18:41:43.832] - Field: 'local' [18:41:43.832] - Field: 'owner' [18:41:43.832] - Field: 'envir' [18:41:43.832] - Field: 'packages' [18:41:43.833] - Field: 'gc' [18:41:43.833] - Field: 'conditions' [18:41:43.833] - Field: 'expr' [18:41:43.833] - Field: 'uuid' [18:41:43.833] - Field: 'seed' [18:41:43.833] - Field: 'version' [18:41:43.834] - Field: 'result' [18:41:43.834] - Field: 'asynchronous' [18:41:43.834] - Field: 'calls' [18:41:43.834] - Field: 'globals' [18:41:43.834] - Field: 'stdout' [18:41:43.834] - Field: 'earlySignal' [18:41:43.835] - Field: 'lazy' [18:41:43.835] - Field: 'state' [18:41:43.835] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.835] - Launch lazy future ... [18:41:43.835] Packages needed by the future expression (n = 0): [18:41:43.836] Packages needed by future strategies (n = 0): [18:41:43.836] { [18:41:43.836] { [18:41:43.836] { [18:41:43.836] ...future.startTime <- base::Sys.time() [18:41:43.836] { [18:41:43.836] { [18:41:43.836] { [18:41:43.836] base::local({ [18:41:43.836] has_future <- base::requireNamespace("future", [18:41:43.836] quietly = TRUE) [18:41:43.836] if (has_future) { [18:41:43.836] ns <- base::getNamespace("future") [18:41:43.836] version <- ns[[".package"]][["version"]] [18:41:43.836] if (is.null(version)) [18:41:43.836] version <- utils::packageVersion("future") [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] version <- NULL [18:41:43.836] } [18:41:43.836] if (!has_future || version < "1.8.0") { [18:41:43.836] info <- base::c(r_version = base::gsub("R version ", [18:41:43.836] "", base::R.version$version.string), [18:41:43.836] platform = base::sprintf("%s (%s-bit)", [18:41:43.836] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.836] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.836] "release", "version")], collapse = " "), [18:41:43.836] hostname = base::Sys.info()[["nodename"]]) [18:41:43.836] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.836] info) [18:41:43.836] info <- base::paste(info, collapse = "; ") [18:41:43.836] if (!has_future) { [18:41:43.836] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.836] info) [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.836] info, version) [18:41:43.836] } [18:41:43.836] base::stop(msg) [18:41:43.836] } [18:41:43.836] }) [18:41:43.836] } [18:41:43.836] ...future.strategy.old <- future::plan("list") [18:41:43.836] options(future.plan = NULL) [18:41:43.836] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.836] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.836] } [18:41:43.836] ...future.workdir <- getwd() [18:41:43.836] } [18:41:43.836] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.836] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.836] } [18:41:43.836] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.836] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.836] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.836] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.836] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.836] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.836] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.836] base::names(...future.oldOptions)) [18:41:43.836] } [18:41:43.836] if (FALSE) { [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] if (TRUE) { [18:41:43.836] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.836] open = "w") [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.836] windows = "NUL", "/dev/null"), open = "w") [18:41:43.836] } [18:41:43.836] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.836] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.836] base::sink(type = "output", split = FALSE) [18:41:43.836] base::close(...future.stdout) [18:41:43.836] }, add = TRUE) [18:41:43.836] } [18:41:43.836] ...future.frame <- base::sys.nframe() [18:41:43.836] ...future.conditions <- base::list() [18:41:43.836] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.836] if (FALSE) { [18:41:43.836] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.836] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.836] } [18:41:43.836] ...future.result <- base::tryCatch({ [18:41:43.836] base::withCallingHandlers({ [18:41:43.836] ...future.value <- base::withVisible(base::local({ [18:41:43.836] do.call(function(...) { [18:41:43.836] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.836] if (!identical(...future.globals.maxSize.org, [18:41:43.836] ...future.globals.maxSize)) { [18:41:43.836] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.836] on.exit(options(oopts), add = TRUE) [18:41:43.836] } [18:41:43.836] { [18:41:43.836] lapply(seq_along(...future.elements_ii), [18:41:43.836] FUN = function(jj) { [18:41:43.836] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.836] ...future.FUN(...future.X_jj, ...) [18:41:43.836] }) [18:41:43.836] } [18:41:43.836] }, args = future.call.arguments) [18:41:43.836] })) [18:41:43.836] future::FutureResult(value = ...future.value$value, [18:41:43.836] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.836] ...future.rng), globalenv = if (FALSE) [18:41:43.836] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.836] ...future.globalenv.names)) [18:41:43.836] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.836] }, condition = base::local({ [18:41:43.836] c <- base::c [18:41:43.836] inherits <- base::inherits [18:41:43.836] invokeRestart <- base::invokeRestart [18:41:43.836] length <- base::length [18:41:43.836] list <- base::list [18:41:43.836] seq.int <- base::seq.int [18:41:43.836] signalCondition <- base::signalCondition [18:41:43.836] sys.calls <- base::sys.calls [18:41:43.836] `[[` <- base::`[[` [18:41:43.836] `+` <- base::`+` [18:41:43.836] `<<-` <- base::`<<-` [18:41:43.836] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.836] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.836] 3L)] [18:41:43.836] } [18:41:43.836] function(cond) { [18:41:43.836] is_error <- inherits(cond, "error") [18:41:43.836] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.836] NULL) [18:41:43.836] if (is_error) { [18:41:43.836] sessionInformation <- function() { [18:41:43.836] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.836] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.836] search = base::search(), system = base::Sys.info()) [18:41:43.836] } [18:41:43.836] ...future.conditions[[length(...future.conditions) + [18:41:43.836] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.836] cond$call), session = sessionInformation(), [18:41:43.836] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.836] signalCondition(cond) [18:41:43.836] } [18:41:43.836] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.836] "immediateCondition"))) { [18:41:43.836] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.836] ...future.conditions[[length(...future.conditions) + [18:41:43.836] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.836] if (TRUE && !signal) { [18:41:43.836] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.836] { [18:41:43.836] inherits <- base::inherits [18:41:43.836] invokeRestart <- base::invokeRestart [18:41:43.836] is.null <- base::is.null [18:41:43.836] muffled <- FALSE [18:41:43.836] if (inherits(cond, "message")) { [18:41:43.836] muffled <- grepl(pattern, "muffleMessage") [18:41:43.836] if (muffled) [18:41:43.836] invokeRestart("muffleMessage") [18:41:43.836] } [18:41:43.836] else if (inherits(cond, "warning")) { [18:41:43.836] muffled <- grepl(pattern, "muffleWarning") [18:41:43.836] if (muffled) [18:41:43.836] invokeRestart("muffleWarning") [18:41:43.836] } [18:41:43.836] else if (inherits(cond, "condition")) { [18:41:43.836] if (!is.null(pattern)) { [18:41:43.836] computeRestarts <- base::computeRestarts [18:41:43.836] grepl <- base::grepl [18:41:43.836] restarts <- computeRestarts(cond) [18:41:43.836] for (restart in restarts) { [18:41:43.836] name <- restart$name [18:41:43.836] if (is.null(name)) [18:41:43.836] next [18:41:43.836] if (!grepl(pattern, name)) [18:41:43.836] next [18:41:43.836] invokeRestart(restart) [18:41:43.836] muffled <- TRUE [18:41:43.836] break [18:41:43.836] } [18:41:43.836] } [18:41:43.836] } [18:41:43.836] invisible(muffled) [18:41:43.836] } [18:41:43.836] muffleCondition(cond, pattern = "^muffle") [18:41:43.836] } [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] if (TRUE) { [18:41:43.836] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.836] { [18:41:43.836] inherits <- base::inherits [18:41:43.836] invokeRestart <- base::invokeRestart [18:41:43.836] is.null <- base::is.null [18:41:43.836] muffled <- FALSE [18:41:43.836] if (inherits(cond, "message")) { [18:41:43.836] muffled <- grepl(pattern, "muffleMessage") [18:41:43.836] if (muffled) [18:41:43.836] invokeRestart("muffleMessage") [18:41:43.836] } [18:41:43.836] else if (inherits(cond, "warning")) { [18:41:43.836] muffled <- grepl(pattern, "muffleWarning") [18:41:43.836] if (muffled) [18:41:43.836] invokeRestart("muffleWarning") [18:41:43.836] } [18:41:43.836] else if (inherits(cond, "condition")) { [18:41:43.836] if (!is.null(pattern)) { [18:41:43.836] computeRestarts <- base::computeRestarts [18:41:43.836] grepl <- base::grepl [18:41:43.836] restarts <- computeRestarts(cond) [18:41:43.836] for (restart in restarts) { [18:41:43.836] name <- restart$name [18:41:43.836] if (is.null(name)) [18:41:43.836] next [18:41:43.836] if (!grepl(pattern, name)) [18:41:43.836] next [18:41:43.836] invokeRestart(restart) [18:41:43.836] muffled <- TRUE [18:41:43.836] break [18:41:43.836] } [18:41:43.836] } [18:41:43.836] } [18:41:43.836] invisible(muffled) [18:41:43.836] } [18:41:43.836] muffleCondition(cond, pattern = "^muffle") [18:41:43.836] } [18:41:43.836] } [18:41:43.836] } [18:41:43.836] })) [18:41:43.836] }, error = function(ex) { [18:41:43.836] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.836] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.836] ...future.rng), started = ...future.startTime, [18:41:43.836] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.836] version = "1.8"), class = "FutureResult") [18:41:43.836] }, finally = { [18:41:43.836] if (!identical(...future.workdir, getwd())) [18:41:43.836] setwd(...future.workdir) [18:41:43.836] { [18:41:43.836] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.836] ...future.oldOptions$nwarnings <- NULL [18:41:43.836] } [18:41:43.836] base::options(...future.oldOptions) [18:41:43.836] if (.Platform$OS.type == "windows") { [18:41:43.836] old_names <- names(...future.oldEnvVars) [18:41:43.836] envs <- base::Sys.getenv() [18:41:43.836] names <- names(envs) [18:41:43.836] common <- intersect(names, old_names) [18:41:43.836] added <- setdiff(names, old_names) [18:41:43.836] removed <- setdiff(old_names, names) [18:41:43.836] changed <- common[...future.oldEnvVars[common] != [18:41:43.836] envs[common]] [18:41:43.836] NAMES <- toupper(changed) [18:41:43.836] args <- list() [18:41:43.836] for (kk in seq_along(NAMES)) { [18:41:43.836] name <- changed[[kk]] [18:41:43.836] NAME <- NAMES[[kk]] [18:41:43.836] if (name != NAME && is.element(NAME, old_names)) [18:41:43.836] next [18:41:43.836] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.836] } [18:41:43.836] NAMES <- toupper(added) [18:41:43.836] for (kk in seq_along(NAMES)) { [18:41:43.836] name <- added[[kk]] [18:41:43.836] NAME <- NAMES[[kk]] [18:41:43.836] if (name != NAME && is.element(NAME, old_names)) [18:41:43.836] next [18:41:43.836] args[[name]] <- "" [18:41:43.836] } [18:41:43.836] NAMES <- toupper(removed) [18:41:43.836] for (kk in seq_along(NAMES)) { [18:41:43.836] name <- removed[[kk]] [18:41:43.836] NAME <- NAMES[[kk]] [18:41:43.836] if (name != NAME && is.element(NAME, old_names)) [18:41:43.836] next [18:41:43.836] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.836] } [18:41:43.836] if (length(args) > 0) [18:41:43.836] base::do.call(base::Sys.setenv, args = args) [18:41:43.836] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.836] } [18:41:43.836] { [18:41:43.836] if (base::length(...future.futureOptionsAdded) > [18:41:43.836] 0L) { [18:41:43.836] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.836] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.836] base::options(opts) [18:41:43.836] } [18:41:43.836] { [18:41:43.836] { [18:41:43.836] NULL [18:41:43.836] RNGkind("Mersenne-Twister") [18:41:43.836] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.836] inherits = FALSE) [18:41:43.836] } [18:41:43.836] options(future.plan = NULL) [18:41:43.836] if (is.na(NA_character_)) [18:41:43.836] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.836] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.836] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.836] .init = FALSE) [18:41:43.836] } [18:41:43.836] } [18:41:43.836] } [18:41:43.836] }) [18:41:43.836] if (TRUE) { [18:41:43.836] base::sink(type = "output", split = FALSE) [18:41:43.836] if (TRUE) { [18:41:43.836] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.836] } [18:41:43.836] else { [18:41:43.836] ...future.result["stdout"] <- base::list(NULL) [18:41:43.836] } [18:41:43.836] base::close(...future.stdout) [18:41:43.836] ...future.stdout <- NULL [18:41:43.836] } [18:41:43.836] ...future.result$conditions <- ...future.conditions [18:41:43.836] ...future.result$finished <- base::Sys.time() [18:41:43.836] ...future.result [18:41:43.836] } [18:41:43.840] assign_globals() ... [18:41:43.840] List of 5 [18:41:43.840] $ ...future.FUN :function (x, ...) [18:41:43.840] $ future.call.arguments : list() [18:41:43.840] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.840] $ ...future.elements_ii :List of 3 [18:41:43.840] ..$ : chr "a" [18:41:43.840] ..$ : chr "b" [18:41:43.840] ..$ : chr "c" [18:41:43.840] $ ...future.seeds_ii : NULL [18:41:43.840] $ ...future.globals.maxSize: NULL [18:41:43.840] - attr(*, "where")=List of 5 [18:41:43.840] ..$ ...future.FUN : [18:41:43.840] ..$ future.call.arguments : [18:41:43.840] ..$ ...future.elements_ii : [18:41:43.840] ..$ ...future.seeds_ii : [18:41:43.840] ..$ ...future.globals.maxSize: [18:41:43.840] - attr(*, "resolved")= logi FALSE [18:41:43.840] - attr(*, "total_size")= num 5028 [18:41:43.840] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.840] - attr(*, "already-done")= logi TRUE [18:41:43.846] - copied '...future.FUN' to environment [18:41:43.847] - copied 'future.call.arguments' to environment [18:41:43.847] - copied '...future.elements_ii' to environment [18:41:43.847] - copied '...future.seeds_ii' to environment [18:41:43.847] - copied '...future.globals.maxSize' to environment [18:41:43.847] assign_globals() ... done [18:41:43.848] plan(): Setting new future strategy stack: [18:41:43.848] List of future strategies: [18:41:43.848] 1. sequential: [18:41:43.848] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.848] - tweaked: FALSE [18:41:43.848] - call: NULL [18:41:43.848] plan(): nbrOfWorkers() = 1 [18:41:43.850] plan(): Setting new future strategy stack: [18:41:43.850] List of future strategies: [18:41:43.850] 1. sequential: [18:41:43.850] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.850] - tweaked: FALSE [18:41:43.850] - call: plan(strategy) [18:41:43.851] plan(): nbrOfWorkers() = 1 [18:41:43.851] SequentialFuture started (and completed) [18:41:43.851] - Launch lazy future ... done [18:41:43.851] run() for 'SequentialFuture' ... done [18:41:43.851] Created future: [18:41:43.852] SequentialFuture: [18:41:43.852] Label: 'future_sapply-1' [18:41:43.852] Expression: [18:41:43.852] { [18:41:43.852] do.call(function(...) { [18:41:43.852] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.852] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.852] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.852] on.exit(options(oopts), add = TRUE) [18:41:43.852] } [18:41:43.852] { [18:41:43.852] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.852] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.852] ...future.FUN(...future.X_jj, ...) [18:41:43.852] }) [18:41:43.852] } [18:41:43.852] }, args = future.call.arguments) [18:41:43.852] } [18:41:43.852] Lazy evaluation: FALSE [18:41:43.852] Asynchronous evaluation: FALSE [18:41:43.852] Local evaluation: TRUE [18:41:43.852] Environment: R_GlobalEnv [18:41:43.852] Capture standard output: TRUE [18:41:43.852] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.852] Globals: 5 objects totaling 511 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.852] Packages: [18:41:43.852] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.852] Resolved: TRUE [18:41:43.852] Value: 177 bytes of class 'list' [18:41:43.852] Early signaling: FALSE [18:41:43.852] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.852] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.853] Chunk #1 of 1 ... DONE [18:41:43.853] Launching 1 futures (chunks) ... DONE [18:41:43.853] Resolving 1 futures (chunks) ... [18:41:43.853] resolve() on list ... [18:41:43.853] recursive: 0 [18:41:43.854] length: 1 [18:41:43.854] [18:41:43.854] resolved() for 'SequentialFuture' ... [18:41:43.854] - state: 'finished' [18:41:43.854] - run: TRUE [18:41:43.854] - result: 'FutureResult' [18:41:43.855] resolved() for 'SequentialFuture' ... done [18:41:43.855] Future #1 [18:41:43.855] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.855] - nx: 1 [18:41:43.855] - relay: TRUE [18:41:43.855] - stdout: TRUE [18:41:43.856] - signal: TRUE [18:41:43.856] - resignal: FALSE [18:41:43.856] - force: TRUE [18:41:43.856] - relayed: [n=1] FALSE [18:41:43.856] - queued futures: [n=1] FALSE [18:41:43.856] - until=1 [18:41:43.857] - relaying element #1 [18:41:43.857] - relayed: [n=1] TRUE [18:41:43.857] - queued futures: [n=1] TRUE [18:41:43.857] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.857] length: 0 (resolved future 1) [18:41:43.858] Relaying remaining futures [18:41:43.858] signalConditionsASAP(NULL, pos=0) ... [18:41:43.858] - nx: 1 [18:41:43.858] - relay: TRUE [18:41:43.858] - stdout: TRUE [18:41:43.858] - signal: TRUE [18:41:43.858] - resignal: FALSE [18:41:43.859] - force: TRUE [18:41:43.859] - relayed: [n=1] TRUE [18:41:43.859] - queued futures: [n=1] TRUE - flush all [18:41:43.859] - relayed: [n=1] TRUE [18:41:43.859] - queued futures: [n=1] TRUE [18:41:43.859] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.860] resolve() on list ... DONE [18:41:43.860] - Number of value chunks collected: 1 [18:41:43.860] Resolving 1 futures (chunks) ... DONE [18:41:43.860] Reducing values from 1 chunks ... [18:41:43.860] - Number of values collected after concatenation: 3 [18:41:43.860] - Number of values expected: 3 [18:41:43.861] Reducing values from 1 chunks ... DONE [18:41:43.861] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:43.863] future_lapply() ... [18:41:43.863] Number of chunks: 1 [18:41:43.863] getGlobalsAndPackagesXApply() ... [18:41:43.864] - future.globals: TRUE [18:41:43.864] getGlobalsAndPackages() ... [18:41:43.864] Searching for globals... [18:41:43.865] - globals found: [1] 'FUN' [18:41:43.865] Searching for globals ... DONE [18:41:43.865] Resolving globals: FALSE [18:41:43.866] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.866] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.866] - globals: [1] 'FUN' [18:41:43.867] [18:41:43.867] getGlobalsAndPackages() ... DONE [18:41:43.867] - globals found/used: [n=1] 'FUN' [18:41:43.867] - needed namespaces: [n=0] [18:41:43.867] Finding globals ... DONE [18:41:43.867] - use_args: TRUE [18:41:43.868] - Getting '...' globals ... [18:41:43.868] resolve() on list ... [18:41:43.868] recursive: 0 [18:41:43.868] length: 1 [18:41:43.869] elements: '...' [18:41:43.869] length: 0 (resolved future 1) [18:41:43.869] resolve() on list ... DONE [18:41:43.869] - '...' content: [n=0] [18:41:43.869] List of 1 [18:41:43.869] $ ...: list() [18:41:43.869] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.869] - attr(*, "where")=List of 1 [18:41:43.869] ..$ ...: [18:41:43.869] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.869] - attr(*, "resolved")= logi TRUE [18:41:43.869] - attr(*, "total_size")= num NA [18:41:43.872] - Getting '...' globals ... DONE [18:41:43.872] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.873] List of 2 [18:41:43.873] $ ...future.FUN:function (x) [18:41:43.873] $ ... : list() [18:41:43.873] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.873] - attr(*, "where")=List of 2 [18:41:43.873] ..$ ...future.FUN: [18:41:43.873] ..$ ... : [18:41:43.873] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.873] - attr(*, "resolved")= logi FALSE [18:41:43.873] - attr(*, "total_size")= int 4788 [18:41:43.876] Packages to be attached in all futures: [n=0] [18:41:43.876] getGlobalsAndPackagesXApply() ... DONE [18:41:43.876] Number of futures (= number of chunks): 1 [18:41:43.877] Launching 1 futures (chunks) ... [18:41:43.877] Chunk #1 of 1 ... [18:41:43.877] - Finding globals in 'X' for chunk #1 ... [18:41:43.877] getGlobalsAndPackages() ... [18:41:43.877] Searching for globals... [18:41:43.878] [18:41:43.878] Searching for globals ... DONE [18:41:43.878] - globals: [0] [18:41:43.878] getGlobalsAndPackages() ... DONE [18:41:43.878] + additional globals found: [n=0] [18:41:43.878] + additional namespaces needed: [n=0] [18:41:43.879] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.879] - seeds: [18:41:43.879] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.879] getGlobalsAndPackages() ... [18:41:43.879] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.879] Resolving globals: FALSE [18:41:43.880] Tweak future expression to call with '...' arguments ... [18:41:43.880] { [18:41:43.880] do.call(function(...) { [18:41:43.880] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.880] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.880] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.880] on.exit(options(oopts), add = TRUE) [18:41:43.880] } [18:41:43.880] { [18:41:43.880] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.880] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.880] ...future.FUN(...future.X_jj, ...) [18:41:43.880] }) [18:41:43.880] } [18:41:43.880] }, args = future.call.arguments) [18:41:43.880] } [18:41:43.880] Tweak future expression to call with '...' arguments ... DONE [18:41:43.881] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.881] [18:41:43.881] getGlobalsAndPackages() ... DONE [18:41:43.881] run() for 'Future' ... [18:41:43.882] - state: 'created' [18:41:43.882] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.882] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.882] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.883] - Field: 'label' [18:41:43.883] - Field: 'local' [18:41:43.883] - Field: 'owner' [18:41:43.883] - Field: 'envir' [18:41:43.883] - Field: 'packages' [18:41:43.883] - Field: 'gc' [18:41:43.884] - Field: 'conditions' [18:41:43.884] - Field: 'expr' [18:41:43.884] - Field: 'uuid' [18:41:43.884] - Field: 'seed' [18:41:43.884] - Field: 'version' [18:41:43.885] - Field: 'result' [18:41:43.885] - Field: 'asynchronous' [18:41:43.885] - Field: 'calls' [18:41:43.885] - Field: 'globals' [18:41:43.885] - Field: 'stdout' [18:41:43.885] - Field: 'earlySignal' [18:41:43.886] - Field: 'lazy' [18:41:43.886] - Field: 'state' [18:41:43.886] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.886] - Launch lazy future ... [18:41:43.886] Packages needed by the future expression (n = 0): [18:41:43.887] Packages needed by future strategies (n = 0): [18:41:43.887] { [18:41:43.887] { [18:41:43.887] { [18:41:43.887] ...future.startTime <- base::Sys.time() [18:41:43.887] { [18:41:43.887] { [18:41:43.887] { [18:41:43.887] base::local({ [18:41:43.887] has_future <- base::requireNamespace("future", [18:41:43.887] quietly = TRUE) [18:41:43.887] if (has_future) { [18:41:43.887] ns <- base::getNamespace("future") [18:41:43.887] version <- ns[[".package"]][["version"]] [18:41:43.887] if (is.null(version)) [18:41:43.887] version <- utils::packageVersion("future") [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] version <- NULL [18:41:43.887] } [18:41:43.887] if (!has_future || version < "1.8.0") { [18:41:43.887] info <- base::c(r_version = base::gsub("R version ", [18:41:43.887] "", base::R.version$version.string), [18:41:43.887] platform = base::sprintf("%s (%s-bit)", [18:41:43.887] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.887] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.887] "release", "version")], collapse = " "), [18:41:43.887] hostname = base::Sys.info()[["nodename"]]) [18:41:43.887] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.887] info) [18:41:43.887] info <- base::paste(info, collapse = "; ") [18:41:43.887] if (!has_future) { [18:41:43.887] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.887] info) [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.887] info, version) [18:41:43.887] } [18:41:43.887] base::stop(msg) [18:41:43.887] } [18:41:43.887] }) [18:41:43.887] } [18:41:43.887] ...future.strategy.old <- future::plan("list") [18:41:43.887] options(future.plan = NULL) [18:41:43.887] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.887] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.887] } [18:41:43.887] ...future.workdir <- getwd() [18:41:43.887] } [18:41:43.887] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.887] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.887] } [18:41:43.887] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.887] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.887] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.887] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.887] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.887] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.887] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.887] base::names(...future.oldOptions)) [18:41:43.887] } [18:41:43.887] if (FALSE) { [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] if (TRUE) { [18:41:43.887] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.887] open = "w") [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.887] windows = "NUL", "/dev/null"), open = "w") [18:41:43.887] } [18:41:43.887] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.887] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.887] base::sink(type = "output", split = FALSE) [18:41:43.887] base::close(...future.stdout) [18:41:43.887] }, add = TRUE) [18:41:43.887] } [18:41:43.887] ...future.frame <- base::sys.nframe() [18:41:43.887] ...future.conditions <- base::list() [18:41:43.887] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.887] if (FALSE) { [18:41:43.887] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.887] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.887] } [18:41:43.887] ...future.result <- base::tryCatch({ [18:41:43.887] base::withCallingHandlers({ [18:41:43.887] ...future.value <- base::withVisible(base::local({ [18:41:43.887] do.call(function(...) { [18:41:43.887] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.887] if (!identical(...future.globals.maxSize.org, [18:41:43.887] ...future.globals.maxSize)) { [18:41:43.887] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.887] on.exit(options(oopts), add = TRUE) [18:41:43.887] } [18:41:43.887] { [18:41:43.887] lapply(seq_along(...future.elements_ii), [18:41:43.887] FUN = function(jj) { [18:41:43.887] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.887] ...future.FUN(...future.X_jj, ...) [18:41:43.887] }) [18:41:43.887] } [18:41:43.887] }, args = future.call.arguments) [18:41:43.887] })) [18:41:43.887] future::FutureResult(value = ...future.value$value, [18:41:43.887] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.887] ...future.rng), globalenv = if (FALSE) [18:41:43.887] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.887] ...future.globalenv.names)) [18:41:43.887] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.887] }, condition = base::local({ [18:41:43.887] c <- base::c [18:41:43.887] inherits <- base::inherits [18:41:43.887] invokeRestart <- base::invokeRestart [18:41:43.887] length <- base::length [18:41:43.887] list <- base::list [18:41:43.887] seq.int <- base::seq.int [18:41:43.887] signalCondition <- base::signalCondition [18:41:43.887] sys.calls <- base::sys.calls [18:41:43.887] `[[` <- base::`[[` [18:41:43.887] `+` <- base::`+` [18:41:43.887] `<<-` <- base::`<<-` [18:41:43.887] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.887] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.887] 3L)] [18:41:43.887] } [18:41:43.887] function(cond) { [18:41:43.887] is_error <- inherits(cond, "error") [18:41:43.887] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.887] NULL) [18:41:43.887] if (is_error) { [18:41:43.887] sessionInformation <- function() { [18:41:43.887] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.887] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.887] search = base::search(), system = base::Sys.info()) [18:41:43.887] } [18:41:43.887] ...future.conditions[[length(...future.conditions) + [18:41:43.887] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.887] cond$call), session = sessionInformation(), [18:41:43.887] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.887] signalCondition(cond) [18:41:43.887] } [18:41:43.887] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.887] "immediateCondition"))) { [18:41:43.887] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.887] ...future.conditions[[length(...future.conditions) + [18:41:43.887] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.887] if (TRUE && !signal) { [18:41:43.887] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.887] { [18:41:43.887] inherits <- base::inherits [18:41:43.887] invokeRestart <- base::invokeRestart [18:41:43.887] is.null <- base::is.null [18:41:43.887] muffled <- FALSE [18:41:43.887] if (inherits(cond, "message")) { [18:41:43.887] muffled <- grepl(pattern, "muffleMessage") [18:41:43.887] if (muffled) [18:41:43.887] invokeRestart("muffleMessage") [18:41:43.887] } [18:41:43.887] else if (inherits(cond, "warning")) { [18:41:43.887] muffled <- grepl(pattern, "muffleWarning") [18:41:43.887] if (muffled) [18:41:43.887] invokeRestart("muffleWarning") [18:41:43.887] } [18:41:43.887] else if (inherits(cond, "condition")) { [18:41:43.887] if (!is.null(pattern)) { [18:41:43.887] computeRestarts <- base::computeRestarts [18:41:43.887] grepl <- base::grepl [18:41:43.887] restarts <- computeRestarts(cond) [18:41:43.887] for (restart in restarts) { [18:41:43.887] name <- restart$name [18:41:43.887] if (is.null(name)) [18:41:43.887] next [18:41:43.887] if (!grepl(pattern, name)) [18:41:43.887] next [18:41:43.887] invokeRestart(restart) [18:41:43.887] muffled <- TRUE [18:41:43.887] break [18:41:43.887] } [18:41:43.887] } [18:41:43.887] } [18:41:43.887] invisible(muffled) [18:41:43.887] } [18:41:43.887] muffleCondition(cond, pattern = "^muffle") [18:41:43.887] } [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] if (TRUE) { [18:41:43.887] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.887] { [18:41:43.887] inherits <- base::inherits [18:41:43.887] invokeRestart <- base::invokeRestart [18:41:43.887] is.null <- base::is.null [18:41:43.887] muffled <- FALSE [18:41:43.887] if (inherits(cond, "message")) { [18:41:43.887] muffled <- grepl(pattern, "muffleMessage") [18:41:43.887] if (muffled) [18:41:43.887] invokeRestart("muffleMessage") [18:41:43.887] } [18:41:43.887] else if (inherits(cond, "warning")) { [18:41:43.887] muffled <- grepl(pattern, "muffleWarning") [18:41:43.887] if (muffled) [18:41:43.887] invokeRestart("muffleWarning") [18:41:43.887] } [18:41:43.887] else if (inherits(cond, "condition")) { [18:41:43.887] if (!is.null(pattern)) { [18:41:43.887] computeRestarts <- base::computeRestarts [18:41:43.887] grepl <- base::grepl [18:41:43.887] restarts <- computeRestarts(cond) [18:41:43.887] for (restart in restarts) { [18:41:43.887] name <- restart$name [18:41:43.887] if (is.null(name)) [18:41:43.887] next [18:41:43.887] if (!grepl(pattern, name)) [18:41:43.887] next [18:41:43.887] invokeRestart(restart) [18:41:43.887] muffled <- TRUE [18:41:43.887] break [18:41:43.887] } [18:41:43.887] } [18:41:43.887] } [18:41:43.887] invisible(muffled) [18:41:43.887] } [18:41:43.887] muffleCondition(cond, pattern = "^muffle") [18:41:43.887] } [18:41:43.887] } [18:41:43.887] } [18:41:43.887] })) [18:41:43.887] }, error = function(ex) { [18:41:43.887] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.887] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.887] ...future.rng), started = ...future.startTime, [18:41:43.887] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.887] version = "1.8"), class = "FutureResult") [18:41:43.887] }, finally = { [18:41:43.887] if (!identical(...future.workdir, getwd())) [18:41:43.887] setwd(...future.workdir) [18:41:43.887] { [18:41:43.887] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.887] ...future.oldOptions$nwarnings <- NULL [18:41:43.887] } [18:41:43.887] base::options(...future.oldOptions) [18:41:43.887] if (.Platform$OS.type == "windows") { [18:41:43.887] old_names <- names(...future.oldEnvVars) [18:41:43.887] envs <- base::Sys.getenv() [18:41:43.887] names <- names(envs) [18:41:43.887] common <- intersect(names, old_names) [18:41:43.887] added <- setdiff(names, old_names) [18:41:43.887] removed <- setdiff(old_names, names) [18:41:43.887] changed <- common[...future.oldEnvVars[common] != [18:41:43.887] envs[common]] [18:41:43.887] NAMES <- toupper(changed) [18:41:43.887] args <- list() [18:41:43.887] for (kk in seq_along(NAMES)) { [18:41:43.887] name <- changed[[kk]] [18:41:43.887] NAME <- NAMES[[kk]] [18:41:43.887] if (name != NAME && is.element(NAME, old_names)) [18:41:43.887] next [18:41:43.887] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.887] } [18:41:43.887] NAMES <- toupper(added) [18:41:43.887] for (kk in seq_along(NAMES)) { [18:41:43.887] name <- added[[kk]] [18:41:43.887] NAME <- NAMES[[kk]] [18:41:43.887] if (name != NAME && is.element(NAME, old_names)) [18:41:43.887] next [18:41:43.887] args[[name]] <- "" [18:41:43.887] } [18:41:43.887] NAMES <- toupper(removed) [18:41:43.887] for (kk in seq_along(NAMES)) { [18:41:43.887] name <- removed[[kk]] [18:41:43.887] NAME <- NAMES[[kk]] [18:41:43.887] if (name != NAME && is.element(NAME, old_names)) [18:41:43.887] next [18:41:43.887] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.887] } [18:41:43.887] if (length(args) > 0) [18:41:43.887] base::do.call(base::Sys.setenv, args = args) [18:41:43.887] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.887] } [18:41:43.887] { [18:41:43.887] if (base::length(...future.futureOptionsAdded) > [18:41:43.887] 0L) { [18:41:43.887] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.887] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.887] base::options(opts) [18:41:43.887] } [18:41:43.887] { [18:41:43.887] { [18:41:43.887] NULL [18:41:43.887] RNGkind("Mersenne-Twister") [18:41:43.887] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.887] inherits = FALSE) [18:41:43.887] } [18:41:43.887] options(future.plan = NULL) [18:41:43.887] if (is.na(NA_character_)) [18:41:43.887] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.887] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.887] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.887] .init = FALSE) [18:41:43.887] } [18:41:43.887] } [18:41:43.887] } [18:41:43.887] }) [18:41:43.887] if (TRUE) { [18:41:43.887] base::sink(type = "output", split = FALSE) [18:41:43.887] if (TRUE) { [18:41:43.887] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.887] } [18:41:43.887] else { [18:41:43.887] ...future.result["stdout"] <- base::list(NULL) [18:41:43.887] } [18:41:43.887] base::close(...future.stdout) [18:41:43.887] ...future.stdout <- NULL [18:41:43.887] } [18:41:43.887] ...future.result$conditions <- ...future.conditions [18:41:43.887] ...future.result$finished <- base::Sys.time() [18:41:43.887] ...future.result [18:41:43.887] } [18:41:43.891] assign_globals() ... [18:41:43.891] List of 5 [18:41:43.891] $ ...future.FUN :function (x) [18:41:43.891] $ future.call.arguments : list() [18:41:43.891] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.891] $ ...future.elements_ii :List of 3 [18:41:43.891] ..$ : chr "a" [18:41:43.891] ..$ : chr "b" [18:41:43.891] ..$ : chr "c" [18:41:43.891] $ ...future.seeds_ii : NULL [18:41:43.891] $ ...future.globals.maxSize: NULL [18:41:43.891] - attr(*, "where")=List of 5 [18:41:43.891] ..$ ...future.FUN : [18:41:43.891] ..$ future.call.arguments : [18:41:43.891] ..$ ...future.elements_ii : [18:41:43.891] ..$ ...future.seeds_ii : [18:41:43.891] ..$ ...future.globals.maxSize: [18:41:43.891] - attr(*, "resolved")= logi FALSE [18:41:43.891] - attr(*, "total_size")= num 4788 [18:41:43.891] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.891] - attr(*, "already-done")= logi TRUE [18:41:43.898] - copied '...future.FUN' to environment [18:41:43.898] - copied 'future.call.arguments' to environment [18:41:43.898] - copied '...future.elements_ii' to environment [18:41:43.898] - copied '...future.seeds_ii' to environment [18:41:43.899] - copied '...future.globals.maxSize' to environment [18:41:43.899] assign_globals() ... done [18:41:43.899] plan(): Setting new future strategy stack: [18:41:43.899] List of future strategies: [18:41:43.899] 1. sequential: [18:41:43.899] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.899] - tweaked: FALSE [18:41:43.899] - call: NULL [18:41:43.900] plan(): nbrOfWorkers() = 1 [18:41:43.901] plan(): Setting new future strategy stack: [18:41:43.901] List of future strategies: [18:41:43.901] 1. sequential: [18:41:43.901] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.901] - tweaked: FALSE [18:41:43.901] - call: plan(strategy) [18:41:43.902] plan(): nbrOfWorkers() = 1 [18:41:43.902] SequentialFuture started (and completed) [18:41:43.902] - Launch lazy future ... done [18:41:43.903] run() for 'SequentialFuture' ... done [18:41:43.903] Created future: [18:41:43.903] SequentialFuture: [18:41:43.903] Label: 'future_sapply-1' [18:41:43.903] Expression: [18:41:43.903] { [18:41:43.903] do.call(function(...) { [18:41:43.903] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.903] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.903] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.903] on.exit(options(oopts), add = TRUE) [18:41:43.903] } [18:41:43.903] { [18:41:43.903] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.903] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.903] ...future.FUN(...future.X_jj, ...) [18:41:43.903] }) [18:41:43.903] } [18:41:43.903] }, args = future.call.arguments) [18:41:43.903] } [18:41:43.903] Lazy evaluation: FALSE [18:41:43.903] Asynchronous evaluation: FALSE [18:41:43.903] Local evaluation: TRUE [18:41:43.903] Environment: R_GlobalEnv [18:41:43.903] Capture standard output: TRUE [18:41:43.903] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.903] Globals: 5 objects totaling 418 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.903] Packages: [18:41:43.903] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.903] Resolved: TRUE [18:41:43.903] Value: 82 bytes of class 'list' [18:41:43.903] Early signaling: FALSE [18:41:43.903] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.903] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.904] Chunk #1 of 1 ... DONE [18:41:43.904] Launching 1 futures (chunks) ... DONE [18:41:43.904] Resolving 1 futures (chunks) ... [18:41:43.905] resolve() on list ... [18:41:43.905] recursive: 0 [18:41:43.905] length: 1 [18:41:43.905] [18:41:43.905] resolved() for 'SequentialFuture' ... [18:41:43.905] - state: 'finished' [18:41:43.906] - run: TRUE [18:41:43.906] - result: 'FutureResult' [18:41:43.906] resolved() for 'SequentialFuture' ... done [18:41:43.906] Future #1 [18:41:43.906] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.907] - nx: 1 [18:41:43.907] - relay: TRUE [18:41:43.907] - stdout: TRUE [18:41:43.907] - signal: TRUE [18:41:43.907] - resignal: FALSE [18:41:43.907] - force: TRUE [18:41:43.907] - relayed: [n=1] FALSE [18:41:43.908] - queued futures: [n=1] FALSE [18:41:43.908] - until=1 [18:41:43.908] - relaying element #1 [18:41:43.908] - relayed: [n=1] TRUE [18:41:43.908] - queued futures: [n=1] TRUE [18:41:43.909] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.909] length: 0 (resolved future 1) [18:41:43.909] Relaying remaining futures [18:41:43.909] signalConditionsASAP(NULL, pos=0) ... [18:41:43.909] - nx: 1 [18:41:43.909] - relay: TRUE [18:41:43.909] - stdout: TRUE [18:41:43.910] - signal: TRUE [18:41:43.910] - resignal: FALSE [18:41:43.910] - force: TRUE [18:41:43.910] - relayed: [n=1] TRUE [18:41:43.910] - queued futures: [n=1] TRUE - flush all [18:41:43.911] - relayed: [n=1] TRUE [18:41:43.911] - queued futures: [n=1] TRUE [18:41:43.911] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.911] resolve() on list ... DONE [18:41:43.911] - Number of value chunks collected: 1 [18:41:43.911] Resolving 1 futures (chunks) ... DONE [18:41:43.912] Reducing values from 1 chunks ... [18:41:43.912] - Number of values collected after concatenation: 3 [18:41:43.912] - Number of values expected: 3 [18:41:43.912] Reducing values from 1 chunks ... DONE [18:41:43.912] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:43.914] future_lapply() ... [18:41:43.915] Number of chunks: 1 [18:41:43.915] getGlobalsAndPackagesXApply() ... [18:41:43.915] - future.globals: TRUE [18:41:43.915] getGlobalsAndPackages() ... [18:41:43.916] Searching for globals... [18:41:43.917] - globals found: [2] 'FUN', 'UseMethod' [18:41:43.917] Searching for globals ... DONE [18:41:43.917] Resolving globals: FALSE [18:41:43.918] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:43.918] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:43.918] - globals: [1] 'FUN' [18:41:43.918] [18:41:43.919] getGlobalsAndPackages() ... DONE [18:41:43.919] - globals found/used: [n=1] 'FUN' [18:41:43.919] - needed namespaces: [n=0] [18:41:43.919] Finding globals ... DONE [18:41:43.919] - use_args: TRUE [18:41:43.919] - Getting '...' globals ... [18:41:43.920] resolve() on list ... [18:41:43.920] recursive: 0 [18:41:43.920] length: 1 [18:41:43.920] elements: '...' [18:41:43.921] length: 0 (resolved future 1) [18:41:43.921] resolve() on list ... DONE [18:41:43.921] - '...' content: [n=0] [18:41:43.921] List of 1 [18:41:43.921] $ ...: list() [18:41:43.921] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.921] - attr(*, "where")=List of 1 [18:41:43.921] ..$ ...: [18:41:43.921] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.921] - attr(*, "resolved")= logi TRUE [18:41:43.921] - attr(*, "total_size")= num NA [18:41:43.927] - Getting '...' globals ... DONE [18:41:43.927] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.927] List of 2 [18:41:43.927] $ ...future.FUN:function (x, ...) [18:41:43.927] $ ... : list() [18:41:43.927] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.927] - attr(*, "where")=List of 2 [18:41:43.927] ..$ ...future.FUN: [18:41:43.927] ..$ ... : [18:41:43.927] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.927] - attr(*, "resolved")= logi FALSE [18:41:43.927] - attr(*, "total_size")= int 5028 [18:41:43.930] Packages to be attached in all futures: [n=0] [18:41:43.930] getGlobalsAndPackagesXApply() ... DONE [18:41:43.931] Number of futures (= number of chunks): 1 [18:41:43.931] Launching 1 futures (chunks) ... [18:41:43.931] Chunk #1 of 1 ... [18:41:43.931] - Finding globals in 'X' for chunk #1 ... [18:41:43.931] getGlobalsAndPackages() ... [18:41:43.932] Searching for globals... [18:41:43.932] [18:41:43.932] Searching for globals ... DONE [18:41:43.932] - globals: [0] [18:41:43.932] getGlobalsAndPackages() ... DONE [18:41:43.933] + additional globals found: [n=0] [18:41:43.933] + additional namespaces needed: [n=0] [18:41:43.933] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.933] - seeds: [18:41:43.933] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.933] getGlobalsAndPackages() ... [18:41:43.934] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.934] Resolving globals: FALSE [18:41:43.934] Tweak future expression to call with '...' arguments ... [18:41:43.934] { [18:41:43.934] do.call(function(...) { [18:41:43.934] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.934] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.934] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.934] on.exit(options(oopts), add = TRUE) [18:41:43.934] } [18:41:43.934] { [18:41:43.934] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.934] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.934] ...future.FUN(...future.X_jj, ...) [18:41:43.934] }) [18:41:43.934] } [18:41:43.934] }, args = future.call.arguments) [18:41:43.934] } [18:41:43.934] Tweak future expression to call with '...' arguments ... DONE [18:41:43.935] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.935] [18:41:43.935] getGlobalsAndPackages() ... DONE [18:41:43.936] run() for 'Future' ... [18:41:43.936] - state: 'created' [18:41:43.936] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.936] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.937] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.937] - Field: 'label' [18:41:43.937] - Field: 'local' [18:41:43.937] - Field: 'owner' [18:41:43.937] - Field: 'envir' [18:41:43.938] - Field: 'packages' [18:41:43.938] - Field: 'gc' [18:41:43.938] - Field: 'conditions' [18:41:43.938] - Field: 'expr' [18:41:43.938] - Field: 'uuid' [18:41:43.938] - Field: 'seed' [18:41:43.939] - Field: 'version' [18:41:43.939] - Field: 'result' [18:41:43.939] - Field: 'asynchronous' [18:41:43.939] - Field: 'calls' [18:41:43.939] - Field: 'globals' [18:41:43.940] - Field: 'stdout' [18:41:43.940] - Field: 'earlySignal' [18:41:43.940] - Field: 'lazy' [18:41:43.940] - Field: 'state' [18:41:43.940] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.940] - Launch lazy future ... [18:41:43.941] Packages needed by the future expression (n = 0): [18:41:43.941] Packages needed by future strategies (n = 0): [18:41:43.941] { [18:41:43.941] { [18:41:43.941] { [18:41:43.941] ...future.startTime <- base::Sys.time() [18:41:43.941] { [18:41:43.941] { [18:41:43.941] { [18:41:43.941] base::local({ [18:41:43.941] has_future <- base::requireNamespace("future", [18:41:43.941] quietly = TRUE) [18:41:43.941] if (has_future) { [18:41:43.941] ns <- base::getNamespace("future") [18:41:43.941] version <- ns[[".package"]][["version"]] [18:41:43.941] if (is.null(version)) [18:41:43.941] version <- utils::packageVersion("future") [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] version <- NULL [18:41:43.941] } [18:41:43.941] if (!has_future || version < "1.8.0") { [18:41:43.941] info <- base::c(r_version = base::gsub("R version ", [18:41:43.941] "", base::R.version$version.string), [18:41:43.941] platform = base::sprintf("%s (%s-bit)", [18:41:43.941] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.941] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.941] "release", "version")], collapse = " "), [18:41:43.941] hostname = base::Sys.info()[["nodename"]]) [18:41:43.941] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.941] info) [18:41:43.941] info <- base::paste(info, collapse = "; ") [18:41:43.941] if (!has_future) { [18:41:43.941] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.941] info) [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.941] info, version) [18:41:43.941] } [18:41:43.941] base::stop(msg) [18:41:43.941] } [18:41:43.941] }) [18:41:43.941] } [18:41:43.941] ...future.strategy.old <- future::plan("list") [18:41:43.941] options(future.plan = NULL) [18:41:43.941] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.941] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.941] } [18:41:43.941] ...future.workdir <- getwd() [18:41:43.941] } [18:41:43.941] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.941] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.941] } [18:41:43.941] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.941] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.941] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.941] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.941] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.941] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.941] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.941] base::names(...future.oldOptions)) [18:41:43.941] } [18:41:43.941] if (FALSE) { [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] if (TRUE) { [18:41:43.941] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.941] open = "w") [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.941] windows = "NUL", "/dev/null"), open = "w") [18:41:43.941] } [18:41:43.941] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.941] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.941] base::sink(type = "output", split = FALSE) [18:41:43.941] base::close(...future.stdout) [18:41:43.941] }, add = TRUE) [18:41:43.941] } [18:41:43.941] ...future.frame <- base::sys.nframe() [18:41:43.941] ...future.conditions <- base::list() [18:41:43.941] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.941] if (FALSE) { [18:41:43.941] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.941] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.941] } [18:41:43.941] ...future.result <- base::tryCatch({ [18:41:43.941] base::withCallingHandlers({ [18:41:43.941] ...future.value <- base::withVisible(base::local({ [18:41:43.941] do.call(function(...) { [18:41:43.941] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.941] if (!identical(...future.globals.maxSize.org, [18:41:43.941] ...future.globals.maxSize)) { [18:41:43.941] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.941] on.exit(options(oopts), add = TRUE) [18:41:43.941] } [18:41:43.941] { [18:41:43.941] lapply(seq_along(...future.elements_ii), [18:41:43.941] FUN = function(jj) { [18:41:43.941] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.941] ...future.FUN(...future.X_jj, ...) [18:41:43.941] }) [18:41:43.941] } [18:41:43.941] }, args = future.call.arguments) [18:41:43.941] })) [18:41:43.941] future::FutureResult(value = ...future.value$value, [18:41:43.941] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.941] ...future.rng), globalenv = if (FALSE) [18:41:43.941] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.941] ...future.globalenv.names)) [18:41:43.941] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.941] }, condition = base::local({ [18:41:43.941] c <- base::c [18:41:43.941] inherits <- base::inherits [18:41:43.941] invokeRestart <- base::invokeRestart [18:41:43.941] length <- base::length [18:41:43.941] list <- base::list [18:41:43.941] seq.int <- base::seq.int [18:41:43.941] signalCondition <- base::signalCondition [18:41:43.941] sys.calls <- base::sys.calls [18:41:43.941] `[[` <- base::`[[` [18:41:43.941] `+` <- base::`+` [18:41:43.941] `<<-` <- base::`<<-` [18:41:43.941] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.941] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.941] 3L)] [18:41:43.941] } [18:41:43.941] function(cond) { [18:41:43.941] is_error <- inherits(cond, "error") [18:41:43.941] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.941] NULL) [18:41:43.941] if (is_error) { [18:41:43.941] sessionInformation <- function() { [18:41:43.941] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.941] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.941] search = base::search(), system = base::Sys.info()) [18:41:43.941] } [18:41:43.941] ...future.conditions[[length(...future.conditions) + [18:41:43.941] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.941] cond$call), session = sessionInformation(), [18:41:43.941] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.941] signalCondition(cond) [18:41:43.941] } [18:41:43.941] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.941] "immediateCondition"))) { [18:41:43.941] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.941] ...future.conditions[[length(...future.conditions) + [18:41:43.941] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.941] if (TRUE && !signal) { [18:41:43.941] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.941] { [18:41:43.941] inherits <- base::inherits [18:41:43.941] invokeRestart <- base::invokeRestart [18:41:43.941] is.null <- base::is.null [18:41:43.941] muffled <- FALSE [18:41:43.941] if (inherits(cond, "message")) { [18:41:43.941] muffled <- grepl(pattern, "muffleMessage") [18:41:43.941] if (muffled) [18:41:43.941] invokeRestart("muffleMessage") [18:41:43.941] } [18:41:43.941] else if (inherits(cond, "warning")) { [18:41:43.941] muffled <- grepl(pattern, "muffleWarning") [18:41:43.941] if (muffled) [18:41:43.941] invokeRestart("muffleWarning") [18:41:43.941] } [18:41:43.941] else if (inherits(cond, "condition")) { [18:41:43.941] if (!is.null(pattern)) { [18:41:43.941] computeRestarts <- base::computeRestarts [18:41:43.941] grepl <- base::grepl [18:41:43.941] restarts <- computeRestarts(cond) [18:41:43.941] for (restart in restarts) { [18:41:43.941] name <- restart$name [18:41:43.941] if (is.null(name)) [18:41:43.941] next [18:41:43.941] if (!grepl(pattern, name)) [18:41:43.941] next [18:41:43.941] invokeRestart(restart) [18:41:43.941] muffled <- TRUE [18:41:43.941] break [18:41:43.941] } [18:41:43.941] } [18:41:43.941] } [18:41:43.941] invisible(muffled) [18:41:43.941] } [18:41:43.941] muffleCondition(cond, pattern = "^muffle") [18:41:43.941] } [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] if (TRUE) { [18:41:43.941] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.941] { [18:41:43.941] inherits <- base::inherits [18:41:43.941] invokeRestart <- base::invokeRestart [18:41:43.941] is.null <- base::is.null [18:41:43.941] muffled <- FALSE [18:41:43.941] if (inherits(cond, "message")) { [18:41:43.941] muffled <- grepl(pattern, "muffleMessage") [18:41:43.941] if (muffled) [18:41:43.941] invokeRestart("muffleMessage") [18:41:43.941] } [18:41:43.941] else if (inherits(cond, "warning")) { [18:41:43.941] muffled <- grepl(pattern, "muffleWarning") [18:41:43.941] if (muffled) [18:41:43.941] invokeRestart("muffleWarning") [18:41:43.941] } [18:41:43.941] else if (inherits(cond, "condition")) { [18:41:43.941] if (!is.null(pattern)) { [18:41:43.941] computeRestarts <- base::computeRestarts [18:41:43.941] grepl <- base::grepl [18:41:43.941] restarts <- computeRestarts(cond) [18:41:43.941] for (restart in restarts) { [18:41:43.941] name <- restart$name [18:41:43.941] if (is.null(name)) [18:41:43.941] next [18:41:43.941] if (!grepl(pattern, name)) [18:41:43.941] next [18:41:43.941] invokeRestart(restart) [18:41:43.941] muffled <- TRUE [18:41:43.941] break [18:41:43.941] } [18:41:43.941] } [18:41:43.941] } [18:41:43.941] invisible(muffled) [18:41:43.941] } [18:41:43.941] muffleCondition(cond, pattern = "^muffle") [18:41:43.941] } [18:41:43.941] } [18:41:43.941] } [18:41:43.941] })) [18:41:43.941] }, error = function(ex) { [18:41:43.941] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.941] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.941] ...future.rng), started = ...future.startTime, [18:41:43.941] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.941] version = "1.8"), class = "FutureResult") [18:41:43.941] }, finally = { [18:41:43.941] if (!identical(...future.workdir, getwd())) [18:41:43.941] setwd(...future.workdir) [18:41:43.941] { [18:41:43.941] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.941] ...future.oldOptions$nwarnings <- NULL [18:41:43.941] } [18:41:43.941] base::options(...future.oldOptions) [18:41:43.941] if (.Platform$OS.type == "windows") { [18:41:43.941] old_names <- names(...future.oldEnvVars) [18:41:43.941] envs <- base::Sys.getenv() [18:41:43.941] names <- names(envs) [18:41:43.941] common <- intersect(names, old_names) [18:41:43.941] added <- setdiff(names, old_names) [18:41:43.941] removed <- setdiff(old_names, names) [18:41:43.941] changed <- common[...future.oldEnvVars[common] != [18:41:43.941] envs[common]] [18:41:43.941] NAMES <- toupper(changed) [18:41:43.941] args <- list() [18:41:43.941] for (kk in seq_along(NAMES)) { [18:41:43.941] name <- changed[[kk]] [18:41:43.941] NAME <- NAMES[[kk]] [18:41:43.941] if (name != NAME && is.element(NAME, old_names)) [18:41:43.941] next [18:41:43.941] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.941] } [18:41:43.941] NAMES <- toupper(added) [18:41:43.941] for (kk in seq_along(NAMES)) { [18:41:43.941] name <- added[[kk]] [18:41:43.941] NAME <- NAMES[[kk]] [18:41:43.941] if (name != NAME && is.element(NAME, old_names)) [18:41:43.941] next [18:41:43.941] args[[name]] <- "" [18:41:43.941] } [18:41:43.941] NAMES <- toupper(removed) [18:41:43.941] for (kk in seq_along(NAMES)) { [18:41:43.941] name <- removed[[kk]] [18:41:43.941] NAME <- NAMES[[kk]] [18:41:43.941] if (name != NAME && is.element(NAME, old_names)) [18:41:43.941] next [18:41:43.941] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.941] } [18:41:43.941] if (length(args) > 0) [18:41:43.941] base::do.call(base::Sys.setenv, args = args) [18:41:43.941] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.941] } [18:41:43.941] { [18:41:43.941] if (base::length(...future.futureOptionsAdded) > [18:41:43.941] 0L) { [18:41:43.941] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.941] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.941] base::options(opts) [18:41:43.941] } [18:41:43.941] { [18:41:43.941] { [18:41:43.941] NULL [18:41:43.941] RNGkind("Mersenne-Twister") [18:41:43.941] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.941] inherits = FALSE) [18:41:43.941] } [18:41:43.941] options(future.plan = NULL) [18:41:43.941] if (is.na(NA_character_)) [18:41:43.941] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.941] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.941] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.941] .init = FALSE) [18:41:43.941] } [18:41:43.941] } [18:41:43.941] } [18:41:43.941] }) [18:41:43.941] if (TRUE) { [18:41:43.941] base::sink(type = "output", split = FALSE) [18:41:43.941] if (TRUE) { [18:41:43.941] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.941] } [18:41:43.941] else { [18:41:43.941] ...future.result["stdout"] <- base::list(NULL) [18:41:43.941] } [18:41:43.941] base::close(...future.stdout) [18:41:43.941] ...future.stdout <- NULL [18:41:43.941] } [18:41:43.941] ...future.result$conditions <- ...future.conditions [18:41:43.941] ...future.result$finished <- base::Sys.time() [18:41:43.941] ...future.result [18:41:43.941] } [18:41:43.945] assign_globals() ... [18:41:43.945] List of 5 [18:41:43.945] $ ...future.FUN :function (x, ...) [18:41:43.945] $ future.call.arguments : list() [18:41:43.945] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.945] $ ...future.elements_ii :List of 3 [18:41:43.945] ..$ : chr "a" [18:41:43.945] ..$ : chr "b" [18:41:43.945] ..$ : chr "c" [18:41:43.945] $ ...future.seeds_ii : NULL [18:41:43.945] $ ...future.globals.maxSize: NULL [18:41:43.945] - attr(*, "where")=List of 5 [18:41:43.945] ..$ ...future.FUN : [18:41:43.945] ..$ future.call.arguments : [18:41:43.945] ..$ ...future.elements_ii : [18:41:43.945] ..$ ...future.seeds_ii : [18:41:43.945] ..$ ...future.globals.maxSize: [18:41:43.945] - attr(*, "resolved")= logi FALSE [18:41:43.945] - attr(*, "total_size")= num 5028 [18:41:43.945] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.945] - attr(*, "already-done")= logi TRUE [18:41:43.952] - copied '...future.FUN' to environment [18:41:43.952] - copied 'future.call.arguments' to environment [18:41:43.952] - copied '...future.elements_ii' to environment [18:41:43.952] - copied '...future.seeds_ii' to environment [18:41:43.952] - copied '...future.globals.maxSize' to environment [18:41:43.952] assign_globals() ... done [18:41:43.953] plan(): Setting new future strategy stack: [18:41:43.953] List of future strategies: [18:41:43.953] 1. sequential: [18:41:43.953] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.953] - tweaked: FALSE [18:41:43.953] - call: NULL [18:41:43.954] plan(): nbrOfWorkers() = 1 [18:41:43.955] plan(): Setting new future strategy stack: [18:41:43.955] List of future strategies: [18:41:43.955] 1. sequential: [18:41:43.955] - args: function (..., envir = parent.frame(), workers = "") [18:41:43.955] - tweaked: FALSE [18:41:43.955] - call: plan(strategy) [18:41:43.956] plan(): nbrOfWorkers() = 1 [18:41:43.956] SequentialFuture started (and completed) [18:41:43.956] - Launch lazy future ... done [18:41:43.956] run() for 'SequentialFuture' ... done [18:41:43.957] Created future: [18:41:43.957] SequentialFuture: [18:41:43.957] Label: 'future_sapply-1' [18:41:43.957] Expression: [18:41:43.957] { [18:41:43.957] do.call(function(...) { [18:41:43.957] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.957] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.957] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.957] on.exit(options(oopts), add = TRUE) [18:41:43.957] } [18:41:43.957] { [18:41:43.957] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.957] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.957] ...future.FUN(...future.X_jj, ...) [18:41:43.957] }) [18:41:43.957] } [18:41:43.957] }, args = future.call.arguments) [18:41:43.957] } [18:41:43.957] Lazy evaluation: FALSE [18:41:43.957] Asynchronous evaluation: FALSE [18:41:43.957] Local evaluation: TRUE [18:41:43.957] Environment: R_GlobalEnv [18:41:43.957] Capture standard output: TRUE [18:41:43.957] Capture condition classes: 'condition' (excluding 'nothing') [18:41:43.957] Globals: 5 objects totaling 511 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 82 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:43.957] Packages: [18:41:43.957] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:43.957] Resolved: TRUE [18:41:43.957] Value: 177 bytes of class 'list' [18:41:43.957] Early signaling: FALSE [18:41:43.957] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:43.957] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.958] Chunk #1 of 1 ... DONE [18:41:43.958] Launching 1 futures (chunks) ... DONE [18:41:43.958] Resolving 1 futures (chunks) ... [18:41:43.958] resolve() on list ... [18:41:43.959] recursive: 0 [18:41:43.959] length: 1 [18:41:43.959] [18:41:43.959] resolved() for 'SequentialFuture' ... [18:41:43.959] - state: 'finished' [18:41:43.959] - run: TRUE [18:41:43.960] - result: 'FutureResult' [18:41:43.960] resolved() for 'SequentialFuture' ... done [18:41:43.960] Future #1 [18:41:43.960] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:43.960] - nx: 1 [18:41:43.961] - relay: TRUE [18:41:43.961] - stdout: TRUE [18:41:43.961] - signal: TRUE [18:41:43.961] - resignal: FALSE [18:41:43.961] - force: TRUE [18:41:43.961] - relayed: [n=1] FALSE [18:41:43.961] - queued futures: [n=1] FALSE [18:41:43.962] - until=1 [18:41:43.962] - relaying element #1 [18:41:43.962] - relayed: [n=1] TRUE [18:41:43.962] - queued futures: [n=1] TRUE [18:41:43.962] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:43.963] length: 0 (resolved future 1) [18:41:43.963] Relaying remaining futures [18:41:43.963] signalConditionsASAP(NULL, pos=0) ... [18:41:43.963] - nx: 1 [18:41:43.963] - relay: TRUE [18:41:43.963] - stdout: TRUE [18:41:43.963] - signal: TRUE [18:41:43.964] - resignal: FALSE [18:41:43.964] - force: TRUE [18:41:43.964] - relayed: [n=1] TRUE [18:41:43.964] - queued futures: [n=1] TRUE - flush all [18:41:43.964] - relayed: [n=1] TRUE [18:41:43.964] - queued futures: [n=1] TRUE [18:41:43.965] signalConditionsASAP(NULL, pos=0) ... done [18:41:43.965] resolve() on list ... DONE [18:41:43.965] - Number of value chunks collected: 1 [18:41:43.965] Resolving 1 futures (chunks) ... DONE [18:41:43.965] Reducing values from 1 chunks ... [18:41:43.966] - Number of values collected after concatenation: 3 [18:41:43.966] - Number of values expected: 3 [18:41:43.966] Reducing values from 1 chunks ... DONE [18:41:43.966] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:43.968] future_lapply() ... [18:41:43.968] Number of chunks: 1 [18:41:43.969] getGlobalsAndPackagesXApply() ... [18:41:43.969] - future.globals: TRUE [18:41:43.969] getGlobalsAndPackages() ... [18:41:43.969] Searching for globals... [18:41:43.970] - globals found: [1] 'FUN' [18:41:43.970] Searching for globals ... DONE [18:41:43.971] Resolving globals: FALSE [18:41:43.971] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:43.971] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:43.972] - globals: [1] 'FUN' [18:41:43.972] [18:41:43.972] getGlobalsAndPackages() ... DONE [18:41:43.972] - globals found/used: [n=1] 'FUN' [18:41:43.972] - needed namespaces: [n=0] [18:41:43.972] Finding globals ... DONE [18:41:43.973] - use_args: TRUE [18:41:43.973] - Getting '...' globals ... [18:41:43.973] resolve() on list ... [18:41:43.973] recursive: 0 [18:41:43.974] length: 1 [18:41:43.974] elements: '...' [18:41:43.974] length: 0 (resolved future 1) [18:41:43.974] resolve() on list ... DONE [18:41:43.974] - '...' content: [n=0] [18:41:43.974] List of 1 [18:41:43.974] $ ...: list() [18:41:43.974] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.974] - attr(*, "where")=List of 1 [18:41:43.974] ..$ ...: [18:41:43.974] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.974] - attr(*, "resolved")= logi TRUE [18:41:43.974] - attr(*, "total_size")= num NA [18:41:43.977] - Getting '...' globals ... DONE [18:41:43.978] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:43.978] List of 2 [18:41:43.978] $ ...future.FUN:function (x) [18:41:43.978] $ ... : list() [18:41:43.978] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.978] - attr(*, "where")=List of 2 [18:41:43.978] ..$ ...future.FUN: [18:41:43.978] ..$ ... : [18:41:43.978] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.978] - attr(*, "resolved")= logi FALSE [18:41:43.978] - attr(*, "total_size")= int 4910 [18:41:43.981] Packages to be attached in all futures: [n=0] [18:41:43.981] getGlobalsAndPackagesXApply() ... DONE [18:41:43.981] Number of futures (= number of chunks): 1 [18:41:43.982] Launching 1 futures (chunks) ... [18:41:43.982] Chunk #1 of 1 ... [18:41:43.982] - Finding globals in 'X' for chunk #1 ... [18:41:43.982] getGlobalsAndPackages() ... [18:41:43.982] Searching for globals... [18:41:43.983] [18:41:43.983] Searching for globals ... DONE [18:41:43.983] - globals: [0] [18:41:43.983] getGlobalsAndPackages() ... DONE [18:41:43.983] + additional globals found: [n=0] [18:41:43.983] + additional namespaces needed: [n=0] [18:41:43.984] - Finding globals in 'X' for chunk #1 ... DONE [18:41:43.984] - seeds: [18:41:43.984] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.984] getGlobalsAndPackages() ... [18:41:43.984] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.984] Resolving globals: FALSE [18:41:43.985] Tweak future expression to call with '...' arguments ... [18:41:43.985] { [18:41:43.985] do.call(function(...) { [18:41:43.985] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.985] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:43.985] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.985] on.exit(options(oopts), add = TRUE) [18:41:43.985] } [18:41:43.985] { [18:41:43.985] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:43.985] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.985] ...future.FUN(...future.X_jj, ...) [18:41:43.985] }) [18:41:43.985] } [18:41:43.985] }, args = future.call.arguments) [18:41:43.985] } [18:41:43.985] Tweak future expression to call with '...' arguments ... DONE [18:41:43.986] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:43.986] [18:41:43.986] getGlobalsAndPackages() ... DONE [18:41:43.986] run() for 'Future' ... [18:41:43.987] - state: 'created' [18:41:43.987] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:43.987] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:43.987] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:43.988] - Field: 'label' [18:41:43.988] - Field: 'local' [18:41:43.988] - Field: 'owner' [18:41:43.988] - Field: 'envir' [18:41:43.988] - Field: 'packages' [18:41:43.989] - Field: 'gc' [18:41:43.989] - Field: 'conditions' [18:41:43.989] - Field: 'expr' [18:41:43.989] - Field: 'uuid' [18:41:43.989] - Field: 'seed' [18:41:43.989] - Field: 'version' [18:41:43.990] - Field: 'result' [18:41:43.990] - Field: 'asynchronous' [18:41:43.990] - Field: 'calls' [18:41:43.990] - Field: 'globals' [18:41:43.990] - Field: 'stdout' [18:41:43.991] - Field: 'earlySignal' [18:41:43.991] - Field: 'lazy' [18:41:43.991] - Field: 'state' [18:41:43.991] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:43.991] - Launch lazy future ... [18:41:43.991] Packages needed by the future expression (n = 0): [18:41:43.992] Packages needed by future strategies (n = 0): [18:41:43.992] { [18:41:43.992] { [18:41:43.992] { [18:41:43.992] ...future.startTime <- base::Sys.time() [18:41:43.992] { [18:41:43.992] { [18:41:43.992] { [18:41:43.992] base::local({ [18:41:43.992] has_future <- base::requireNamespace("future", [18:41:43.992] quietly = TRUE) [18:41:43.992] if (has_future) { [18:41:43.992] ns <- base::getNamespace("future") [18:41:43.992] version <- ns[[".package"]][["version"]] [18:41:43.992] if (is.null(version)) [18:41:43.992] version <- utils::packageVersion("future") [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] version <- NULL [18:41:43.992] } [18:41:43.992] if (!has_future || version < "1.8.0") { [18:41:43.992] info <- base::c(r_version = base::gsub("R version ", [18:41:43.992] "", base::R.version$version.string), [18:41:43.992] platform = base::sprintf("%s (%s-bit)", [18:41:43.992] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:43.992] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:43.992] "release", "version")], collapse = " "), [18:41:43.992] hostname = base::Sys.info()[["nodename"]]) [18:41:43.992] info <- base::sprintf("%s: %s", base::names(info), [18:41:43.992] info) [18:41:43.992] info <- base::paste(info, collapse = "; ") [18:41:43.992] if (!has_future) { [18:41:43.992] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:43.992] info) [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:43.992] info, version) [18:41:43.992] } [18:41:43.992] base::stop(msg) [18:41:43.992] } [18:41:43.992] }) [18:41:43.992] } [18:41:43.992] ...future.strategy.old <- future::plan("list") [18:41:43.992] options(future.plan = NULL) [18:41:43.992] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.992] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:43.992] } [18:41:43.992] ...future.workdir <- getwd() [18:41:43.992] } [18:41:43.992] ...future.oldOptions <- base::as.list(base::.Options) [18:41:43.992] ...future.oldEnvVars <- base::Sys.getenv() [18:41:43.992] } [18:41:43.992] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:43.992] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:43.992] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:43.992] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:43.992] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:43.992] future.stdout.windows.reencode = NULL, width = 80L) [18:41:43.992] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:43.992] base::names(...future.oldOptions)) [18:41:43.992] } [18:41:43.992] if (FALSE) { [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] if (TRUE) { [18:41:43.992] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:43.992] open = "w") [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:43.992] windows = "NUL", "/dev/null"), open = "w") [18:41:43.992] } [18:41:43.992] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:43.992] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:43.992] base::sink(type = "output", split = FALSE) [18:41:43.992] base::close(...future.stdout) [18:41:43.992] }, add = TRUE) [18:41:43.992] } [18:41:43.992] ...future.frame <- base::sys.nframe() [18:41:43.992] ...future.conditions <- base::list() [18:41:43.992] ...future.rng <- base::globalenv()$.Random.seed [18:41:43.992] if (FALSE) { [18:41:43.992] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:43.992] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:43.992] } [18:41:43.992] ...future.result <- base::tryCatch({ [18:41:43.992] base::withCallingHandlers({ [18:41:43.992] ...future.value <- base::withVisible(base::local({ [18:41:43.992] do.call(function(...) { [18:41:43.992] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:43.992] if (!identical(...future.globals.maxSize.org, [18:41:43.992] ...future.globals.maxSize)) { [18:41:43.992] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:43.992] on.exit(options(oopts), add = TRUE) [18:41:43.992] } [18:41:43.992] { [18:41:43.992] lapply(seq_along(...future.elements_ii), [18:41:43.992] FUN = function(jj) { [18:41:43.992] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:43.992] ...future.FUN(...future.X_jj, ...) [18:41:43.992] }) [18:41:43.992] } [18:41:43.992] }, args = future.call.arguments) [18:41:43.992] })) [18:41:43.992] future::FutureResult(value = ...future.value$value, [18:41:43.992] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.992] ...future.rng), globalenv = if (FALSE) [18:41:43.992] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:43.992] ...future.globalenv.names)) [18:41:43.992] else NULL, started = ...future.startTime, version = "1.8") [18:41:43.992] }, condition = base::local({ [18:41:43.992] c <- base::c [18:41:43.992] inherits <- base::inherits [18:41:43.992] invokeRestart <- base::invokeRestart [18:41:43.992] length <- base::length [18:41:43.992] list <- base::list [18:41:43.992] seq.int <- base::seq.int [18:41:43.992] signalCondition <- base::signalCondition [18:41:43.992] sys.calls <- base::sys.calls [18:41:43.992] `[[` <- base::`[[` [18:41:43.992] `+` <- base::`+` [18:41:43.992] `<<-` <- base::`<<-` [18:41:43.992] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:43.992] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:43.992] 3L)] [18:41:43.992] } [18:41:43.992] function(cond) { [18:41:43.992] is_error <- inherits(cond, "error") [18:41:43.992] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:43.992] NULL) [18:41:43.992] if (is_error) { [18:41:43.992] sessionInformation <- function() { [18:41:43.992] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:43.992] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:43.992] search = base::search(), system = base::Sys.info()) [18:41:43.992] } [18:41:43.992] ...future.conditions[[length(...future.conditions) + [18:41:43.992] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:43.992] cond$call), session = sessionInformation(), [18:41:43.992] timestamp = base::Sys.time(), signaled = 0L) [18:41:43.992] signalCondition(cond) [18:41:43.992] } [18:41:43.992] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:43.992] "immediateCondition"))) { [18:41:43.992] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:43.992] ...future.conditions[[length(...future.conditions) + [18:41:43.992] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:43.992] if (TRUE && !signal) { [18:41:43.992] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.992] { [18:41:43.992] inherits <- base::inherits [18:41:43.992] invokeRestart <- base::invokeRestart [18:41:43.992] is.null <- base::is.null [18:41:43.992] muffled <- FALSE [18:41:43.992] if (inherits(cond, "message")) { [18:41:43.992] muffled <- grepl(pattern, "muffleMessage") [18:41:43.992] if (muffled) [18:41:43.992] invokeRestart("muffleMessage") [18:41:43.992] } [18:41:43.992] else if (inherits(cond, "warning")) { [18:41:43.992] muffled <- grepl(pattern, "muffleWarning") [18:41:43.992] if (muffled) [18:41:43.992] invokeRestart("muffleWarning") [18:41:43.992] } [18:41:43.992] else if (inherits(cond, "condition")) { [18:41:43.992] if (!is.null(pattern)) { [18:41:43.992] computeRestarts <- base::computeRestarts [18:41:43.992] grepl <- base::grepl [18:41:43.992] restarts <- computeRestarts(cond) [18:41:43.992] for (restart in restarts) { [18:41:43.992] name <- restart$name [18:41:43.992] if (is.null(name)) [18:41:43.992] next [18:41:43.992] if (!grepl(pattern, name)) [18:41:43.992] next [18:41:43.992] invokeRestart(restart) [18:41:43.992] muffled <- TRUE [18:41:43.992] break [18:41:43.992] } [18:41:43.992] } [18:41:43.992] } [18:41:43.992] invisible(muffled) [18:41:43.992] } [18:41:43.992] muffleCondition(cond, pattern = "^muffle") [18:41:43.992] } [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] if (TRUE) { [18:41:43.992] muffleCondition <- function (cond, pattern = "^muffle") [18:41:43.992] { [18:41:43.992] inherits <- base::inherits [18:41:43.992] invokeRestart <- base::invokeRestart [18:41:43.992] is.null <- base::is.null [18:41:43.992] muffled <- FALSE [18:41:43.992] if (inherits(cond, "message")) { [18:41:43.992] muffled <- grepl(pattern, "muffleMessage") [18:41:43.992] if (muffled) [18:41:43.992] invokeRestart("muffleMessage") [18:41:43.992] } [18:41:43.992] else if (inherits(cond, "warning")) { [18:41:43.992] muffled <- grepl(pattern, "muffleWarning") [18:41:43.992] if (muffled) [18:41:43.992] invokeRestart("muffleWarning") [18:41:43.992] } [18:41:43.992] else if (inherits(cond, "condition")) { [18:41:43.992] if (!is.null(pattern)) { [18:41:43.992] computeRestarts <- base::computeRestarts [18:41:43.992] grepl <- base::grepl [18:41:43.992] restarts <- computeRestarts(cond) [18:41:43.992] for (restart in restarts) { [18:41:43.992] name <- restart$name [18:41:43.992] if (is.null(name)) [18:41:43.992] next [18:41:43.992] if (!grepl(pattern, name)) [18:41:43.992] next [18:41:43.992] invokeRestart(restart) [18:41:43.992] muffled <- TRUE [18:41:43.992] break [18:41:43.992] } [18:41:43.992] } [18:41:43.992] } [18:41:43.992] invisible(muffled) [18:41:43.992] } [18:41:43.992] muffleCondition(cond, pattern = "^muffle") [18:41:43.992] } [18:41:43.992] } [18:41:43.992] } [18:41:43.992] })) [18:41:43.992] }, error = function(ex) { [18:41:43.992] base::structure(base::list(value = NULL, visible = NULL, [18:41:43.992] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:43.992] ...future.rng), started = ...future.startTime, [18:41:43.992] finished = Sys.time(), session_uuid = NA_character_, [18:41:43.992] version = "1.8"), class = "FutureResult") [18:41:43.992] }, finally = { [18:41:43.992] if (!identical(...future.workdir, getwd())) [18:41:43.992] setwd(...future.workdir) [18:41:43.992] { [18:41:43.992] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:43.992] ...future.oldOptions$nwarnings <- NULL [18:41:43.992] } [18:41:43.992] base::options(...future.oldOptions) [18:41:43.992] if (.Platform$OS.type == "windows") { [18:41:43.992] old_names <- names(...future.oldEnvVars) [18:41:43.992] envs <- base::Sys.getenv() [18:41:43.992] names <- names(envs) [18:41:43.992] common <- intersect(names, old_names) [18:41:43.992] added <- setdiff(names, old_names) [18:41:43.992] removed <- setdiff(old_names, names) [18:41:43.992] changed <- common[...future.oldEnvVars[common] != [18:41:43.992] envs[common]] [18:41:43.992] NAMES <- toupper(changed) [18:41:43.992] args <- list() [18:41:43.992] for (kk in seq_along(NAMES)) { [18:41:43.992] name <- changed[[kk]] [18:41:43.992] NAME <- NAMES[[kk]] [18:41:43.992] if (name != NAME && is.element(NAME, old_names)) [18:41:43.992] next [18:41:43.992] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.992] } [18:41:43.992] NAMES <- toupper(added) [18:41:43.992] for (kk in seq_along(NAMES)) { [18:41:43.992] name <- added[[kk]] [18:41:43.992] NAME <- NAMES[[kk]] [18:41:43.992] if (name != NAME && is.element(NAME, old_names)) [18:41:43.992] next [18:41:43.992] args[[name]] <- "" [18:41:43.992] } [18:41:43.992] NAMES <- toupper(removed) [18:41:43.992] for (kk in seq_along(NAMES)) { [18:41:43.992] name <- removed[[kk]] [18:41:43.992] NAME <- NAMES[[kk]] [18:41:43.992] if (name != NAME && is.element(NAME, old_names)) [18:41:43.992] next [18:41:43.992] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:43.992] } [18:41:43.992] if (length(args) > 0) [18:41:43.992] base::do.call(base::Sys.setenv, args = args) [18:41:43.992] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:43.992] } [18:41:43.992] { [18:41:43.992] if (base::length(...future.futureOptionsAdded) > [18:41:43.992] 0L) { [18:41:43.992] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:43.992] base::names(opts) <- ...future.futureOptionsAdded [18:41:43.992] base::options(opts) [18:41:43.992] } [18:41:43.992] { [18:41:43.992] { [18:41:43.992] NULL [18:41:43.992] RNGkind("Mersenne-Twister") [18:41:43.992] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:43.992] inherits = FALSE) [18:41:43.992] } [18:41:43.992] options(future.plan = NULL) [18:41:43.992] if (is.na(NA_character_)) [18:41:43.992] Sys.unsetenv("R_FUTURE_PLAN") [18:41:43.992] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:43.992] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:43.992] .init = FALSE) [18:41:43.992] } [18:41:43.992] } [18:41:43.992] } [18:41:43.992] }) [18:41:43.992] if (TRUE) { [18:41:43.992] base::sink(type = "output", split = FALSE) [18:41:43.992] if (TRUE) { [18:41:43.992] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:43.992] } [18:41:43.992] else { [18:41:43.992] ...future.result["stdout"] <- base::list(NULL) [18:41:43.992] } [18:41:43.992] base::close(...future.stdout) [18:41:43.992] ...future.stdout <- NULL [18:41:43.992] } [18:41:43.992] ...future.result$conditions <- ...future.conditions [18:41:43.992] ...future.result$finished <- base::Sys.time() [18:41:43.992] ...future.result [18:41:43.992] } [18:41:43.996] assign_globals() ... [18:41:43.996] List of 5 [18:41:43.996] $ ...future.FUN :function (x) [18:41:43.996] $ future.call.arguments : list() [18:41:43.996] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:43.996] $ ...future.elements_ii :List of 4 [18:41:43.996] ..$ A: num 50 [18:41:43.996] ..$ B: num 60 [18:41:43.996] ..$ C: num 70 [18:41:43.996] ..$ D: num 80 [18:41:43.996] $ ...future.seeds_ii : NULL [18:41:43.996] $ ...future.globals.maxSize: NULL [18:41:43.996] - attr(*, "where")=List of 5 [18:41:43.996] ..$ ...future.FUN : [18:41:43.996] ..$ future.call.arguments : [18:41:43.996] ..$ ...future.elements_ii : [18:41:43.996] ..$ ...future.seeds_ii : [18:41:43.996] ..$ ...future.globals.maxSize: [18:41:43.996] - attr(*, "resolved")= logi FALSE [18:41:43.996] - attr(*, "total_size")= num 4910 [18:41:43.996] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:43.996] - attr(*, "already-done")= logi TRUE [18:41:44.003] - copied '...future.FUN' to environment [18:41:44.003] - copied 'future.call.arguments' to environment [18:41:44.004] - copied '...future.elements_ii' to environment [18:41:44.004] - copied '...future.seeds_ii' to environment [18:41:44.004] - copied '...future.globals.maxSize' to environment [18:41:44.004] assign_globals() ... done [18:41:44.004] plan(): Setting new future strategy stack: [18:41:44.005] List of future strategies: [18:41:44.005] 1. sequential: [18:41:44.005] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.005] - tweaked: FALSE [18:41:44.005] - call: NULL [18:41:44.005] plan(): nbrOfWorkers() = 1 [18:41:44.007] plan(): Setting new future strategy stack: [18:41:44.007] List of future strategies: [18:41:44.007] 1. sequential: [18:41:44.007] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.007] - tweaked: FALSE [18:41:44.007] - call: plan(strategy) [18:41:44.007] plan(): nbrOfWorkers() = 1 [18:41:44.008] SequentialFuture started (and completed) [18:41:44.008] - Launch lazy future ... done [18:41:44.008] run() for 'SequentialFuture' ... done [18:41:44.008] Created future: [18:41:44.008] SequentialFuture: [18:41:44.008] Label: 'future_sapply-1' [18:41:44.008] Expression: [18:41:44.008] { [18:41:44.008] do.call(function(...) { [18:41:44.008] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.008] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.008] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.008] on.exit(options(oopts), add = TRUE) [18:41:44.008] } [18:41:44.008] { [18:41:44.008] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.008] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.008] ...future.FUN(...future.X_jj, ...) [18:41:44.008] }) [18:41:44.008] } [18:41:44.008] }, args = future.call.arguments) [18:41:44.008] } [18:41:44.008] Lazy evaluation: FALSE [18:41:44.008] Asynchronous evaluation: FALSE [18:41:44.008] Local evaluation: TRUE [18:41:44.008] Environment: R_GlobalEnv [18:41:44.008] Capture standard output: TRUE [18:41:44.008] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.008] Globals: 5 objects totaling 500 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.008] Packages: [18:41:44.008] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.008] Resolved: TRUE [18:41:44.008] Value: 95 bytes of class 'list' [18:41:44.008] Early signaling: FALSE [18:41:44.008] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.008] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.009] Chunk #1 of 1 ... DONE [18:41:44.010] Launching 1 futures (chunks) ... DONE [18:41:44.010] Resolving 1 futures (chunks) ... [18:41:44.010] resolve() on list ... [18:41:44.010] recursive: 0 [18:41:44.010] length: 1 [18:41:44.010] [18:41:44.011] resolved() for 'SequentialFuture' ... [18:41:44.011] - state: 'finished' [18:41:44.011] - run: TRUE [18:41:44.011] - result: 'FutureResult' [18:41:44.011] resolved() for 'SequentialFuture' ... done [18:41:44.012] Future #1 [18:41:44.012] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.012] - nx: 1 [18:41:44.012] - relay: TRUE [18:41:44.012] - stdout: TRUE [18:41:44.012] - signal: TRUE [18:41:44.013] - resignal: FALSE [18:41:44.013] - force: TRUE [18:41:44.013] - relayed: [n=1] FALSE [18:41:44.013] - queued futures: [n=1] FALSE [18:41:44.013] - until=1 [18:41:44.013] - relaying element #1 [18:41:44.014] - relayed: [n=1] TRUE [18:41:44.014] - queued futures: [n=1] TRUE [18:41:44.014] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.014] length: 0 (resolved future 1) [18:41:44.014] Relaying remaining futures [18:41:44.014] signalConditionsASAP(NULL, pos=0) ... [18:41:44.015] - nx: 1 [18:41:44.015] - relay: TRUE [18:41:44.015] - stdout: TRUE [18:41:44.015] - signal: TRUE [18:41:44.015] - resignal: FALSE [18:41:44.015] - force: TRUE [18:41:44.015] - relayed: [n=1] TRUE [18:41:44.016] - queued futures: [n=1] TRUE - flush all [18:41:44.016] - relayed: [n=1] TRUE [18:41:44.016] - queued futures: [n=1] TRUE [18:41:44.016] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.016] resolve() on list ... DONE [18:41:44.017] - Number of value chunks collected: 1 [18:41:44.017] Resolving 1 futures (chunks) ... DONE [18:41:44.017] Reducing values from 1 chunks ... [18:41:44.017] - Number of values collected after concatenation: 4 [18:41:44.017] - Number of values expected: 4 [18:41:44.017] Reducing values from 1 chunks ... DONE [18:41:44.017] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y1:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y2:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 [18:41:44.026] future_lapply() ... [18:41:44.026] Number of chunks: 1 [18:41:44.026] getGlobalsAndPackagesXApply() ... [18:41:44.027] - future.globals: TRUE [18:41:44.027] getGlobalsAndPackages() ... [18:41:44.027] Searching for globals... [18:41:44.028] - globals found: [2] 'FUN', 'UseMethod' [18:41:44.028] Searching for globals ... DONE [18:41:44.029] Resolving globals: FALSE [18:41:44.029] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:44.030] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:44.030] - globals: [1] 'FUN' [18:41:44.030] [18:41:44.030] getGlobalsAndPackages() ... DONE [18:41:44.030] - globals found/used: [n=1] 'FUN' [18:41:44.030] - needed namespaces: [n=0] [18:41:44.031] Finding globals ... DONE [18:41:44.031] - use_args: TRUE [18:41:44.031] - Getting '...' globals ... [18:41:44.031] resolve() on list ... [18:41:44.032] recursive: 0 [18:41:44.034] length: 1 [18:41:44.034] elements: '...' [18:41:44.034] length: 0 (resolved future 1) [18:41:44.034] resolve() on list ... DONE [18:41:44.035] - '...' content: [n=0] [18:41:44.035] List of 1 [18:41:44.035] $ ...: list() [18:41:44.035] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.035] - attr(*, "where")=List of 1 [18:41:44.035] ..$ ...: [18:41:44.035] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.035] - attr(*, "resolved")= logi TRUE [18:41:44.035] - attr(*, "total_size")= num NA [18:41:44.038] - Getting '...' globals ... DONE [18:41:44.038] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.038] List of 2 [18:41:44.038] $ ...future.FUN:function (x, ...) [18:41:44.038] $ ... : list() [18:41:44.038] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.038] - attr(*, "where")=List of 2 [18:41:44.038] ..$ ...future.FUN: [18:41:44.038] ..$ ... : [18:41:44.038] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.038] - attr(*, "resolved")= logi FALSE [18:41:44.038] - attr(*, "total_size")= int 5150 [18:41:44.042] Packages to be attached in all futures: [n=0] [18:41:44.042] getGlobalsAndPackagesXApply() ... DONE [18:41:44.042] Number of futures (= number of chunks): 1 [18:41:44.042] Launching 1 futures (chunks) ... [18:41:44.043] Chunk #1 of 1 ... [18:41:44.043] - Finding globals in 'X' for chunk #1 ... [18:41:44.043] getGlobalsAndPackages() ... [18:41:44.043] Searching for globals... [18:41:44.043] [18:41:44.044] Searching for globals ... DONE [18:41:44.044] - globals: [0] [18:41:44.044] getGlobalsAndPackages() ... DONE [18:41:44.044] + additional globals found: [n=0] [18:41:44.044] + additional namespaces needed: [n=0] [18:41:44.044] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.044] - seeds: [18:41:44.045] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.045] getGlobalsAndPackages() ... [18:41:44.045] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.045] Resolving globals: FALSE [18:41:44.045] Tweak future expression to call with '...' arguments ... [18:41:44.045] { [18:41:44.045] do.call(function(...) { [18:41:44.045] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.045] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.045] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.045] on.exit(options(oopts), add = TRUE) [18:41:44.045] } [18:41:44.045] { [18:41:44.045] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.045] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.045] ...future.FUN(...future.X_jj, ...) [18:41:44.045] }) [18:41:44.045] } [18:41:44.045] }, args = future.call.arguments) [18:41:44.045] } [18:41:44.046] Tweak future expression to call with '...' arguments ... DONE [18:41:44.046] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.047] [18:41:44.047] getGlobalsAndPackages() ... DONE [18:41:44.047] run() for 'Future' ... [18:41:44.047] - state: 'created' [18:41:44.048] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.048] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.048] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.048] - Field: 'label' [18:41:44.048] - Field: 'local' [18:41:44.049] - Field: 'owner' [18:41:44.049] - Field: 'envir' [18:41:44.049] - Field: 'packages' [18:41:44.049] - Field: 'gc' [18:41:44.049] - Field: 'conditions' [18:41:44.050] - Field: 'expr' [18:41:44.050] - Field: 'uuid' [18:41:44.050] - Field: 'seed' [18:41:44.050] - Field: 'version' [18:41:44.050] - Field: 'result' [18:41:44.050] - Field: 'asynchronous' [18:41:44.051] - Field: 'calls' [18:41:44.051] - Field: 'globals' [18:41:44.051] - Field: 'stdout' [18:41:44.051] - Field: 'earlySignal' [18:41:44.051] - Field: 'lazy' [18:41:44.052] - Field: 'state' [18:41:44.052] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.052] - Launch lazy future ... [18:41:44.052] Packages needed by the future expression (n = 0): [18:41:44.052] Packages needed by future strategies (n = 0): [18:41:44.053] { [18:41:44.053] { [18:41:44.053] { [18:41:44.053] ...future.startTime <- base::Sys.time() [18:41:44.053] { [18:41:44.053] { [18:41:44.053] { [18:41:44.053] base::local({ [18:41:44.053] has_future <- base::requireNamespace("future", [18:41:44.053] quietly = TRUE) [18:41:44.053] if (has_future) { [18:41:44.053] ns <- base::getNamespace("future") [18:41:44.053] version <- ns[[".package"]][["version"]] [18:41:44.053] if (is.null(version)) [18:41:44.053] version <- utils::packageVersion("future") [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] version <- NULL [18:41:44.053] } [18:41:44.053] if (!has_future || version < "1.8.0") { [18:41:44.053] info <- base::c(r_version = base::gsub("R version ", [18:41:44.053] "", base::R.version$version.string), [18:41:44.053] platform = base::sprintf("%s (%s-bit)", [18:41:44.053] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.053] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.053] "release", "version")], collapse = " "), [18:41:44.053] hostname = base::Sys.info()[["nodename"]]) [18:41:44.053] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.053] info) [18:41:44.053] info <- base::paste(info, collapse = "; ") [18:41:44.053] if (!has_future) { [18:41:44.053] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.053] info) [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.053] info, version) [18:41:44.053] } [18:41:44.053] base::stop(msg) [18:41:44.053] } [18:41:44.053] }) [18:41:44.053] } [18:41:44.053] ...future.strategy.old <- future::plan("list") [18:41:44.053] options(future.plan = NULL) [18:41:44.053] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.053] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.053] } [18:41:44.053] ...future.workdir <- getwd() [18:41:44.053] } [18:41:44.053] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.053] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.053] } [18:41:44.053] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.053] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.053] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.053] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.053] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.053] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.053] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.053] base::names(...future.oldOptions)) [18:41:44.053] } [18:41:44.053] if (FALSE) { [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] if (TRUE) { [18:41:44.053] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.053] open = "w") [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.053] windows = "NUL", "/dev/null"), open = "w") [18:41:44.053] } [18:41:44.053] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.053] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.053] base::sink(type = "output", split = FALSE) [18:41:44.053] base::close(...future.stdout) [18:41:44.053] }, add = TRUE) [18:41:44.053] } [18:41:44.053] ...future.frame <- base::sys.nframe() [18:41:44.053] ...future.conditions <- base::list() [18:41:44.053] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.053] if (FALSE) { [18:41:44.053] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.053] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.053] } [18:41:44.053] ...future.result <- base::tryCatch({ [18:41:44.053] base::withCallingHandlers({ [18:41:44.053] ...future.value <- base::withVisible(base::local({ [18:41:44.053] do.call(function(...) { [18:41:44.053] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.053] if (!identical(...future.globals.maxSize.org, [18:41:44.053] ...future.globals.maxSize)) { [18:41:44.053] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.053] on.exit(options(oopts), add = TRUE) [18:41:44.053] } [18:41:44.053] { [18:41:44.053] lapply(seq_along(...future.elements_ii), [18:41:44.053] FUN = function(jj) { [18:41:44.053] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.053] ...future.FUN(...future.X_jj, ...) [18:41:44.053] }) [18:41:44.053] } [18:41:44.053] }, args = future.call.arguments) [18:41:44.053] })) [18:41:44.053] future::FutureResult(value = ...future.value$value, [18:41:44.053] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.053] ...future.rng), globalenv = if (FALSE) [18:41:44.053] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.053] ...future.globalenv.names)) [18:41:44.053] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.053] }, condition = base::local({ [18:41:44.053] c <- base::c [18:41:44.053] inherits <- base::inherits [18:41:44.053] invokeRestart <- base::invokeRestart [18:41:44.053] length <- base::length [18:41:44.053] list <- base::list [18:41:44.053] seq.int <- base::seq.int [18:41:44.053] signalCondition <- base::signalCondition [18:41:44.053] sys.calls <- base::sys.calls [18:41:44.053] `[[` <- base::`[[` [18:41:44.053] `+` <- base::`+` [18:41:44.053] `<<-` <- base::`<<-` [18:41:44.053] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.053] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.053] 3L)] [18:41:44.053] } [18:41:44.053] function(cond) { [18:41:44.053] is_error <- inherits(cond, "error") [18:41:44.053] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.053] NULL) [18:41:44.053] if (is_error) { [18:41:44.053] sessionInformation <- function() { [18:41:44.053] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.053] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.053] search = base::search(), system = base::Sys.info()) [18:41:44.053] } [18:41:44.053] ...future.conditions[[length(...future.conditions) + [18:41:44.053] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.053] cond$call), session = sessionInformation(), [18:41:44.053] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.053] signalCondition(cond) [18:41:44.053] } [18:41:44.053] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.053] "immediateCondition"))) { [18:41:44.053] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.053] ...future.conditions[[length(...future.conditions) + [18:41:44.053] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.053] if (TRUE && !signal) { [18:41:44.053] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.053] { [18:41:44.053] inherits <- base::inherits [18:41:44.053] invokeRestart <- base::invokeRestart [18:41:44.053] is.null <- base::is.null [18:41:44.053] muffled <- FALSE [18:41:44.053] if (inherits(cond, "message")) { [18:41:44.053] muffled <- grepl(pattern, "muffleMessage") [18:41:44.053] if (muffled) [18:41:44.053] invokeRestart("muffleMessage") [18:41:44.053] } [18:41:44.053] else if (inherits(cond, "warning")) { [18:41:44.053] muffled <- grepl(pattern, "muffleWarning") [18:41:44.053] if (muffled) [18:41:44.053] invokeRestart("muffleWarning") [18:41:44.053] } [18:41:44.053] else if (inherits(cond, "condition")) { [18:41:44.053] if (!is.null(pattern)) { [18:41:44.053] computeRestarts <- base::computeRestarts [18:41:44.053] grepl <- base::grepl [18:41:44.053] restarts <- computeRestarts(cond) [18:41:44.053] for (restart in restarts) { [18:41:44.053] name <- restart$name [18:41:44.053] if (is.null(name)) [18:41:44.053] next [18:41:44.053] if (!grepl(pattern, name)) [18:41:44.053] next [18:41:44.053] invokeRestart(restart) [18:41:44.053] muffled <- TRUE [18:41:44.053] break [18:41:44.053] } [18:41:44.053] } [18:41:44.053] } [18:41:44.053] invisible(muffled) [18:41:44.053] } [18:41:44.053] muffleCondition(cond, pattern = "^muffle") [18:41:44.053] } [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] if (TRUE) { [18:41:44.053] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.053] { [18:41:44.053] inherits <- base::inherits [18:41:44.053] invokeRestart <- base::invokeRestart [18:41:44.053] is.null <- base::is.null [18:41:44.053] muffled <- FALSE [18:41:44.053] if (inherits(cond, "message")) { [18:41:44.053] muffled <- grepl(pattern, "muffleMessage") [18:41:44.053] if (muffled) [18:41:44.053] invokeRestart("muffleMessage") [18:41:44.053] } [18:41:44.053] else if (inherits(cond, "warning")) { [18:41:44.053] muffled <- grepl(pattern, "muffleWarning") [18:41:44.053] if (muffled) [18:41:44.053] invokeRestart("muffleWarning") [18:41:44.053] } [18:41:44.053] else if (inherits(cond, "condition")) { [18:41:44.053] if (!is.null(pattern)) { [18:41:44.053] computeRestarts <- base::computeRestarts [18:41:44.053] grepl <- base::grepl [18:41:44.053] restarts <- computeRestarts(cond) [18:41:44.053] for (restart in restarts) { [18:41:44.053] name <- restart$name [18:41:44.053] if (is.null(name)) [18:41:44.053] next [18:41:44.053] if (!grepl(pattern, name)) [18:41:44.053] next [18:41:44.053] invokeRestart(restart) [18:41:44.053] muffled <- TRUE [18:41:44.053] break [18:41:44.053] } [18:41:44.053] } [18:41:44.053] } [18:41:44.053] invisible(muffled) [18:41:44.053] } [18:41:44.053] muffleCondition(cond, pattern = "^muffle") [18:41:44.053] } [18:41:44.053] } [18:41:44.053] } [18:41:44.053] })) [18:41:44.053] }, error = function(ex) { [18:41:44.053] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.053] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.053] ...future.rng), started = ...future.startTime, [18:41:44.053] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.053] version = "1.8"), class = "FutureResult") [18:41:44.053] }, finally = { [18:41:44.053] if (!identical(...future.workdir, getwd())) [18:41:44.053] setwd(...future.workdir) [18:41:44.053] { [18:41:44.053] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.053] ...future.oldOptions$nwarnings <- NULL [18:41:44.053] } [18:41:44.053] base::options(...future.oldOptions) [18:41:44.053] if (.Platform$OS.type == "windows") { [18:41:44.053] old_names <- names(...future.oldEnvVars) [18:41:44.053] envs <- base::Sys.getenv() [18:41:44.053] names <- names(envs) [18:41:44.053] common <- intersect(names, old_names) [18:41:44.053] added <- setdiff(names, old_names) [18:41:44.053] removed <- setdiff(old_names, names) [18:41:44.053] changed <- common[...future.oldEnvVars[common] != [18:41:44.053] envs[common]] [18:41:44.053] NAMES <- toupper(changed) [18:41:44.053] args <- list() [18:41:44.053] for (kk in seq_along(NAMES)) { [18:41:44.053] name <- changed[[kk]] [18:41:44.053] NAME <- NAMES[[kk]] [18:41:44.053] if (name != NAME && is.element(NAME, old_names)) [18:41:44.053] next [18:41:44.053] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.053] } [18:41:44.053] NAMES <- toupper(added) [18:41:44.053] for (kk in seq_along(NAMES)) { [18:41:44.053] name <- added[[kk]] [18:41:44.053] NAME <- NAMES[[kk]] [18:41:44.053] if (name != NAME && is.element(NAME, old_names)) [18:41:44.053] next [18:41:44.053] args[[name]] <- "" [18:41:44.053] } [18:41:44.053] NAMES <- toupper(removed) [18:41:44.053] for (kk in seq_along(NAMES)) { [18:41:44.053] name <- removed[[kk]] [18:41:44.053] NAME <- NAMES[[kk]] [18:41:44.053] if (name != NAME && is.element(NAME, old_names)) [18:41:44.053] next [18:41:44.053] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.053] } [18:41:44.053] if (length(args) > 0) [18:41:44.053] base::do.call(base::Sys.setenv, args = args) [18:41:44.053] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.053] } [18:41:44.053] { [18:41:44.053] if (base::length(...future.futureOptionsAdded) > [18:41:44.053] 0L) { [18:41:44.053] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.053] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.053] base::options(opts) [18:41:44.053] } [18:41:44.053] { [18:41:44.053] { [18:41:44.053] NULL [18:41:44.053] RNGkind("Mersenne-Twister") [18:41:44.053] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.053] inherits = FALSE) [18:41:44.053] } [18:41:44.053] options(future.plan = NULL) [18:41:44.053] if (is.na(NA_character_)) [18:41:44.053] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.053] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.053] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.053] .init = FALSE) [18:41:44.053] } [18:41:44.053] } [18:41:44.053] } [18:41:44.053] }) [18:41:44.053] if (TRUE) { [18:41:44.053] base::sink(type = "output", split = FALSE) [18:41:44.053] if (TRUE) { [18:41:44.053] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.053] } [18:41:44.053] else { [18:41:44.053] ...future.result["stdout"] <- base::list(NULL) [18:41:44.053] } [18:41:44.053] base::close(...future.stdout) [18:41:44.053] ...future.stdout <- NULL [18:41:44.053] } [18:41:44.053] ...future.result$conditions <- ...future.conditions [18:41:44.053] ...future.result$finished <- base::Sys.time() [18:41:44.053] ...future.result [18:41:44.053] } [18:41:44.057] assign_globals() ... [18:41:44.057] List of 5 [18:41:44.057] $ ...future.FUN :function (x, ...) [18:41:44.057] $ future.call.arguments : list() [18:41:44.057] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.057] $ ...future.elements_ii :List of 4 [18:41:44.057] ..$ A: num 50 [18:41:44.057] ..$ B: num 60 [18:41:44.057] ..$ C: num 70 [18:41:44.057] ..$ D: num 80 [18:41:44.057] $ ...future.seeds_ii : NULL [18:41:44.057] $ ...future.globals.maxSize: NULL [18:41:44.057] - attr(*, "where")=List of 5 [18:41:44.057] ..$ ...future.FUN : [18:41:44.057] ..$ future.call.arguments : [18:41:44.057] ..$ ...future.elements_ii : [18:41:44.057] ..$ ...future.seeds_ii : [18:41:44.057] ..$ ...future.globals.maxSize: [18:41:44.057] - attr(*, "resolved")= logi FALSE [18:41:44.057] - attr(*, "total_size")= num 5150 [18:41:44.057] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.057] - attr(*, "already-done")= logi TRUE [18:41:44.064] - copied '...future.FUN' to environment [18:41:44.064] - copied 'future.call.arguments' to environment [18:41:44.064] - copied '...future.elements_ii' to environment [18:41:44.065] - copied '...future.seeds_ii' to environment [18:41:44.065] - copied '...future.globals.maxSize' to environment [18:41:44.065] assign_globals() ... done [18:41:44.065] plan(): Setting new future strategy stack: [18:41:44.065] List of future strategies: [18:41:44.065] 1. sequential: [18:41:44.065] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.065] - tweaked: FALSE [18:41:44.065] - call: NULL [18:41:44.066] plan(): nbrOfWorkers() = 1 [18:41:44.068] plan(): Setting new future strategy stack: [18:41:44.068] List of future strategies: [18:41:44.068] 1. sequential: [18:41:44.068] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.068] - tweaked: FALSE [18:41:44.068] - call: plan(strategy) [18:41:44.068] plan(): nbrOfWorkers() = 1 [18:41:44.069] SequentialFuture started (and completed) [18:41:44.069] - Launch lazy future ... done [18:41:44.069] run() for 'SequentialFuture' ... done [18:41:44.069] Created future: [18:41:44.069] SequentialFuture: [18:41:44.069] Label: 'future_sapply-1' [18:41:44.069] Expression: [18:41:44.069] { [18:41:44.069] do.call(function(...) { [18:41:44.069] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.069] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.069] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.069] on.exit(options(oopts), add = TRUE) [18:41:44.069] } [18:41:44.069] { [18:41:44.069] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.069] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.069] ...future.FUN(...future.X_jj, ...) [18:41:44.069] }) [18:41:44.069] } [18:41:44.069] }, args = future.call.arguments) [18:41:44.069] } [18:41:44.069] Lazy evaluation: FALSE [18:41:44.069] Asynchronous evaluation: FALSE [18:41:44.069] Local evaluation: TRUE [18:41:44.069] Environment: R_GlobalEnv [18:41:44.069] Capture standard output: TRUE [18:41:44.069] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.069] Globals: 5 objects totaling 593 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.069] Packages: [18:41:44.069] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.069] Resolved: TRUE [18:41:44.069] Value: 218 bytes of class 'list' [18:41:44.069] Early signaling: FALSE [18:41:44.069] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.069] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.071] Chunk #1 of 1 ... DONE [18:41:44.071] Launching 1 futures (chunks) ... DONE [18:41:44.071] Resolving 1 futures (chunks) ... [18:41:44.071] resolve() on list ... [18:41:44.071] recursive: 0 [18:41:44.071] length: 1 [18:41:44.072] [18:41:44.072] resolved() for 'SequentialFuture' ... [18:41:44.072] - state: 'finished' [18:41:44.072] - run: TRUE [18:41:44.072] - result: 'FutureResult' [18:41:44.072] resolved() for 'SequentialFuture' ... done [18:41:44.073] Future #1 [18:41:44.073] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.073] - nx: 1 [18:41:44.073] - relay: TRUE [18:41:44.073] - stdout: TRUE [18:41:44.074] - signal: TRUE [18:41:44.074] - resignal: FALSE [18:41:44.074] - force: TRUE [18:41:44.074] - relayed: [n=1] FALSE [18:41:44.074] - queued futures: [n=1] FALSE [18:41:44.074] - until=1 [18:41:44.074] - relaying element #1 [18:41:44.075] - relayed: [n=1] TRUE [18:41:44.075] - queued futures: [n=1] TRUE [18:41:44.075] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.075] length: 0 (resolved future 1) [18:41:44.075] Relaying remaining futures [18:41:44.076] signalConditionsASAP(NULL, pos=0) ... [18:41:44.076] - nx: 1 [18:41:44.076] - relay: TRUE [18:41:44.076] - stdout: TRUE [18:41:44.076] - signal: TRUE [18:41:44.076] - resignal: FALSE [18:41:44.077] - force: TRUE [18:41:44.077] - relayed: [n=1] TRUE [18:41:44.077] - queued futures: [n=1] TRUE - flush all [18:41:44.077] - relayed: [n=1] TRUE [18:41:44.077] - queued futures: [n=1] TRUE [18:41:44.077] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.078] resolve() on list ... DONE [18:41:44.078] - Number of value chunks collected: 1 [18:41:44.078] Resolving 1 futures (chunks) ... DONE [18:41:44.078] Reducing values from 1 chunks ... [18:41:44.078] - Number of values collected after concatenation: 4 [18:41:44.078] - Number of values expected: 4 [18:41:44.079] Reducing values from 1 chunks ... DONE [18:41:44.079] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y1:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y2:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 [18:41:44.088] future_lapply() ... [18:41:44.089] Number of chunks: 1 [18:41:44.089] getGlobalsAndPackagesXApply() ... [18:41:44.089] - future.globals: TRUE [18:41:44.090] getGlobalsAndPackages() ... [18:41:44.090] Searching for globals... [18:41:44.092] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:44.092] Searching for globals ... DONE [18:41:44.092] Resolving globals: FALSE [18:41:44.092] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:44.093] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:44.093] - globals: [1] 'FUN' [18:41:44.093] [18:41:44.093] getGlobalsAndPackages() ... DONE [18:41:44.094] - globals found/used: [n=1] 'FUN' [18:41:44.094] - needed namespaces: [n=0] [18:41:44.094] Finding globals ... DONE [18:41:44.094] - use_args: TRUE [18:41:44.094] - Getting '...' globals ... [18:41:44.095] resolve() on list ... [18:41:44.095] recursive: 0 [18:41:44.095] length: 1 [18:41:44.095] elements: '...' [18:41:44.095] length: 0 (resolved future 1) [18:41:44.096] resolve() on list ... DONE [18:41:44.096] - '...' content: [n=0] [18:41:44.096] List of 1 [18:41:44.096] $ ...: list() [18:41:44.096] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.096] - attr(*, "where")=List of 1 [18:41:44.096] ..$ ...: [18:41:44.096] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.096] - attr(*, "resolved")= logi TRUE [18:41:44.096] - attr(*, "total_size")= num NA [18:41:44.099] - Getting '...' globals ... DONE [18:41:44.099] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.100] List of 2 [18:41:44.100] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:44.100] $ ... : list() [18:41:44.100] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.100] - attr(*, "where")=List of 2 [18:41:44.100] ..$ ...future.FUN: [18:41:44.100] ..$ ... : [18:41:44.100] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.100] - attr(*, "resolved")= logi FALSE [18:41:44.100] - attr(*, "total_size")= int 6632 [18:41:44.103] Packages to be attached in all futures: [n=0] [18:41:44.103] getGlobalsAndPackagesXApply() ... DONE [18:41:44.103] Number of futures (= number of chunks): 1 [18:41:44.104] Launching 1 futures (chunks) ... [18:41:44.104] Chunk #1 of 1 ... [18:41:44.104] - Finding globals in 'X' for chunk #1 ... [18:41:44.104] getGlobalsAndPackages() ... [18:41:44.104] Searching for globals... [18:41:44.105] [18:41:44.105] Searching for globals ... DONE [18:41:44.105] - globals: [0] [18:41:44.105] getGlobalsAndPackages() ... DONE [18:41:44.105] + additional globals found: [n=0] [18:41:44.106] + additional namespaces needed: [n=0] [18:41:44.106] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.106] - seeds: [18:41:44.106] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.106] getGlobalsAndPackages() ... [18:41:44.106] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.107] Resolving globals: FALSE [18:41:44.107] Tweak future expression to call with '...' arguments ... [18:41:44.107] { [18:41:44.107] do.call(function(...) { [18:41:44.107] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.107] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.107] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.107] on.exit(options(oopts), add = TRUE) [18:41:44.107] } [18:41:44.107] { [18:41:44.107] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.107] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.107] ...future.FUN(...future.X_jj, ...) [18:41:44.107] }) [18:41:44.107] } [18:41:44.107] }, args = future.call.arguments) [18:41:44.107] } [18:41:44.107] Tweak future expression to call with '...' arguments ... DONE [18:41:44.108] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.108] [18:41:44.108] getGlobalsAndPackages() ... DONE [18:41:44.109] run() for 'Future' ... [18:41:44.109] - state: 'created' [18:41:44.109] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.109] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.110] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.110] - Field: 'label' [18:41:44.110] - Field: 'local' [18:41:44.110] - Field: 'owner' [18:41:44.110] - Field: 'envir' [18:41:44.110] - Field: 'packages' [18:41:44.111] - Field: 'gc' [18:41:44.111] - Field: 'conditions' [18:41:44.111] - Field: 'expr' [18:41:44.111] - Field: 'uuid' [18:41:44.111] - Field: 'seed' [18:41:44.112] - Field: 'version' [18:41:44.112] - Field: 'result' [18:41:44.112] - Field: 'asynchronous' [18:41:44.112] - Field: 'calls' [18:41:44.112] - Field: 'globals' [18:41:44.112] - Field: 'stdout' [18:41:44.113] - Field: 'earlySignal' [18:41:44.113] - Field: 'lazy' [18:41:44.113] - Field: 'state' [18:41:44.113] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.113] - Launch lazy future ... [18:41:44.114] Packages needed by the future expression (n = 0): [18:41:44.114] Packages needed by future strategies (n = 0): [18:41:44.114] { [18:41:44.114] { [18:41:44.114] { [18:41:44.114] ...future.startTime <- base::Sys.time() [18:41:44.114] { [18:41:44.114] { [18:41:44.114] { [18:41:44.114] base::local({ [18:41:44.114] has_future <- base::requireNamespace("future", [18:41:44.114] quietly = TRUE) [18:41:44.114] if (has_future) { [18:41:44.114] ns <- base::getNamespace("future") [18:41:44.114] version <- ns[[".package"]][["version"]] [18:41:44.114] if (is.null(version)) [18:41:44.114] version <- utils::packageVersion("future") [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] version <- NULL [18:41:44.114] } [18:41:44.114] if (!has_future || version < "1.8.0") { [18:41:44.114] info <- base::c(r_version = base::gsub("R version ", [18:41:44.114] "", base::R.version$version.string), [18:41:44.114] platform = base::sprintf("%s (%s-bit)", [18:41:44.114] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.114] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.114] "release", "version")], collapse = " "), [18:41:44.114] hostname = base::Sys.info()[["nodename"]]) [18:41:44.114] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.114] info) [18:41:44.114] info <- base::paste(info, collapse = "; ") [18:41:44.114] if (!has_future) { [18:41:44.114] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.114] info) [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.114] info, version) [18:41:44.114] } [18:41:44.114] base::stop(msg) [18:41:44.114] } [18:41:44.114] }) [18:41:44.114] } [18:41:44.114] ...future.strategy.old <- future::plan("list") [18:41:44.114] options(future.plan = NULL) [18:41:44.114] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.114] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.114] } [18:41:44.114] ...future.workdir <- getwd() [18:41:44.114] } [18:41:44.114] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.114] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.114] } [18:41:44.114] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.114] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.114] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.114] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.114] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.114] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.114] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.114] base::names(...future.oldOptions)) [18:41:44.114] } [18:41:44.114] if (FALSE) { [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] if (TRUE) { [18:41:44.114] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.114] open = "w") [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.114] windows = "NUL", "/dev/null"), open = "w") [18:41:44.114] } [18:41:44.114] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.114] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.114] base::sink(type = "output", split = FALSE) [18:41:44.114] base::close(...future.stdout) [18:41:44.114] }, add = TRUE) [18:41:44.114] } [18:41:44.114] ...future.frame <- base::sys.nframe() [18:41:44.114] ...future.conditions <- base::list() [18:41:44.114] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.114] if (FALSE) { [18:41:44.114] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.114] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.114] } [18:41:44.114] ...future.result <- base::tryCatch({ [18:41:44.114] base::withCallingHandlers({ [18:41:44.114] ...future.value <- base::withVisible(base::local({ [18:41:44.114] do.call(function(...) { [18:41:44.114] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.114] if (!identical(...future.globals.maxSize.org, [18:41:44.114] ...future.globals.maxSize)) { [18:41:44.114] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.114] on.exit(options(oopts), add = TRUE) [18:41:44.114] } [18:41:44.114] { [18:41:44.114] lapply(seq_along(...future.elements_ii), [18:41:44.114] FUN = function(jj) { [18:41:44.114] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.114] ...future.FUN(...future.X_jj, ...) [18:41:44.114] }) [18:41:44.114] } [18:41:44.114] }, args = future.call.arguments) [18:41:44.114] })) [18:41:44.114] future::FutureResult(value = ...future.value$value, [18:41:44.114] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.114] ...future.rng), globalenv = if (FALSE) [18:41:44.114] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.114] ...future.globalenv.names)) [18:41:44.114] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.114] }, condition = base::local({ [18:41:44.114] c <- base::c [18:41:44.114] inherits <- base::inherits [18:41:44.114] invokeRestart <- base::invokeRestart [18:41:44.114] length <- base::length [18:41:44.114] list <- base::list [18:41:44.114] seq.int <- base::seq.int [18:41:44.114] signalCondition <- base::signalCondition [18:41:44.114] sys.calls <- base::sys.calls [18:41:44.114] `[[` <- base::`[[` [18:41:44.114] `+` <- base::`+` [18:41:44.114] `<<-` <- base::`<<-` [18:41:44.114] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.114] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.114] 3L)] [18:41:44.114] } [18:41:44.114] function(cond) { [18:41:44.114] is_error <- inherits(cond, "error") [18:41:44.114] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.114] NULL) [18:41:44.114] if (is_error) { [18:41:44.114] sessionInformation <- function() { [18:41:44.114] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.114] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.114] search = base::search(), system = base::Sys.info()) [18:41:44.114] } [18:41:44.114] ...future.conditions[[length(...future.conditions) + [18:41:44.114] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.114] cond$call), session = sessionInformation(), [18:41:44.114] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.114] signalCondition(cond) [18:41:44.114] } [18:41:44.114] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.114] "immediateCondition"))) { [18:41:44.114] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.114] ...future.conditions[[length(...future.conditions) + [18:41:44.114] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.114] if (TRUE && !signal) { [18:41:44.114] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.114] { [18:41:44.114] inherits <- base::inherits [18:41:44.114] invokeRestart <- base::invokeRestart [18:41:44.114] is.null <- base::is.null [18:41:44.114] muffled <- FALSE [18:41:44.114] if (inherits(cond, "message")) { [18:41:44.114] muffled <- grepl(pattern, "muffleMessage") [18:41:44.114] if (muffled) [18:41:44.114] invokeRestart("muffleMessage") [18:41:44.114] } [18:41:44.114] else if (inherits(cond, "warning")) { [18:41:44.114] muffled <- grepl(pattern, "muffleWarning") [18:41:44.114] if (muffled) [18:41:44.114] invokeRestart("muffleWarning") [18:41:44.114] } [18:41:44.114] else if (inherits(cond, "condition")) { [18:41:44.114] if (!is.null(pattern)) { [18:41:44.114] computeRestarts <- base::computeRestarts [18:41:44.114] grepl <- base::grepl [18:41:44.114] restarts <- computeRestarts(cond) [18:41:44.114] for (restart in restarts) { [18:41:44.114] name <- restart$name [18:41:44.114] if (is.null(name)) [18:41:44.114] next [18:41:44.114] if (!grepl(pattern, name)) [18:41:44.114] next [18:41:44.114] invokeRestart(restart) [18:41:44.114] muffled <- TRUE [18:41:44.114] break [18:41:44.114] } [18:41:44.114] } [18:41:44.114] } [18:41:44.114] invisible(muffled) [18:41:44.114] } [18:41:44.114] muffleCondition(cond, pattern = "^muffle") [18:41:44.114] } [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] if (TRUE) { [18:41:44.114] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.114] { [18:41:44.114] inherits <- base::inherits [18:41:44.114] invokeRestart <- base::invokeRestart [18:41:44.114] is.null <- base::is.null [18:41:44.114] muffled <- FALSE [18:41:44.114] if (inherits(cond, "message")) { [18:41:44.114] muffled <- grepl(pattern, "muffleMessage") [18:41:44.114] if (muffled) [18:41:44.114] invokeRestart("muffleMessage") [18:41:44.114] } [18:41:44.114] else if (inherits(cond, "warning")) { [18:41:44.114] muffled <- grepl(pattern, "muffleWarning") [18:41:44.114] if (muffled) [18:41:44.114] invokeRestart("muffleWarning") [18:41:44.114] } [18:41:44.114] else if (inherits(cond, "condition")) { [18:41:44.114] if (!is.null(pattern)) { [18:41:44.114] computeRestarts <- base::computeRestarts [18:41:44.114] grepl <- base::grepl [18:41:44.114] restarts <- computeRestarts(cond) [18:41:44.114] for (restart in restarts) { [18:41:44.114] name <- restart$name [18:41:44.114] if (is.null(name)) [18:41:44.114] next [18:41:44.114] if (!grepl(pattern, name)) [18:41:44.114] next [18:41:44.114] invokeRestart(restart) [18:41:44.114] muffled <- TRUE [18:41:44.114] break [18:41:44.114] } [18:41:44.114] } [18:41:44.114] } [18:41:44.114] invisible(muffled) [18:41:44.114] } [18:41:44.114] muffleCondition(cond, pattern = "^muffle") [18:41:44.114] } [18:41:44.114] } [18:41:44.114] } [18:41:44.114] })) [18:41:44.114] }, error = function(ex) { [18:41:44.114] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.114] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.114] ...future.rng), started = ...future.startTime, [18:41:44.114] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.114] version = "1.8"), class = "FutureResult") [18:41:44.114] }, finally = { [18:41:44.114] if (!identical(...future.workdir, getwd())) [18:41:44.114] setwd(...future.workdir) [18:41:44.114] { [18:41:44.114] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.114] ...future.oldOptions$nwarnings <- NULL [18:41:44.114] } [18:41:44.114] base::options(...future.oldOptions) [18:41:44.114] if (.Platform$OS.type == "windows") { [18:41:44.114] old_names <- names(...future.oldEnvVars) [18:41:44.114] envs <- base::Sys.getenv() [18:41:44.114] names <- names(envs) [18:41:44.114] common <- intersect(names, old_names) [18:41:44.114] added <- setdiff(names, old_names) [18:41:44.114] removed <- setdiff(old_names, names) [18:41:44.114] changed <- common[...future.oldEnvVars[common] != [18:41:44.114] envs[common]] [18:41:44.114] NAMES <- toupper(changed) [18:41:44.114] args <- list() [18:41:44.114] for (kk in seq_along(NAMES)) { [18:41:44.114] name <- changed[[kk]] [18:41:44.114] NAME <- NAMES[[kk]] [18:41:44.114] if (name != NAME && is.element(NAME, old_names)) [18:41:44.114] next [18:41:44.114] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.114] } [18:41:44.114] NAMES <- toupper(added) [18:41:44.114] for (kk in seq_along(NAMES)) { [18:41:44.114] name <- added[[kk]] [18:41:44.114] NAME <- NAMES[[kk]] [18:41:44.114] if (name != NAME && is.element(NAME, old_names)) [18:41:44.114] next [18:41:44.114] args[[name]] <- "" [18:41:44.114] } [18:41:44.114] NAMES <- toupper(removed) [18:41:44.114] for (kk in seq_along(NAMES)) { [18:41:44.114] name <- removed[[kk]] [18:41:44.114] NAME <- NAMES[[kk]] [18:41:44.114] if (name != NAME && is.element(NAME, old_names)) [18:41:44.114] next [18:41:44.114] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.114] } [18:41:44.114] if (length(args) > 0) [18:41:44.114] base::do.call(base::Sys.setenv, args = args) [18:41:44.114] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.114] } [18:41:44.114] { [18:41:44.114] if (base::length(...future.futureOptionsAdded) > [18:41:44.114] 0L) { [18:41:44.114] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.114] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.114] base::options(opts) [18:41:44.114] } [18:41:44.114] { [18:41:44.114] { [18:41:44.114] NULL [18:41:44.114] RNGkind("Mersenne-Twister") [18:41:44.114] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.114] inherits = FALSE) [18:41:44.114] } [18:41:44.114] options(future.plan = NULL) [18:41:44.114] if (is.na(NA_character_)) [18:41:44.114] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.114] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.114] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.114] .init = FALSE) [18:41:44.114] } [18:41:44.114] } [18:41:44.114] } [18:41:44.114] }) [18:41:44.114] if (TRUE) { [18:41:44.114] base::sink(type = "output", split = FALSE) [18:41:44.114] if (TRUE) { [18:41:44.114] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.114] } [18:41:44.114] else { [18:41:44.114] ...future.result["stdout"] <- base::list(NULL) [18:41:44.114] } [18:41:44.114] base::close(...future.stdout) [18:41:44.114] ...future.stdout <- NULL [18:41:44.114] } [18:41:44.114] ...future.result$conditions <- ...future.conditions [18:41:44.114] ...future.result$finished <- base::Sys.time() [18:41:44.114] ...future.result [18:41:44.114] } [18:41:44.118] assign_globals() ... [18:41:44.118] List of 5 [18:41:44.118] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:44.118] $ future.call.arguments : list() [18:41:44.118] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.118] $ ...future.elements_ii :List of 4 [18:41:44.118] ..$ A: num 50 [18:41:44.118] ..$ B: num 60 [18:41:44.118] ..$ C: num 70 [18:41:44.118] ..$ D: num 80 [18:41:44.118] $ ...future.seeds_ii : NULL [18:41:44.118] $ ...future.globals.maxSize: NULL [18:41:44.118] - attr(*, "where")=List of 5 [18:41:44.118] ..$ ...future.FUN : [18:41:44.118] ..$ future.call.arguments : [18:41:44.118] ..$ ...future.elements_ii : [18:41:44.118] ..$ ...future.seeds_ii : [18:41:44.118] ..$ ...future.globals.maxSize: [18:41:44.118] - attr(*, "resolved")= logi FALSE [18:41:44.118] - attr(*, "total_size")= num 6632 [18:41:44.118] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.118] - attr(*, "already-done")= logi TRUE [18:41:44.125] - reassign environment for '...future.FUN' [18:41:44.125] - copied '...future.FUN' to environment [18:41:44.126] - copied 'future.call.arguments' to environment [18:41:44.126] - copied '...future.elements_ii' to environment [18:41:44.126] - copied '...future.seeds_ii' to environment [18:41:44.126] - copied '...future.globals.maxSize' to environment [18:41:44.126] assign_globals() ... done [18:41:44.127] plan(): Setting new future strategy stack: [18:41:44.127] List of future strategies: [18:41:44.127] 1. sequential: [18:41:44.127] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.127] - tweaked: FALSE [18:41:44.127] - call: NULL [18:41:44.128] plan(): nbrOfWorkers() = 1 [18:41:44.129] plan(): Setting new future strategy stack: [18:41:44.129] List of future strategies: [18:41:44.129] 1. sequential: [18:41:44.129] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.129] - tweaked: FALSE [18:41:44.129] - call: plan(strategy) [18:41:44.130] plan(): nbrOfWorkers() = 1 [18:41:44.130] SequentialFuture started (and completed) [18:41:44.130] - Launch lazy future ... done [18:41:44.130] run() for 'SequentialFuture' ... done [18:41:44.131] Created future: [18:41:44.131] SequentialFuture: [18:41:44.131] Label: 'future_sapply-1' [18:41:44.131] Expression: [18:41:44.131] { [18:41:44.131] do.call(function(...) { [18:41:44.131] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.131] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.131] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.131] on.exit(options(oopts), add = TRUE) [18:41:44.131] } [18:41:44.131] { [18:41:44.131] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.131] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.131] ...future.FUN(...future.X_jj, ...) [18:41:44.131] }) [18:41:44.131] } [18:41:44.131] }, args = future.call.arguments) [18:41:44.131] } [18:41:44.131] Lazy evaluation: FALSE [18:41:44.131] Asynchronous evaluation: FALSE [18:41:44.131] Local evaluation: TRUE [18:41:44.131] Environment: R_GlobalEnv [18:41:44.131] Capture standard output: TRUE [18:41:44.131] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.131] Globals: 5 objects totaling 1.07 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.131] Packages: [18:41:44.131] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.131] Resolved: TRUE [18:41:44.131] Value: 666 bytes of class 'list' [18:41:44.131] Early signaling: FALSE [18:41:44.131] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.131] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.132] Chunk #1 of 1 ... DONE [18:41:44.132] Launching 1 futures (chunks) ... DONE [18:41:44.132] Resolving 1 futures (chunks) ... [18:41:44.133] resolve() on list ... [18:41:44.133] recursive: 0 [18:41:44.133] length: 1 [18:41:44.133] [18:41:44.133] resolved() for 'SequentialFuture' ... [18:41:44.133] - state: 'finished' [18:41:44.134] - run: TRUE [18:41:44.134] - result: 'FutureResult' [18:41:44.134] resolved() for 'SequentialFuture' ... done [18:41:44.134] Future #1 [18:41:44.134] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.135] - nx: 1 [18:41:44.135] - relay: TRUE [18:41:44.135] - stdout: TRUE [18:41:44.135] - signal: TRUE [18:41:44.135] - resignal: FALSE [18:41:44.135] - force: TRUE [18:41:44.135] - relayed: [n=1] FALSE [18:41:44.136] - queued futures: [n=1] FALSE [18:41:44.136] - until=1 [18:41:44.136] - relaying element #1 [18:41:44.136] - relayed: [n=1] TRUE [18:41:44.136] - queued futures: [n=1] TRUE [18:41:44.137] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.137] length: 0 (resolved future 1) [18:41:44.137] Relaying remaining futures [18:41:44.137] signalConditionsASAP(NULL, pos=0) ... [18:41:44.137] - nx: 1 [18:41:44.137] - relay: TRUE [18:41:44.138] - stdout: TRUE [18:41:44.138] - signal: TRUE [18:41:44.138] - resignal: FALSE [18:41:44.138] - force: TRUE [18:41:44.138] - relayed: [n=1] TRUE [18:41:44.138] - queued futures: [n=1] TRUE - flush all [18:41:44.139] - relayed: [n=1] TRUE [18:41:44.139] - queued futures: [n=1] TRUE [18:41:44.139] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.139] resolve() on list ... DONE [18:41:44.139] - Number of value chunks collected: 1 [18:41:44.139] Resolving 1 futures (chunks) ... DONE [18:41:44.140] Reducing values from 1 chunks ... [18:41:44.140] - Number of values collected after concatenation: 4 [18:41:44.140] - Number of values expected: 4 [18:41:44.140] Reducing values from 1 chunks ... DONE [18:41:44.140] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y1:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y2:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... [18:41:44.153] future_lapply() ... [18:41:44.153] Number of chunks: 1 [18:41:44.153] getGlobalsAndPackagesXApply() ... [18:41:44.154] - future.globals: TRUE [18:41:44.154] getGlobalsAndPackages() ... [18:41:44.154] Searching for globals... [18:41:44.155] - globals found: [1] 'FUN' [18:41:44.155] Searching for globals ... DONE [18:41:44.156] Resolving globals: FALSE [18:41:44.156] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:44.156] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:44.157] - globals: [1] 'FUN' [18:41:44.157] [18:41:44.157] getGlobalsAndPackages() ... DONE [18:41:44.157] - globals found/used: [n=1] 'FUN' [18:41:44.157] - needed namespaces: [n=0] [18:41:44.157] Finding globals ... DONE [18:41:44.158] - use_args: TRUE [18:41:44.158] - Getting '...' globals ... [18:41:44.158] resolve() on list ... [18:41:44.158] recursive: 0 [18:41:44.159] length: 1 [18:41:44.159] elements: '...' [18:41:44.159] length: 0 (resolved future 1) [18:41:44.159] resolve() on list ... DONE [18:41:44.159] - '...' content: [n=0] [18:41:44.159] List of 1 [18:41:44.159] $ ...: list() [18:41:44.159] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.159] - attr(*, "where")=List of 1 [18:41:44.159] ..$ ...: [18:41:44.159] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.159] - attr(*, "resolved")= logi TRUE [18:41:44.159] - attr(*, "total_size")= num NA [18:41:44.162] - Getting '...' globals ... DONE [18:41:44.163] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.163] List of 2 [18:41:44.163] $ ...future.FUN:function (x) [18:41:44.163] $ ... : list() [18:41:44.163] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.163] - attr(*, "where")=List of 2 [18:41:44.163] ..$ ...future.FUN: [18:41:44.163] ..$ ... : [18:41:44.163] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.163] - attr(*, "resolved")= logi FALSE [18:41:44.163] - attr(*, "total_size")= int 4910 [18:41:44.166] Packages to be attached in all futures: [n=0] [18:41:44.166] getGlobalsAndPackagesXApply() ... DONE [18:41:44.166] Number of futures (= number of chunks): 1 [18:41:44.167] Launching 1 futures (chunks) ... [18:41:44.167] Chunk #1 of 1 ... [18:41:44.167] - Finding globals in 'X' for chunk #1 ... [18:41:44.167] getGlobalsAndPackages() ... [18:41:44.167] Searching for globals... [18:41:44.168] [18:41:44.168] Searching for globals ... DONE [18:41:44.168] - globals: [0] [18:41:44.168] getGlobalsAndPackages() ... DONE [18:41:44.168] + additional globals found: [n=0] [18:41:44.168] + additional namespaces needed: [n=0] [18:41:44.169] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.169] - seeds: [18:41:44.169] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.169] getGlobalsAndPackages() ... [18:41:44.169] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.170] Resolving globals: FALSE [18:41:44.170] Tweak future expression to call with '...' arguments ... [18:41:44.170] { [18:41:44.170] do.call(function(...) { [18:41:44.170] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.170] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.170] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.170] on.exit(options(oopts), add = TRUE) [18:41:44.170] } [18:41:44.170] { [18:41:44.170] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.170] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.170] ...future.FUN(...future.X_jj, ...) [18:41:44.170] }) [18:41:44.170] } [18:41:44.170] }, args = future.call.arguments) [18:41:44.170] } [18:41:44.170] Tweak future expression to call with '...' arguments ... DONE [18:41:44.171] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.171] [18:41:44.171] getGlobalsAndPackages() ... DONE [18:41:44.172] run() for 'Future' ... [18:41:44.172] - state: 'created' [18:41:44.172] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.172] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.173] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.173] - Field: 'label' [18:41:44.173] - Field: 'local' [18:41:44.173] - Field: 'owner' [18:41:44.173] - Field: 'envir' [18:41:44.173] - Field: 'packages' [18:41:44.174] - Field: 'gc' [18:41:44.174] - Field: 'conditions' [18:41:44.174] - Field: 'expr' [18:41:44.174] - Field: 'uuid' [18:41:44.174] - Field: 'seed' [18:41:44.174] - Field: 'version' [18:41:44.175] - Field: 'result' [18:41:44.175] - Field: 'asynchronous' [18:41:44.175] - Field: 'calls' [18:41:44.175] - Field: 'globals' [18:41:44.175] - Field: 'stdout' [18:41:44.176] - Field: 'earlySignal' [18:41:44.176] - Field: 'lazy' [18:41:44.176] - Field: 'state' [18:41:44.176] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.176] - Launch lazy future ... [18:41:44.177] Packages needed by the future expression (n = 0): [18:41:44.177] Packages needed by future strategies (n = 0): [18:41:44.177] { [18:41:44.177] { [18:41:44.177] { [18:41:44.177] ...future.startTime <- base::Sys.time() [18:41:44.177] { [18:41:44.177] { [18:41:44.177] { [18:41:44.177] base::local({ [18:41:44.177] has_future <- base::requireNamespace("future", [18:41:44.177] quietly = TRUE) [18:41:44.177] if (has_future) { [18:41:44.177] ns <- base::getNamespace("future") [18:41:44.177] version <- ns[[".package"]][["version"]] [18:41:44.177] if (is.null(version)) [18:41:44.177] version <- utils::packageVersion("future") [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] version <- NULL [18:41:44.177] } [18:41:44.177] if (!has_future || version < "1.8.0") { [18:41:44.177] info <- base::c(r_version = base::gsub("R version ", [18:41:44.177] "", base::R.version$version.string), [18:41:44.177] platform = base::sprintf("%s (%s-bit)", [18:41:44.177] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.177] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.177] "release", "version")], collapse = " "), [18:41:44.177] hostname = base::Sys.info()[["nodename"]]) [18:41:44.177] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.177] info) [18:41:44.177] info <- base::paste(info, collapse = "; ") [18:41:44.177] if (!has_future) { [18:41:44.177] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.177] info) [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.177] info, version) [18:41:44.177] } [18:41:44.177] base::stop(msg) [18:41:44.177] } [18:41:44.177] }) [18:41:44.177] } [18:41:44.177] ...future.strategy.old <- future::plan("list") [18:41:44.177] options(future.plan = NULL) [18:41:44.177] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.177] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.177] } [18:41:44.177] ...future.workdir <- getwd() [18:41:44.177] } [18:41:44.177] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.177] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.177] } [18:41:44.177] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.177] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.177] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.177] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.177] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.177] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.177] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.177] base::names(...future.oldOptions)) [18:41:44.177] } [18:41:44.177] if (FALSE) { [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] if (TRUE) { [18:41:44.177] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.177] open = "w") [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.177] windows = "NUL", "/dev/null"), open = "w") [18:41:44.177] } [18:41:44.177] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.177] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.177] base::sink(type = "output", split = FALSE) [18:41:44.177] base::close(...future.stdout) [18:41:44.177] }, add = TRUE) [18:41:44.177] } [18:41:44.177] ...future.frame <- base::sys.nframe() [18:41:44.177] ...future.conditions <- base::list() [18:41:44.177] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.177] if (FALSE) { [18:41:44.177] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.177] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.177] } [18:41:44.177] ...future.result <- base::tryCatch({ [18:41:44.177] base::withCallingHandlers({ [18:41:44.177] ...future.value <- base::withVisible(base::local({ [18:41:44.177] do.call(function(...) { [18:41:44.177] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.177] if (!identical(...future.globals.maxSize.org, [18:41:44.177] ...future.globals.maxSize)) { [18:41:44.177] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.177] on.exit(options(oopts), add = TRUE) [18:41:44.177] } [18:41:44.177] { [18:41:44.177] lapply(seq_along(...future.elements_ii), [18:41:44.177] FUN = function(jj) { [18:41:44.177] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.177] ...future.FUN(...future.X_jj, ...) [18:41:44.177] }) [18:41:44.177] } [18:41:44.177] }, args = future.call.arguments) [18:41:44.177] })) [18:41:44.177] future::FutureResult(value = ...future.value$value, [18:41:44.177] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.177] ...future.rng), globalenv = if (FALSE) [18:41:44.177] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.177] ...future.globalenv.names)) [18:41:44.177] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.177] }, condition = base::local({ [18:41:44.177] c <- base::c [18:41:44.177] inherits <- base::inherits [18:41:44.177] invokeRestart <- base::invokeRestart [18:41:44.177] length <- base::length [18:41:44.177] list <- base::list [18:41:44.177] seq.int <- base::seq.int [18:41:44.177] signalCondition <- base::signalCondition [18:41:44.177] sys.calls <- base::sys.calls [18:41:44.177] `[[` <- base::`[[` [18:41:44.177] `+` <- base::`+` [18:41:44.177] `<<-` <- base::`<<-` [18:41:44.177] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.177] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.177] 3L)] [18:41:44.177] } [18:41:44.177] function(cond) { [18:41:44.177] is_error <- inherits(cond, "error") [18:41:44.177] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.177] NULL) [18:41:44.177] if (is_error) { [18:41:44.177] sessionInformation <- function() { [18:41:44.177] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.177] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.177] search = base::search(), system = base::Sys.info()) [18:41:44.177] } [18:41:44.177] ...future.conditions[[length(...future.conditions) + [18:41:44.177] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.177] cond$call), session = sessionInformation(), [18:41:44.177] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.177] signalCondition(cond) [18:41:44.177] } [18:41:44.177] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.177] "immediateCondition"))) { [18:41:44.177] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.177] ...future.conditions[[length(...future.conditions) + [18:41:44.177] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.177] if (TRUE && !signal) { [18:41:44.177] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.177] { [18:41:44.177] inherits <- base::inherits [18:41:44.177] invokeRestart <- base::invokeRestart [18:41:44.177] is.null <- base::is.null [18:41:44.177] muffled <- FALSE [18:41:44.177] if (inherits(cond, "message")) { [18:41:44.177] muffled <- grepl(pattern, "muffleMessage") [18:41:44.177] if (muffled) [18:41:44.177] invokeRestart("muffleMessage") [18:41:44.177] } [18:41:44.177] else if (inherits(cond, "warning")) { [18:41:44.177] muffled <- grepl(pattern, "muffleWarning") [18:41:44.177] if (muffled) [18:41:44.177] invokeRestart("muffleWarning") [18:41:44.177] } [18:41:44.177] else if (inherits(cond, "condition")) { [18:41:44.177] if (!is.null(pattern)) { [18:41:44.177] computeRestarts <- base::computeRestarts [18:41:44.177] grepl <- base::grepl [18:41:44.177] restarts <- computeRestarts(cond) [18:41:44.177] for (restart in restarts) { [18:41:44.177] name <- restart$name [18:41:44.177] if (is.null(name)) [18:41:44.177] next [18:41:44.177] if (!grepl(pattern, name)) [18:41:44.177] next [18:41:44.177] invokeRestart(restart) [18:41:44.177] muffled <- TRUE [18:41:44.177] break [18:41:44.177] } [18:41:44.177] } [18:41:44.177] } [18:41:44.177] invisible(muffled) [18:41:44.177] } [18:41:44.177] muffleCondition(cond, pattern = "^muffle") [18:41:44.177] } [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] if (TRUE) { [18:41:44.177] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.177] { [18:41:44.177] inherits <- base::inherits [18:41:44.177] invokeRestart <- base::invokeRestart [18:41:44.177] is.null <- base::is.null [18:41:44.177] muffled <- FALSE [18:41:44.177] if (inherits(cond, "message")) { [18:41:44.177] muffled <- grepl(pattern, "muffleMessage") [18:41:44.177] if (muffled) [18:41:44.177] invokeRestart("muffleMessage") [18:41:44.177] } [18:41:44.177] else if (inherits(cond, "warning")) { [18:41:44.177] muffled <- grepl(pattern, "muffleWarning") [18:41:44.177] if (muffled) [18:41:44.177] invokeRestart("muffleWarning") [18:41:44.177] } [18:41:44.177] else if (inherits(cond, "condition")) { [18:41:44.177] if (!is.null(pattern)) { [18:41:44.177] computeRestarts <- base::computeRestarts [18:41:44.177] grepl <- base::grepl [18:41:44.177] restarts <- computeRestarts(cond) [18:41:44.177] for (restart in restarts) { [18:41:44.177] name <- restart$name [18:41:44.177] if (is.null(name)) [18:41:44.177] next [18:41:44.177] if (!grepl(pattern, name)) [18:41:44.177] next [18:41:44.177] invokeRestart(restart) [18:41:44.177] muffled <- TRUE [18:41:44.177] break [18:41:44.177] } [18:41:44.177] } [18:41:44.177] } [18:41:44.177] invisible(muffled) [18:41:44.177] } [18:41:44.177] muffleCondition(cond, pattern = "^muffle") [18:41:44.177] } [18:41:44.177] } [18:41:44.177] } [18:41:44.177] })) [18:41:44.177] }, error = function(ex) { [18:41:44.177] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.177] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.177] ...future.rng), started = ...future.startTime, [18:41:44.177] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.177] version = "1.8"), class = "FutureResult") [18:41:44.177] }, finally = { [18:41:44.177] if (!identical(...future.workdir, getwd())) [18:41:44.177] setwd(...future.workdir) [18:41:44.177] { [18:41:44.177] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.177] ...future.oldOptions$nwarnings <- NULL [18:41:44.177] } [18:41:44.177] base::options(...future.oldOptions) [18:41:44.177] if (.Platform$OS.type == "windows") { [18:41:44.177] old_names <- names(...future.oldEnvVars) [18:41:44.177] envs <- base::Sys.getenv() [18:41:44.177] names <- names(envs) [18:41:44.177] common <- intersect(names, old_names) [18:41:44.177] added <- setdiff(names, old_names) [18:41:44.177] removed <- setdiff(old_names, names) [18:41:44.177] changed <- common[...future.oldEnvVars[common] != [18:41:44.177] envs[common]] [18:41:44.177] NAMES <- toupper(changed) [18:41:44.177] args <- list() [18:41:44.177] for (kk in seq_along(NAMES)) { [18:41:44.177] name <- changed[[kk]] [18:41:44.177] NAME <- NAMES[[kk]] [18:41:44.177] if (name != NAME && is.element(NAME, old_names)) [18:41:44.177] next [18:41:44.177] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.177] } [18:41:44.177] NAMES <- toupper(added) [18:41:44.177] for (kk in seq_along(NAMES)) { [18:41:44.177] name <- added[[kk]] [18:41:44.177] NAME <- NAMES[[kk]] [18:41:44.177] if (name != NAME && is.element(NAME, old_names)) [18:41:44.177] next [18:41:44.177] args[[name]] <- "" [18:41:44.177] } [18:41:44.177] NAMES <- toupper(removed) [18:41:44.177] for (kk in seq_along(NAMES)) { [18:41:44.177] name <- removed[[kk]] [18:41:44.177] NAME <- NAMES[[kk]] [18:41:44.177] if (name != NAME && is.element(NAME, old_names)) [18:41:44.177] next [18:41:44.177] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.177] } [18:41:44.177] if (length(args) > 0) [18:41:44.177] base::do.call(base::Sys.setenv, args = args) [18:41:44.177] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.177] } [18:41:44.177] { [18:41:44.177] if (base::length(...future.futureOptionsAdded) > [18:41:44.177] 0L) { [18:41:44.177] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.177] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.177] base::options(opts) [18:41:44.177] } [18:41:44.177] { [18:41:44.177] { [18:41:44.177] NULL [18:41:44.177] RNGkind("Mersenne-Twister") [18:41:44.177] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.177] inherits = FALSE) [18:41:44.177] } [18:41:44.177] options(future.plan = NULL) [18:41:44.177] if (is.na(NA_character_)) [18:41:44.177] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.177] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.177] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.177] .init = FALSE) [18:41:44.177] } [18:41:44.177] } [18:41:44.177] } [18:41:44.177] }) [18:41:44.177] if (TRUE) { [18:41:44.177] base::sink(type = "output", split = FALSE) [18:41:44.177] if (TRUE) { [18:41:44.177] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.177] } [18:41:44.177] else { [18:41:44.177] ...future.result["stdout"] <- base::list(NULL) [18:41:44.177] } [18:41:44.177] base::close(...future.stdout) [18:41:44.177] ...future.stdout <- NULL [18:41:44.177] } [18:41:44.177] ...future.result$conditions <- ...future.conditions [18:41:44.177] ...future.result$finished <- base::Sys.time() [18:41:44.177] ...future.result [18:41:44.177] } [18:41:44.181] assign_globals() ... [18:41:44.181] List of 5 [18:41:44.181] $ ...future.FUN :function (x) [18:41:44.181] $ future.call.arguments : list() [18:41:44.181] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.181] $ ...future.elements_ii :List of 4 [18:41:44.181] ..$ A: num 50 [18:41:44.181] ..$ B: num 60 [18:41:44.181] ..$ C: num 70 [18:41:44.181] ..$ D: num 80 [18:41:44.181] $ ...future.seeds_ii : NULL [18:41:44.181] $ ...future.globals.maxSize: NULL [18:41:44.181] - attr(*, "where")=List of 5 [18:41:44.181] ..$ ...future.FUN : [18:41:44.181] ..$ future.call.arguments : [18:41:44.181] ..$ ...future.elements_ii : [18:41:44.181] ..$ ...future.seeds_ii : [18:41:44.181] ..$ ...future.globals.maxSize: [18:41:44.181] - attr(*, "resolved")= logi FALSE [18:41:44.181] - attr(*, "total_size")= num 4910 [18:41:44.181] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.181] - attr(*, "already-done")= logi TRUE [18:41:44.188] - copied '...future.FUN' to environment [18:41:44.188] - copied 'future.call.arguments' to environment [18:41:44.189] - copied '...future.elements_ii' to environment [18:41:44.189] - copied '...future.seeds_ii' to environment [18:41:44.189] - copied '...future.globals.maxSize' to environment [18:41:44.189] assign_globals() ... done [18:41:44.189] plan(): Setting new future strategy stack: [18:41:44.190] List of future strategies: [18:41:44.190] 1. sequential: [18:41:44.190] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.190] - tweaked: FALSE [18:41:44.190] - call: NULL [18:41:44.190] plan(): nbrOfWorkers() = 1 [18:41:44.192] plan(): Setting new future strategy stack: [18:41:44.192] List of future strategies: [18:41:44.192] 1. sequential: [18:41:44.192] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.192] - tweaked: FALSE [18:41:44.192] - call: plan(strategy) [18:41:44.192] plan(): nbrOfWorkers() = 1 [18:41:44.193] SequentialFuture started (and completed) [18:41:44.193] - Launch lazy future ... done [18:41:44.193] run() for 'SequentialFuture' ... done [18:41:44.193] Created future: [18:41:44.193] SequentialFuture: [18:41:44.193] Label: 'future_sapply-1' [18:41:44.193] Expression: [18:41:44.193] { [18:41:44.193] do.call(function(...) { [18:41:44.193] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.193] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.193] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.193] on.exit(options(oopts), add = TRUE) [18:41:44.193] } [18:41:44.193] { [18:41:44.193] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.193] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.193] ...future.FUN(...future.X_jj, ...) [18:41:44.193] }) [18:41:44.193] } [18:41:44.193] }, args = future.call.arguments) [18:41:44.193] } [18:41:44.193] Lazy evaluation: FALSE [18:41:44.193] Asynchronous evaluation: FALSE [18:41:44.193] Local evaluation: TRUE [18:41:44.193] Environment: R_GlobalEnv [18:41:44.193] Capture standard output: TRUE [18:41:44.193] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.193] Globals: 5 objects totaling 500 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.193] Packages: [18:41:44.193] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.193] Resolved: TRUE [18:41:44.193] Value: 95 bytes of class 'list' [18:41:44.193] Early signaling: FALSE [18:41:44.193] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.193] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.195] Chunk #1 of 1 ... DONE [18:41:44.195] Launching 1 futures (chunks) ... DONE [18:41:44.195] Resolving 1 futures (chunks) ... [18:41:44.195] resolve() on list ... [18:41:44.195] recursive: 0 [18:41:44.195] length: 1 [18:41:44.196] [18:41:44.196] resolved() for 'SequentialFuture' ... [18:41:44.196] - state: 'finished' [18:41:44.196] - run: TRUE [18:41:44.196] - result: 'FutureResult' [18:41:44.196] resolved() for 'SequentialFuture' ... done [18:41:44.197] Future #1 [18:41:44.197] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.197] - nx: 1 [18:41:44.197] - relay: TRUE [18:41:44.197] - stdout: TRUE [18:41:44.197] - signal: TRUE [18:41:44.198] - resignal: FALSE [18:41:44.198] - force: TRUE [18:41:44.198] - relayed: [n=1] FALSE [18:41:44.198] - queued futures: [n=1] FALSE [18:41:44.198] - until=1 [18:41:44.198] - relaying element #1 [18:41:44.199] - relayed: [n=1] TRUE [18:41:44.199] - queued futures: [n=1] TRUE [18:41:44.199] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.199] length: 0 (resolved future 1) [18:41:44.199] Relaying remaining futures [18:41:44.200] signalConditionsASAP(NULL, pos=0) ... [18:41:44.200] - nx: 1 [18:41:44.200] - relay: TRUE [18:41:44.200] - stdout: TRUE [18:41:44.200] - signal: TRUE [18:41:44.200] - resignal: FALSE [18:41:44.200] - force: TRUE [18:41:44.201] - relayed: [n=1] TRUE [18:41:44.201] - queued futures: [n=1] TRUE - flush all [18:41:44.201] - relayed: [n=1] TRUE [18:41:44.201] - queued futures: [n=1] TRUE [18:41:44.201] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.201] resolve() on list ... DONE [18:41:44.202] - Number of value chunks collected: 1 [18:41:44.202] Resolving 1 futures (chunks) ... DONE [18:41:44.202] Reducing values from 1 chunks ... [18:41:44.202] - Number of values collected after concatenation: 4 [18:41:44.202] - Number of values expected: 4 [18:41:44.203] Reducing values from 1 chunks ... DONE [18:41:44.203] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:44.205] future_lapply() ... [18:41:44.205] Number of chunks: 1 [18:41:44.206] getGlobalsAndPackagesXApply() ... [18:41:44.206] - future.globals: TRUE [18:41:44.206] getGlobalsAndPackages() ... [18:41:44.206] Searching for globals... [18:41:44.207] - globals found: [2] 'FUN', 'UseMethod' [18:41:44.207] Searching for globals ... DONE [18:41:44.208] Resolving globals: FALSE [18:41:44.208] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:44.209] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:44.209] - globals: [1] 'FUN' [18:41:44.209] [18:41:44.209] getGlobalsAndPackages() ... DONE [18:41:44.209] - globals found/used: [n=1] 'FUN' [18:41:44.210] - needed namespaces: [n=0] [18:41:44.210] Finding globals ... DONE [18:41:44.210] - use_args: TRUE [18:41:44.210] - Getting '...' globals ... [18:41:44.211] resolve() on list ... [18:41:44.211] recursive: 0 [18:41:44.211] length: 1 [18:41:44.211] elements: '...' [18:41:44.211] length: 0 (resolved future 1) [18:41:44.211] resolve() on list ... DONE [18:41:44.212] - '...' content: [n=0] [18:41:44.212] List of 1 [18:41:44.212] $ ...: list() [18:41:44.212] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.212] - attr(*, "where")=List of 1 [18:41:44.212] ..$ ...: [18:41:44.212] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.212] - attr(*, "resolved")= logi TRUE [18:41:44.212] - attr(*, "total_size")= num NA [18:41:44.215] - Getting '...' globals ... DONE [18:41:44.215] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.215] List of 2 [18:41:44.215] $ ...future.FUN:function (x, ...) [18:41:44.215] $ ... : list() [18:41:44.215] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.215] - attr(*, "where")=List of 2 [18:41:44.215] ..$ ...future.FUN: [18:41:44.215] ..$ ... : [18:41:44.215] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.215] - attr(*, "resolved")= logi FALSE [18:41:44.215] - attr(*, "total_size")= int 5150 [18:41:44.218] Packages to be attached in all futures: [n=0] [18:41:44.219] getGlobalsAndPackagesXApply() ... DONE [18:41:44.219] Number of futures (= number of chunks): 1 [18:41:44.219] Launching 1 futures (chunks) ... [18:41:44.219] Chunk #1 of 1 ... [18:41:44.219] - Finding globals in 'X' for chunk #1 ... [18:41:44.220] getGlobalsAndPackages() ... [18:41:44.220] Searching for globals... [18:41:44.220] [18:41:44.220] Searching for globals ... DONE [18:41:44.220] - globals: [0] [18:41:44.221] getGlobalsAndPackages() ... DONE [18:41:44.221] + additional globals found: [n=0] [18:41:44.221] + additional namespaces needed: [n=0] [18:41:44.221] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.221] - seeds: [18:41:44.221] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.222] getGlobalsAndPackages() ... [18:41:44.222] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.222] Resolving globals: FALSE [18:41:44.222] Tweak future expression to call with '...' arguments ... [18:41:44.222] { [18:41:44.222] do.call(function(...) { [18:41:44.222] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.222] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.222] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.222] on.exit(options(oopts), add = TRUE) [18:41:44.222] } [18:41:44.222] { [18:41:44.222] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.222] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.222] ...future.FUN(...future.X_jj, ...) [18:41:44.222] }) [18:41:44.222] } [18:41:44.222] }, args = future.call.arguments) [18:41:44.222] } [18:41:44.223] Tweak future expression to call with '...' arguments ... DONE [18:41:44.223] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.223] [18:41:44.224] getGlobalsAndPackages() ... DONE [18:41:44.224] run() for 'Future' ... [18:41:44.224] - state: 'created' [18:41:44.224] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.225] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.225] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.225] - Field: 'label' [18:41:44.225] - Field: 'local' [18:41:44.226] - Field: 'owner' [18:41:44.226] - Field: 'envir' [18:41:44.226] - Field: 'packages' [18:41:44.226] - Field: 'gc' [18:41:44.226] - Field: 'conditions' [18:41:44.226] - Field: 'expr' [18:41:44.227] - Field: 'uuid' [18:41:44.227] - Field: 'seed' [18:41:44.227] - Field: 'version' [18:41:44.227] - Field: 'result' [18:41:44.227] - Field: 'asynchronous' [18:41:44.227] - Field: 'calls' [18:41:44.228] - Field: 'globals' [18:41:44.228] - Field: 'stdout' [18:41:44.228] - Field: 'earlySignal' [18:41:44.228] - Field: 'lazy' [18:41:44.228] - Field: 'state' [18:41:44.229] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.229] - Launch lazy future ... [18:41:44.229] Packages needed by the future expression (n = 0): [18:41:44.229] Packages needed by future strategies (n = 0): [18:41:44.230] { [18:41:44.230] { [18:41:44.230] { [18:41:44.230] ...future.startTime <- base::Sys.time() [18:41:44.230] { [18:41:44.230] { [18:41:44.230] { [18:41:44.230] base::local({ [18:41:44.230] has_future <- base::requireNamespace("future", [18:41:44.230] quietly = TRUE) [18:41:44.230] if (has_future) { [18:41:44.230] ns <- base::getNamespace("future") [18:41:44.230] version <- ns[[".package"]][["version"]] [18:41:44.230] if (is.null(version)) [18:41:44.230] version <- utils::packageVersion("future") [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] version <- NULL [18:41:44.230] } [18:41:44.230] if (!has_future || version < "1.8.0") { [18:41:44.230] info <- base::c(r_version = base::gsub("R version ", [18:41:44.230] "", base::R.version$version.string), [18:41:44.230] platform = base::sprintf("%s (%s-bit)", [18:41:44.230] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.230] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.230] "release", "version")], collapse = " "), [18:41:44.230] hostname = base::Sys.info()[["nodename"]]) [18:41:44.230] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.230] info) [18:41:44.230] info <- base::paste(info, collapse = "; ") [18:41:44.230] if (!has_future) { [18:41:44.230] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.230] info) [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.230] info, version) [18:41:44.230] } [18:41:44.230] base::stop(msg) [18:41:44.230] } [18:41:44.230] }) [18:41:44.230] } [18:41:44.230] ...future.strategy.old <- future::plan("list") [18:41:44.230] options(future.plan = NULL) [18:41:44.230] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.230] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.230] } [18:41:44.230] ...future.workdir <- getwd() [18:41:44.230] } [18:41:44.230] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.230] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.230] } [18:41:44.230] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.230] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.230] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.230] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.230] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.230] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.230] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.230] base::names(...future.oldOptions)) [18:41:44.230] } [18:41:44.230] if (FALSE) { [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] if (TRUE) { [18:41:44.230] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.230] open = "w") [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.230] windows = "NUL", "/dev/null"), open = "w") [18:41:44.230] } [18:41:44.230] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.230] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.230] base::sink(type = "output", split = FALSE) [18:41:44.230] base::close(...future.stdout) [18:41:44.230] }, add = TRUE) [18:41:44.230] } [18:41:44.230] ...future.frame <- base::sys.nframe() [18:41:44.230] ...future.conditions <- base::list() [18:41:44.230] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.230] if (FALSE) { [18:41:44.230] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.230] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.230] } [18:41:44.230] ...future.result <- base::tryCatch({ [18:41:44.230] base::withCallingHandlers({ [18:41:44.230] ...future.value <- base::withVisible(base::local({ [18:41:44.230] do.call(function(...) { [18:41:44.230] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.230] if (!identical(...future.globals.maxSize.org, [18:41:44.230] ...future.globals.maxSize)) { [18:41:44.230] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.230] on.exit(options(oopts), add = TRUE) [18:41:44.230] } [18:41:44.230] { [18:41:44.230] lapply(seq_along(...future.elements_ii), [18:41:44.230] FUN = function(jj) { [18:41:44.230] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.230] ...future.FUN(...future.X_jj, ...) [18:41:44.230] }) [18:41:44.230] } [18:41:44.230] }, args = future.call.arguments) [18:41:44.230] })) [18:41:44.230] future::FutureResult(value = ...future.value$value, [18:41:44.230] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.230] ...future.rng), globalenv = if (FALSE) [18:41:44.230] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.230] ...future.globalenv.names)) [18:41:44.230] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.230] }, condition = base::local({ [18:41:44.230] c <- base::c [18:41:44.230] inherits <- base::inherits [18:41:44.230] invokeRestart <- base::invokeRestart [18:41:44.230] length <- base::length [18:41:44.230] list <- base::list [18:41:44.230] seq.int <- base::seq.int [18:41:44.230] signalCondition <- base::signalCondition [18:41:44.230] sys.calls <- base::sys.calls [18:41:44.230] `[[` <- base::`[[` [18:41:44.230] `+` <- base::`+` [18:41:44.230] `<<-` <- base::`<<-` [18:41:44.230] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.230] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.230] 3L)] [18:41:44.230] } [18:41:44.230] function(cond) { [18:41:44.230] is_error <- inherits(cond, "error") [18:41:44.230] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.230] NULL) [18:41:44.230] if (is_error) { [18:41:44.230] sessionInformation <- function() { [18:41:44.230] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.230] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.230] search = base::search(), system = base::Sys.info()) [18:41:44.230] } [18:41:44.230] ...future.conditions[[length(...future.conditions) + [18:41:44.230] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.230] cond$call), session = sessionInformation(), [18:41:44.230] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.230] signalCondition(cond) [18:41:44.230] } [18:41:44.230] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.230] "immediateCondition"))) { [18:41:44.230] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.230] ...future.conditions[[length(...future.conditions) + [18:41:44.230] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.230] if (TRUE && !signal) { [18:41:44.230] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.230] { [18:41:44.230] inherits <- base::inherits [18:41:44.230] invokeRestart <- base::invokeRestart [18:41:44.230] is.null <- base::is.null [18:41:44.230] muffled <- FALSE [18:41:44.230] if (inherits(cond, "message")) { [18:41:44.230] muffled <- grepl(pattern, "muffleMessage") [18:41:44.230] if (muffled) [18:41:44.230] invokeRestart("muffleMessage") [18:41:44.230] } [18:41:44.230] else if (inherits(cond, "warning")) { [18:41:44.230] muffled <- grepl(pattern, "muffleWarning") [18:41:44.230] if (muffled) [18:41:44.230] invokeRestart("muffleWarning") [18:41:44.230] } [18:41:44.230] else if (inherits(cond, "condition")) { [18:41:44.230] if (!is.null(pattern)) { [18:41:44.230] computeRestarts <- base::computeRestarts [18:41:44.230] grepl <- base::grepl [18:41:44.230] restarts <- computeRestarts(cond) [18:41:44.230] for (restart in restarts) { [18:41:44.230] name <- restart$name [18:41:44.230] if (is.null(name)) [18:41:44.230] next [18:41:44.230] if (!grepl(pattern, name)) [18:41:44.230] next [18:41:44.230] invokeRestart(restart) [18:41:44.230] muffled <- TRUE [18:41:44.230] break [18:41:44.230] } [18:41:44.230] } [18:41:44.230] } [18:41:44.230] invisible(muffled) [18:41:44.230] } [18:41:44.230] muffleCondition(cond, pattern = "^muffle") [18:41:44.230] } [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] if (TRUE) { [18:41:44.230] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.230] { [18:41:44.230] inherits <- base::inherits [18:41:44.230] invokeRestart <- base::invokeRestart [18:41:44.230] is.null <- base::is.null [18:41:44.230] muffled <- FALSE [18:41:44.230] if (inherits(cond, "message")) { [18:41:44.230] muffled <- grepl(pattern, "muffleMessage") [18:41:44.230] if (muffled) [18:41:44.230] invokeRestart("muffleMessage") [18:41:44.230] } [18:41:44.230] else if (inherits(cond, "warning")) { [18:41:44.230] muffled <- grepl(pattern, "muffleWarning") [18:41:44.230] if (muffled) [18:41:44.230] invokeRestart("muffleWarning") [18:41:44.230] } [18:41:44.230] else if (inherits(cond, "condition")) { [18:41:44.230] if (!is.null(pattern)) { [18:41:44.230] computeRestarts <- base::computeRestarts [18:41:44.230] grepl <- base::grepl [18:41:44.230] restarts <- computeRestarts(cond) [18:41:44.230] for (restart in restarts) { [18:41:44.230] name <- restart$name [18:41:44.230] if (is.null(name)) [18:41:44.230] next [18:41:44.230] if (!grepl(pattern, name)) [18:41:44.230] next [18:41:44.230] invokeRestart(restart) [18:41:44.230] muffled <- TRUE [18:41:44.230] break [18:41:44.230] } [18:41:44.230] } [18:41:44.230] } [18:41:44.230] invisible(muffled) [18:41:44.230] } [18:41:44.230] muffleCondition(cond, pattern = "^muffle") [18:41:44.230] } [18:41:44.230] } [18:41:44.230] } [18:41:44.230] })) [18:41:44.230] }, error = function(ex) { [18:41:44.230] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.230] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.230] ...future.rng), started = ...future.startTime, [18:41:44.230] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.230] version = "1.8"), class = "FutureResult") [18:41:44.230] }, finally = { [18:41:44.230] if (!identical(...future.workdir, getwd())) [18:41:44.230] setwd(...future.workdir) [18:41:44.230] { [18:41:44.230] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.230] ...future.oldOptions$nwarnings <- NULL [18:41:44.230] } [18:41:44.230] base::options(...future.oldOptions) [18:41:44.230] if (.Platform$OS.type == "windows") { [18:41:44.230] old_names <- names(...future.oldEnvVars) [18:41:44.230] envs <- base::Sys.getenv() [18:41:44.230] names <- names(envs) [18:41:44.230] common <- intersect(names, old_names) [18:41:44.230] added <- setdiff(names, old_names) [18:41:44.230] removed <- setdiff(old_names, names) [18:41:44.230] changed <- common[...future.oldEnvVars[common] != [18:41:44.230] envs[common]] [18:41:44.230] NAMES <- toupper(changed) [18:41:44.230] args <- list() [18:41:44.230] for (kk in seq_along(NAMES)) { [18:41:44.230] name <- changed[[kk]] [18:41:44.230] NAME <- NAMES[[kk]] [18:41:44.230] if (name != NAME && is.element(NAME, old_names)) [18:41:44.230] next [18:41:44.230] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.230] } [18:41:44.230] NAMES <- toupper(added) [18:41:44.230] for (kk in seq_along(NAMES)) { [18:41:44.230] name <- added[[kk]] [18:41:44.230] NAME <- NAMES[[kk]] [18:41:44.230] if (name != NAME && is.element(NAME, old_names)) [18:41:44.230] next [18:41:44.230] args[[name]] <- "" [18:41:44.230] } [18:41:44.230] NAMES <- toupper(removed) [18:41:44.230] for (kk in seq_along(NAMES)) { [18:41:44.230] name <- removed[[kk]] [18:41:44.230] NAME <- NAMES[[kk]] [18:41:44.230] if (name != NAME && is.element(NAME, old_names)) [18:41:44.230] next [18:41:44.230] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.230] } [18:41:44.230] if (length(args) > 0) [18:41:44.230] base::do.call(base::Sys.setenv, args = args) [18:41:44.230] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.230] } [18:41:44.230] { [18:41:44.230] if (base::length(...future.futureOptionsAdded) > [18:41:44.230] 0L) { [18:41:44.230] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.230] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.230] base::options(opts) [18:41:44.230] } [18:41:44.230] { [18:41:44.230] { [18:41:44.230] NULL [18:41:44.230] RNGkind("Mersenne-Twister") [18:41:44.230] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.230] inherits = FALSE) [18:41:44.230] } [18:41:44.230] options(future.plan = NULL) [18:41:44.230] if (is.na(NA_character_)) [18:41:44.230] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.230] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.230] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.230] .init = FALSE) [18:41:44.230] } [18:41:44.230] } [18:41:44.230] } [18:41:44.230] }) [18:41:44.230] if (TRUE) { [18:41:44.230] base::sink(type = "output", split = FALSE) [18:41:44.230] if (TRUE) { [18:41:44.230] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.230] } [18:41:44.230] else { [18:41:44.230] ...future.result["stdout"] <- base::list(NULL) [18:41:44.230] } [18:41:44.230] base::close(...future.stdout) [18:41:44.230] ...future.stdout <- NULL [18:41:44.230] } [18:41:44.230] ...future.result$conditions <- ...future.conditions [18:41:44.230] ...future.result$finished <- base::Sys.time() [18:41:44.230] ...future.result [18:41:44.230] } [18:41:44.234] assign_globals() ... [18:41:44.234] List of 5 [18:41:44.234] $ ...future.FUN :function (x, ...) [18:41:44.234] $ future.call.arguments : list() [18:41:44.234] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.234] $ ...future.elements_ii :List of 4 [18:41:44.234] ..$ A: num 50 [18:41:44.234] ..$ B: num 60 [18:41:44.234] ..$ C: num 70 [18:41:44.234] ..$ D: num 80 [18:41:44.234] $ ...future.seeds_ii : NULL [18:41:44.234] $ ...future.globals.maxSize: NULL [18:41:44.234] - attr(*, "where")=List of 5 [18:41:44.234] ..$ ...future.FUN : [18:41:44.234] ..$ future.call.arguments : [18:41:44.234] ..$ ...future.elements_ii : [18:41:44.234] ..$ ...future.seeds_ii : [18:41:44.234] ..$ ...future.globals.maxSize: [18:41:44.234] - attr(*, "resolved")= logi FALSE [18:41:44.234] - attr(*, "total_size")= num 5150 [18:41:44.234] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.234] - attr(*, "already-done")= logi TRUE [18:41:44.241] - copied '...future.FUN' to environment [18:41:44.241] - copied 'future.call.arguments' to environment [18:41:44.241] - copied '...future.elements_ii' to environment [18:41:44.241] - copied '...future.seeds_ii' to environment [18:41:44.242] - copied '...future.globals.maxSize' to environment [18:41:44.242] assign_globals() ... done [18:41:44.242] plan(): Setting new future strategy stack: [18:41:44.242] List of future strategies: [18:41:44.242] 1. sequential: [18:41:44.242] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.242] - tweaked: FALSE [18:41:44.242] - call: NULL [18:41:44.243] plan(): nbrOfWorkers() = 1 [18:41:44.244] plan(): Setting new future strategy stack: [18:41:44.244] List of future strategies: [18:41:44.244] 1. sequential: [18:41:44.244] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.244] - tweaked: FALSE [18:41:44.244] - call: plan(strategy) [18:41:44.245] plan(): nbrOfWorkers() = 1 [18:41:44.245] SequentialFuture started (and completed) [18:41:44.246] - Launch lazy future ... done [18:41:44.246] run() for 'SequentialFuture' ... done [18:41:44.246] Created future: [18:41:44.246] SequentialFuture: [18:41:44.246] Label: 'future_sapply-1' [18:41:44.246] Expression: [18:41:44.246] { [18:41:44.246] do.call(function(...) { [18:41:44.246] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.246] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.246] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.246] on.exit(options(oopts), add = TRUE) [18:41:44.246] } [18:41:44.246] { [18:41:44.246] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.246] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.246] ...future.FUN(...future.X_jj, ...) [18:41:44.246] }) [18:41:44.246] } [18:41:44.246] }, args = future.call.arguments) [18:41:44.246] } [18:41:44.246] Lazy evaluation: FALSE [18:41:44.246] Asynchronous evaluation: FALSE [18:41:44.246] Local evaluation: TRUE [18:41:44.246] Environment: R_GlobalEnv [18:41:44.246] Capture standard output: TRUE [18:41:44.246] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.246] Globals: 5 objects totaling 593 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.246] Packages: [18:41:44.246] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.246] Resolved: TRUE [18:41:44.246] Value: 218 bytes of class 'list' [18:41:44.246] Early signaling: FALSE [18:41:44.246] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.246] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.247] Chunk #1 of 1 ... DONE [18:41:44.247] Launching 1 futures (chunks) ... DONE [18:41:44.248] Resolving 1 futures (chunks) ... [18:41:44.248] resolve() on list ... [18:41:44.248] recursive: 0 [18:41:44.248] length: 1 [18:41:44.248] [18:41:44.248] resolved() for 'SequentialFuture' ... [18:41:44.249] - state: 'finished' [18:41:44.249] - run: TRUE [18:41:44.249] - result: 'FutureResult' [18:41:44.249] resolved() for 'SequentialFuture' ... done [18:41:44.249] Future #1 [18:41:44.250] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.250] - nx: 1 [18:41:44.250] - relay: TRUE [18:41:44.250] - stdout: TRUE [18:41:44.250] - signal: TRUE [18:41:44.250] - resignal: FALSE [18:41:44.250] - force: TRUE [18:41:44.251] - relayed: [n=1] FALSE [18:41:44.251] - queued futures: [n=1] FALSE [18:41:44.251] - until=1 [18:41:44.251] - relaying element #1 [18:41:44.251] - relayed: [n=1] TRUE [18:41:44.252] - queued futures: [n=1] TRUE [18:41:44.254] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.254] length: 0 (resolved future 1) [18:41:44.255] Relaying remaining futures [18:41:44.255] signalConditionsASAP(NULL, pos=0) ... [18:41:44.255] - nx: 1 [18:41:44.255] - relay: TRUE [18:41:44.255] - stdout: TRUE [18:41:44.256] - signal: TRUE [18:41:44.256] - resignal: FALSE [18:41:44.256] - force: TRUE [18:41:44.256] - relayed: [n=1] TRUE [18:41:44.256] - queued futures: [n=1] TRUE - flush all [18:41:44.256] - relayed: [n=1] TRUE [18:41:44.257] - queued futures: [n=1] TRUE [18:41:44.257] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.257] resolve() on list ... DONE [18:41:44.257] - Number of value chunks collected: 1 [18:41:44.257] Resolving 1 futures (chunks) ... DONE [18:41:44.257] Reducing values from 1 chunks ... [18:41:44.258] - Number of values collected after concatenation: 4 [18:41:44.258] - Number of values expected: 4 [18:41:44.258] Reducing values from 1 chunks ... DONE [18:41:44.258] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:44.260] future_lapply() ... [18:41:44.261] Number of chunks: 1 [18:41:44.261] getGlobalsAndPackagesXApply() ... [18:41:44.261] - future.globals: TRUE [18:41:44.262] getGlobalsAndPackages() ... [18:41:44.262] Searching for globals... [18:41:44.263] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:44.264] Searching for globals ... DONE [18:41:44.264] Resolving globals: FALSE [18:41:44.264] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:44.265] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:44.265] - globals: [1] 'FUN' [18:41:44.265] [18:41:44.265] getGlobalsAndPackages() ... DONE [18:41:44.266] - globals found/used: [n=1] 'FUN' [18:41:44.266] - needed namespaces: [n=0] [18:41:44.266] Finding globals ... DONE [18:41:44.266] - use_args: TRUE [18:41:44.266] - Getting '...' globals ... [18:41:44.267] resolve() on list ... [18:41:44.267] recursive: 0 [18:41:44.267] length: 1 [18:41:44.267] elements: '...' [18:41:44.267] length: 0 (resolved future 1) [18:41:44.267] resolve() on list ... DONE [18:41:44.268] - '...' content: [n=0] [18:41:44.268] List of 1 [18:41:44.268] $ ...: list() [18:41:44.268] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.268] - attr(*, "where")=List of 1 [18:41:44.268] ..$ ...: [18:41:44.268] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.268] - attr(*, "resolved")= logi TRUE [18:41:44.268] - attr(*, "total_size")= num NA [18:41:44.271] - Getting '...' globals ... DONE [18:41:44.271] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.271] List of 2 [18:41:44.271] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:44.271] $ ... : list() [18:41:44.271] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.271] - attr(*, "where")=List of 2 [18:41:44.271] ..$ ...future.FUN: [18:41:44.271] ..$ ... : [18:41:44.271] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.271] - attr(*, "resolved")= logi FALSE [18:41:44.271] - attr(*, "total_size")= int 6632 [18:41:44.274] Packages to be attached in all futures: [n=0] [18:41:44.275] getGlobalsAndPackagesXApply() ... DONE [18:41:44.275] Number of futures (= number of chunks): 1 [18:41:44.275] Launching 1 futures (chunks) ... [18:41:44.275] Chunk #1 of 1 ... [18:41:44.275] - Finding globals in 'X' for chunk #1 ... [18:41:44.276] getGlobalsAndPackages() ... [18:41:44.276] Searching for globals... [18:41:44.276] [18:41:44.276] Searching for globals ... DONE [18:41:44.276] - globals: [0] [18:41:44.276] getGlobalsAndPackages() ... DONE [18:41:44.277] + additional globals found: [n=0] [18:41:44.277] + additional namespaces needed: [n=0] [18:41:44.277] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.277] - seeds: [18:41:44.277] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.277] getGlobalsAndPackages() ... [18:41:44.278] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.278] Resolving globals: FALSE [18:41:44.278] Tweak future expression to call with '...' arguments ... [18:41:44.278] { [18:41:44.278] do.call(function(...) { [18:41:44.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.278] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.278] on.exit(options(oopts), add = TRUE) [18:41:44.278] } [18:41:44.278] { [18:41:44.278] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.278] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.278] ...future.FUN(...future.X_jj, ...) [18:41:44.278] }) [18:41:44.278] } [18:41:44.278] }, args = future.call.arguments) [18:41:44.278] } [18:41:44.279] Tweak future expression to call with '...' arguments ... DONE [18:41:44.279] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.279] [18:41:44.279] getGlobalsAndPackages() ... DONE [18:41:44.280] run() for 'Future' ... [18:41:44.280] - state: 'created' [18:41:44.280] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.281] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.281] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.281] - Field: 'label' [18:41:44.281] - Field: 'local' [18:41:44.281] - Field: 'owner' [18:41:44.281] - Field: 'envir' [18:41:44.282] - Field: 'packages' [18:41:44.282] - Field: 'gc' [18:41:44.282] - Field: 'conditions' [18:41:44.282] - Field: 'expr' [18:41:44.282] - Field: 'uuid' [18:41:44.283] - Field: 'seed' [18:41:44.283] - Field: 'version' [18:41:44.283] - Field: 'result' [18:41:44.283] - Field: 'asynchronous' [18:41:44.283] - Field: 'calls' [18:41:44.283] - Field: 'globals' [18:41:44.284] - Field: 'stdout' [18:41:44.284] - Field: 'earlySignal' [18:41:44.284] - Field: 'lazy' [18:41:44.284] - Field: 'state' [18:41:44.284] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.284] - Launch lazy future ... [18:41:44.285] Packages needed by the future expression (n = 0): [18:41:44.285] Packages needed by future strategies (n = 0): [18:41:44.286] { [18:41:44.286] { [18:41:44.286] { [18:41:44.286] ...future.startTime <- base::Sys.time() [18:41:44.286] { [18:41:44.286] { [18:41:44.286] { [18:41:44.286] base::local({ [18:41:44.286] has_future <- base::requireNamespace("future", [18:41:44.286] quietly = TRUE) [18:41:44.286] if (has_future) { [18:41:44.286] ns <- base::getNamespace("future") [18:41:44.286] version <- ns[[".package"]][["version"]] [18:41:44.286] if (is.null(version)) [18:41:44.286] version <- utils::packageVersion("future") [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] version <- NULL [18:41:44.286] } [18:41:44.286] if (!has_future || version < "1.8.0") { [18:41:44.286] info <- base::c(r_version = base::gsub("R version ", [18:41:44.286] "", base::R.version$version.string), [18:41:44.286] platform = base::sprintf("%s (%s-bit)", [18:41:44.286] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.286] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.286] "release", "version")], collapse = " "), [18:41:44.286] hostname = base::Sys.info()[["nodename"]]) [18:41:44.286] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.286] info) [18:41:44.286] info <- base::paste(info, collapse = "; ") [18:41:44.286] if (!has_future) { [18:41:44.286] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.286] info) [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.286] info, version) [18:41:44.286] } [18:41:44.286] base::stop(msg) [18:41:44.286] } [18:41:44.286] }) [18:41:44.286] } [18:41:44.286] ...future.strategy.old <- future::plan("list") [18:41:44.286] options(future.plan = NULL) [18:41:44.286] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.286] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.286] } [18:41:44.286] ...future.workdir <- getwd() [18:41:44.286] } [18:41:44.286] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.286] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.286] } [18:41:44.286] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.286] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.286] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.286] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.286] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.286] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.286] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.286] base::names(...future.oldOptions)) [18:41:44.286] } [18:41:44.286] if (FALSE) { [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] if (TRUE) { [18:41:44.286] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.286] open = "w") [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.286] windows = "NUL", "/dev/null"), open = "w") [18:41:44.286] } [18:41:44.286] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.286] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.286] base::sink(type = "output", split = FALSE) [18:41:44.286] base::close(...future.stdout) [18:41:44.286] }, add = TRUE) [18:41:44.286] } [18:41:44.286] ...future.frame <- base::sys.nframe() [18:41:44.286] ...future.conditions <- base::list() [18:41:44.286] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.286] if (FALSE) { [18:41:44.286] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.286] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.286] } [18:41:44.286] ...future.result <- base::tryCatch({ [18:41:44.286] base::withCallingHandlers({ [18:41:44.286] ...future.value <- base::withVisible(base::local({ [18:41:44.286] do.call(function(...) { [18:41:44.286] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.286] if (!identical(...future.globals.maxSize.org, [18:41:44.286] ...future.globals.maxSize)) { [18:41:44.286] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.286] on.exit(options(oopts), add = TRUE) [18:41:44.286] } [18:41:44.286] { [18:41:44.286] lapply(seq_along(...future.elements_ii), [18:41:44.286] FUN = function(jj) { [18:41:44.286] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.286] ...future.FUN(...future.X_jj, ...) [18:41:44.286] }) [18:41:44.286] } [18:41:44.286] }, args = future.call.arguments) [18:41:44.286] })) [18:41:44.286] future::FutureResult(value = ...future.value$value, [18:41:44.286] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.286] ...future.rng), globalenv = if (FALSE) [18:41:44.286] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.286] ...future.globalenv.names)) [18:41:44.286] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.286] }, condition = base::local({ [18:41:44.286] c <- base::c [18:41:44.286] inherits <- base::inherits [18:41:44.286] invokeRestart <- base::invokeRestart [18:41:44.286] length <- base::length [18:41:44.286] list <- base::list [18:41:44.286] seq.int <- base::seq.int [18:41:44.286] signalCondition <- base::signalCondition [18:41:44.286] sys.calls <- base::sys.calls [18:41:44.286] `[[` <- base::`[[` [18:41:44.286] `+` <- base::`+` [18:41:44.286] `<<-` <- base::`<<-` [18:41:44.286] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.286] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.286] 3L)] [18:41:44.286] } [18:41:44.286] function(cond) { [18:41:44.286] is_error <- inherits(cond, "error") [18:41:44.286] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.286] NULL) [18:41:44.286] if (is_error) { [18:41:44.286] sessionInformation <- function() { [18:41:44.286] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.286] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.286] search = base::search(), system = base::Sys.info()) [18:41:44.286] } [18:41:44.286] ...future.conditions[[length(...future.conditions) + [18:41:44.286] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.286] cond$call), session = sessionInformation(), [18:41:44.286] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.286] signalCondition(cond) [18:41:44.286] } [18:41:44.286] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.286] "immediateCondition"))) { [18:41:44.286] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.286] ...future.conditions[[length(...future.conditions) + [18:41:44.286] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.286] if (TRUE && !signal) { [18:41:44.286] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.286] { [18:41:44.286] inherits <- base::inherits [18:41:44.286] invokeRestart <- base::invokeRestart [18:41:44.286] is.null <- base::is.null [18:41:44.286] muffled <- FALSE [18:41:44.286] if (inherits(cond, "message")) { [18:41:44.286] muffled <- grepl(pattern, "muffleMessage") [18:41:44.286] if (muffled) [18:41:44.286] invokeRestart("muffleMessage") [18:41:44.286] } [18:41:44.286] else if (inherits(cond, "warning")) { [18:41:44.286] muffled <- grepl(pattern, "muffleWarning") [18:41:44.286] if (muffled) [18:41:44.286] invokeRestart("muffleWarning") [18:41:44.286] } [18:41:44.286] else if (inherits(cond, "condition")) { [18:41:44.286] if (!is.null(pattern)) { [18:41:44.286] computeRestarts <- base::computeRestarts [18:41:44.286] grepl <- base::grepl [18:41:44.286] restarts <- computeRestarts(cond) [18:41:44.286] for (restart in restarts) { [18:41:44.286] name <- restart$name [18:41:44.286] if (is.null(name)) [18:41:44.286] next [18:41:44.286] if (!grepl(pattern, name)) [18:41:44.286] next [18:41:44.286] invokeRestart(restart) [18:41:44.286] muffled <- TRUE [18:41:44.286] break [18:41:44.286] } [18:41:44.286] } [18:41:44.286] } [18:41:44.286] invisible(muffled) [18:41:44.286] } [18:41:44.286] muffleCondition(cond, pattern = "^muffle") [18:41:44.286] } [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] if (TRUE) { [18:41:44.286] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.286] { [18:41:44.286] inherits <- base::inherits [18:41:44.286] invokeRestart <- base::invokeRestart [18:41:44.286] is.null <- base::is.null [18:41:44.286] muffled <- FALSE [18:41:44.286] if (inherits(cond, "message")) { [18:41:44.286] muffled <- grepl(pattern, "muffleMessage") [18:41:44.286] if (muffled) [18:41:44.286] invokeRestart("muffleMessage") [18:41:44.286] } [18:41:44.286] else if (inherits(cond, "warning")) { [18:41:44.286] muffled <- grepl(pattern, "muffleWarning") [18:41:44.286] if (muffled) [18:41:44.286] invokeRestart("muffleWarning") [18:41:44.286] } [18:41:44.286] else if (inherits(cond, "condition")) { [18:41:44.286] if (!is.null(pattern)) { [18:41:44.286] computeRestarts <- base::computeRestarts [18:41:44.286] grepl <- base::grepl [18:41:44.286] restarts <- computeRestarts(cond) [18:41:44.286] for (restart in restarts) { [18:41:44.286] name <- restart$name [18:41:44.286] if (is.null(name)) [18:41:44.286] next [18:41:44.286] if (!grepl(pattern, name)) [18:41:44.286] next [18:41:44.286] invokeRestart(restart) [18:41:44.286] muffled <- TRUE [18:41:44.286] break [18:41:44.286] } [18:41:44.286] } [18:41:44.286] } [18:41:44.286] invisible(muffled) [18:41:44.286] } [18:41:44.286] muffleCondition(cond, pattern = "^muffle") [18:41:44.286] } [18:41:44.286] } [18:41:44.286] } [18:41:44.286] })) [18:41:44.286] }, error = function(ex) { [18:41:44.286] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.286] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.286] ...future.rng), started = ...future.startTime, [18:41:44.286] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.286] version = "1.8"), class = "FutureResult") [18:41:44.286] }, finally = { [18:41:44.286] if (!identical(...future.workdir, getwd())) [18:41:44.286] setwd(...future.workdir) [18:41:44.286] { [18:41:44.286] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.286] ...future.oldOptions$nwarnings <- NULL [18:41:44.286] } [18:41:44.286] base::options(...future.oldOptions) [18:41:44.286] if (.Platform$OS.type == "windows") { [18:41:44.286] old_names <- names(...future.oldEnvVars) [18:41:44.286] envs <- base::Sys.getenv() [18:41:44.286] names <- names(envs) [18:41:44.286] common <- intersect(names, old_names) [18:41:44.286] added <- setdiff(names, old_names) [18:41:44.286] removed <- setdiff(old_names, names) [18:41:44.286] changed <- common[...future.oldEnvVars[common] != [18:41:44.286] envs[common]] [18:41:44.286] NAMES <- toupper(changed) [18:41:44.286] args <- list() [18:41:44.286] for (kk in seq_along(NAMES)) { [18:41:44.286] name <- changed[[kk]] [18:41:44.286] NAME <- NAMES[[kk]] [18:41:44.286] if (name != NAME && is.element(NAME, old_names)) [18:41:44.286] next [18:41:44.286] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.286] } [18:41:44.286] NAMES <- toupper(added) [18:41:44.286] for (kk in seq_along(NAMES)) { [18:41:44.286] name <- added[[kk]] [18:41:44.286] NAME <- NAMES[[kk]] [18:41:44.286] if (name != NAME && is.element(NAME, old_names)) [18:41:44.286] next [18:41:44.286] args[[name]] <- "" [18:41:44.286] } [18:41:44.286] NAMES <- toupper(removed) [18:41:44.286] for (kk in seq_along(NAMES)) { [18:41:44.286] name <- removed[[kk]] [18:41:44.286] NAME <- NAMES[[kk]] [18:41:44.286] if (name != NAME && is.element(NAME, old_names)) [18:41:44.286] next [18:41:44.286] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.286] } [18:41:44.286] if (length(args) > 0) [18:41:44.286] base::do.call(base::Sys.setenv, args = args) [18:41:44.286] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.286] } [18:41:44.286] { [18:41:44.286] if (base::length(...future.futureOptionsAdded) > [18:41:44.286] 0L) { [18:41:44.286] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.286] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.286] base::options(opts) [18:41:44.286] } [18:41:44.286] { [18:41:44.286] { [18:41:44.286] NULL [18:41:44.286] RNGkind("Mersenne-Twister") [18:41:44.286] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.286] inherits = FALSE) [18:41:44.286] } [18:41:44.286] options(future.plan = NULL) [18:41:44.286] if (is.na(NA_character_)) [18:41:44.286] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.286] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.286] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.286] .init = FALSE) [18:41:44.286] } [18:41:44.286] } [18:41:44.286] } [18:41:44.286] }) [18:41:44.286] if (TRUE) { [18:41:44.286] base::sink(type = "output", split = FALSE) [18:41:44.286] if (TRUE) { [18:41:44.286] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.286] } [18:41:44.286] else { [18:41:44.286] ...future.result["stdout"] <- base::list(NULL) [18:41:44.286] } [18:41:44.286] base::close(...future.stdout) [18:41:44.286] ...future.stdout <- NULL [18:41:44.286] } [18:41:44.286] ...future.result$conditions <- ...future.conditions [18:41:44.286] ...future.result$finished <- base::Sys.time() [18:41:44.286] ...future.result [18:41:44.286] } [18:41:44.289] assign_globals() ... [18:41:44.290] List of 5 [18:41:44.290] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:44.290] $ future.call.arguments : list() [18:41:44.290] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.290] $ ...future.elements_ii :List of 4 [18:41:44.290] ..$ A: num 50 [18:41:44.290] ..$ B: num 60 [18:41:44.290] ..$ C: num 70 [18:41:44.290] ..$ D: num 80 [18:41:44.290] $ ...future.seeds_ii : NULL [18:41:44.290] $ ...future.globals.maxSize: NULL [18:41:44.290] - attr(*, "where")=List of 5 [18:41:44.290] ..$ ...future.FUN : [18:41:44.290] ..$ future.call.arguments : [18:41:44.290] ..$ ...future.elements_ii : [18:41:44.290] ..$ ...future.seeds_ii : [18:41:44.290] ..$ ...future.globals.maxSize: [18:41:44.290] - attr(*, "resolved")= logi FALSE [18:41:44.290] - attr(*, "total_size")= num 6632 [18:41:44.290] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.290] - attr(*, "already-done")= logi TRUE [18:41:44.296] - reassign environment for '...future.FUN' [18:41:44.297] - copied '...future.FUN' to environment [18:41:44.297] - copied 'future.call.arguments' to environment [18:41:44.297] - copied '...future.elements_ii' to environment [18:41:44.297] - copied '...future.seeds_ii' to environment [18:41:44.297] - copied '...future.globals.maxSize' to environment [18:41:44.297] assign_globals() ... done [18:41:44.298] plan(): Setting new future strategy stack: [18:41:44.298] List of future strategies: [18:41:44.298] 1. sequential: [18:41:44.298] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.298] - tweaked: FALSE [18:41:44.298] - call: NULL [18:41:44.299] plan(): nbrOfWorkers() = 1 [18:41:44.300] plan(): Setting new future strategy stack: [18:41:44.300] List of future strategies: [18:41:44.300] 1. sequential: [18:41:44.300] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.300] - tweaked: FALSE [18:41:44.300] - call: plan(strategy) [18:41:44.301] plan(): nbrOfWorkers() = 1 [18:41:44.301] SequentialFuture started (and completed) [18:41:44.301] - Launch lazy future ... done [18:41:44.302] run() for 'SequentialFuture' ... done [18:41:44.302] Created future: [18:41:44.302] SequentialFuture: [18:41:44.302] Label: 'future_sapply-1' [18:41:44.302] Expression: [18:41:44.302] { [18:41:44.302] do.call(function(...) { [18:41:44.302] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.302] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.302] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.302] on.exit(options(oopts), add = TRUE) [18:41:44.302] } [18:41:44.302] { [18:41:44.302] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.302] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.302] ...future.FUN(...future.X_jj, ...) [18:41:44.302] }) [18:41:44.302] } [18:41:44.302] }, args = future.call.arguments) [18:41:44.302] } [18:41:44.302] Lazy evaluation: FALSE [18:41:44.302] Asynchronous evaluation: FALSE [18:41:44.302] Local evaluation: TRUE [18:41:44.302] Environment: R_GlobalEnv [18:41:44.302] Capture standard output: TRUE [18:41:44.302] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.302] Globals: 5 objects totaling 1.07 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.302] Packages: [18:41:44.302] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.302] Resolved: TRUE [18:41:44.302] Value: 666 bytes of class 'list' [18:41:44.302] Early signaling: FALSE [18:41:44.302] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.302] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.303] Chunk #1 of 1 ... DONE [18:41:44.303] Launching 1 futures (chunks) ... DONE [18:41:44.303] Resolving 1 futures (chunks) ... [18:41:44.304] resolve() on list ... [18:41:44.304] recursive: 0 [18:41:44.304] length: 1 [18:41:44.304] [18:41:44.304] resolved() for 'SequentialFuture' ... [18:41:44.304] - state: 'finished' [18:41:44.305] - run: TRUE [18:41:44.305] - result: 'FutureResult' [18:41:44.305] resolved() for 'SequentialFuture' ... done [18:41:44.305] Future #1 [18:41:44.305] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.306] - nx: 1 [18:41:44.306] - relay: TRUE [18:41:44.306] - stdout: TRUE [18:41:44.306] - signal: TRUE [18:41:44.306] - resignal: FALSE [18:41:44.306] - force: TRUE [18:41:44.306] - relayed: [n=1] FALSE [18:41:44.307] - queued futures: [n=1] FALSE [18:41:44.307] - until=1 [18:41:44.307] - relaying element #1 [18:41:44.307] - relayed: [n=1] TRUE [18:41:44.307] - queued futures: [n=1] TRUE [18:41:44.308] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.308] length: 0 (resolved future 1) [18:41:44.308] Relaying remaining futures [18:41:44.308] signalConditionsASAP(NULL, pos=0) ... [18:41:44.308] - nx: 1 [18:41:44.308] - relay: TRUE [18:41:44.308] - stdout: TRUE [18:41:44.309] - signal: TRUE [18:41:44.309] - resignal: FALSE [18:41:44.309] - force: TRUE [18:41:44.309] - relayed: [n=1] TRUE [18:41:44.309] - queued futures: [n=1] TRUE - flush all [18:41:44.310] - relayed: [n=1] TRUE [18:41:44.310] - queued futures: [n=1] TRUE [18:41:44.310] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.310] resolve() on list ... DONE [18:41:44.310] - Number of value chunks collected: 1 [18:41:44.310] Resolving 1 futures (chunks) ... DONE [18:41:44.311] Reducing values from 1 chunks ... [18:41:44.311] - Number of values collected after concatenation: 4 [18:41:44.311] - Number of values expected: 4 [18:41:44.311] Reducing values from 1 chunks ... DONE [18:41:44.311] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:44.314] future_lapply() ... [18:41:44.315] Number of chunks: 1 [18:41:44.315] getGlobalsAndPackagesXApply() ... [18:41:44.315] - future.globals: TRUE [18:41:44.315] getGlobalsAndPackages() ... [18:41:44.316] Searching for globals... [18:41:44.317] - globals found: [1] 'FUN' [18:41:44.317] Searching for globals ... DONE [18:41:44.317] Resolving globals: FALSE [18:41:44.318] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:44.318] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:44.318] - globals: [1] 'FUN' [18:41:44.318] [18:41:44.319] getGlobalsAndPackages() ... DONE [18:41:44.319] - globals found/used: [n=1] 'FUN' [18:41:44.319] - needed namespaces: [n=0] [18:41:44.319] Finding globals ... DONE [18:41:44.319] - use_args: TRUE [18:41:44.319] - Getting '...' globals ... [18:41:44.320] resolve() on list ... [18:41:44.320] recursive: 0 [18:41:44.320] length: 1 [18:41:44.320] elements: '...' [18:41:44.321] length: 0 (resolved future 1) [18:41:44.321] resolve() on list ... DONE [18:41:44.321] - '...' content: [n=0] [18:41:44.321] List of 1 [18:41:44.321] $ ...: list() [18:41:44.321] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.321] - attr(*, "where")=List of 1 [18:41:44.321] ..$ ...: [18:41:44.321] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.321] - attr(*, "resolved")= logi TRUE [18:41:44.321] - attr(*, "total_size")= num NA [18:41:44.324] - Getting '...' globals ... DONE [18:41:44.324] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.324] List of 2 [18:41:44.324] $ ...future.FUN:function (x) [18:41:44.324] $ ... : list() [18:41:44.324] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.324] - attr(*, "where")=List of 2 [18:41:44.324] ..$ ...future.FUN: [18:41:44.324] ..$ ... : [18:41:44.324] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.324] - attr(*, "resolved")= logi FALSE [18:41:44.324] - attr(*, "total_size")= int 4910 [18:41:44.328] Packages to be attached in all futures: [n=0] [18:41:44.328] getGlobalsAndPackagesXApply() ... DONE [18:41:44.328] Number of futures (= number of chunks): 1 [18:41:44.328] Launching 1 futures (chunks) ... [18:41:44.328] Chunk #1 of 1 ... [18:41:44.329] - Finding globals in 'X' for chunk #1 ... [18:41:44.329] getGlobalsAndPackages() ... [18:41:44.329] Searching for globals... [18:41:44.329] [18:41:44.329] Searching for globals ... DONE [18:41:44.330] - globals: [0] [18:41:44.330] getGlobalsAndPackages() ... DONE [18:41:44.330] + additional globals found: [n=0] [18:41:44.330] + additional namespaces needed: [n=0] [18:41:44.330] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.330] - seeds: [18:41:44.330] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.331] getGlobalsAndPackages() ... [18:41:44.331] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.331] Resolving globals: FALSE [18:41:44.331] Tweak future expression to call with '...' arguments ... [18:41:44.331] { [18:41:44.331] do.call(function(...) { [18:41:44.331] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.331] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.331] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.331] on.exit(options(oopts), add = TRUE) [18:41:44.331] } [18:41:44.331] { [18:41:44.331] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.331] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.331] ...future.FUN(...future.X_jj, ...) [18:41:44.331] }) [18:41:44.331] } [18:41:44.331] }, args = future.call.arguments) [18:41:44.331] } [18:41:44.332] Tweak future expression to call with '...' arguments ... DONE [18:41:44.332] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.332] [18:41:44.333] getGlobalsAndPackages() ... DONE [18:41:44.333] run() for 'Future' ... [18:41:44.333] - state: 'created' [18:41:44.333] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.334] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.334] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.334] - Field: 'label' [18:41:44.334] - Field: 'local' [18:41:44.335] - Field: 'owner' [18:41:44.335] - Field: 'envir' [18:41:44.335] - Field: 'packages' [18:41:44.335] - Field: 'gc' [18:41:44.335] - Field: 'conditions' [18:41:44.335] - Field: 'expr' [18:41:44.336] - Field: 'uuid' [18:41:44.336] - Field: 'seed' [18:41:44.336] - Field: 'version' [18:41:44.336] - Field: 'result' [18:41:44.336] - Field: 'asynchronous' [18:41:44.336] - Field: 'calls' [18:41:44.337] - Field: 'globals' [18:41:44.337] - Field: 'stdout' [18:41:44.337] - Field: 'earlySignal' [18:41:44.337] - Field: 'lazy' [18:41:44.337] - Field: 'state' [18:41:44.337] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.338] - Launch lazy future ... [18:41:44.338] Packages needed by the future expression (n = 0): [18:41:44.338] Packages needed by future strategies (n = 0): [18:41:44.339] { [18:41:44.339] { [18:41:44.339] { [18:41:44.339] ...future.startTime <- base::Sys.time() [18:41:44.339] { [18:41:44.339] { [18:41:44.339] { [18:41:44.339] base::local({ [18:41:44.339] has_future <- base::requireNamespace("future", [18:41:44.339] quietly = TRUE) [18:41:44.339] if (has_future) { [18:41:44.339] ns <- base::getNamespace("future") [18:41:44.339] version <- ns[[".package"]][["version"]] [18:41:44.339] if (is.null(version)) [18:41:44.339] version <- utils::packageVersion("future") [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] version <- NULL [18:41:44.339] } [18:41:44.339] if (!has_future || version < "1.8.0") { [18:41:44.339] info <- base::c(r_version = base::gsub("R version ", [18:41:44.339] "", base::R.version$version.string), [18:41:44.339] platform = base::sprintf("%s (%s-bit)", [18:41:44.339] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.339] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.339] "release", "version")], collapse = " "), [18:41:44.339] hostname = base::Sys.info()[["nodename"]]) [18:41:44.339] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.339] info) [18:41:44.339] info <- base::paste(info, collapse = "; ") [18:41:44.339] if (!has_future) { [18:41:44.339] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.339] info) [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.339] info, version) [18:41:44.339] } [18:41:44.339] base::stop(msg) [18:41:44.339] } [18:41:44.339] }) [18:41:44.339] } [18:41:44.339] ...future.strategy.old <- future::plan("list") [18:41:44.339] options(future.plan = NULL) [18:41:44.339] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.339] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.339] } [18:41:44.339] ...future.workdir <- getwd() [18:41:44.339] } [18:41:44.339] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.339] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.339] } [18:41:44.339] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.339] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.339] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.339] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.339] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.339] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.339] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.339] base::names(...future.oldOptions)) [18:41:44.339] } [18:41:44.339] if (FALSE) { [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] if (TRUE) { [18:41:44.339] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.339] open = "w") [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.339] windows = "NUL", "/dev/null"), open = "w") [18:41:44.339] } [18:41:44.339] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.339] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.339] base::sink(type = "output", split = FALSE) [18:41:44.339] base::close(...future.stdout) [18:41:44.339] }, add = TRUE) [18:41:44.339] } [18:41:44.339] ...future.frame <- base::sys.nframe() [18:41:44.339] ...future.conditions <- base::list() [18:41:44.339] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.339] if (FALSE) { [18:41:44.339] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.339] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.339] } [18:41:44.339] ...future.result <- base::tryCatch({ [18:41:44.339] base::withCallingHandlers({ [18:41:44.339] ...future.value <- base::withVisible(base::local({ [18:41:44.339] do.call(function(...) { [18:41:44.339] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.339] if (!identical(...future.globals.maxSize.org, [18:41:44.339] ...future.globals.maxSize)) { [18:41:44.339] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.339] on.exit(options(oopts), add = TRUE) [18:41:44.339] } [18:41:44.339] { [18:41:44.339] lapply(seq_along(...future.elements_ii), [18:41:44.339] FUN = function(jj) { [18:41:44.339] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.339] ...future.FUN(...future.X_jj, ...) [18:41:44.339] }) [18:41:44.339] } [18:41:44.339] }, args = future.call.arguments) [18:41:44.339] })) [18:41:44.339] future::FutureResult(value = ...future.value$value, [18:41:44.339] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.339] ...future.rng), globalenv = if (FALSE) [18:41:44.339] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.339] ...future.globalenv.names)) [18:41:44.339] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.339] }, condition = base::local({ [18:41:44.339] c <- base::c [18:41:44.339] inherits <- base::inherits [18:41:44.339] invokeRestart <- base::invokeRestart [18:41:44.339] length <- base::length [18:41:44.339] list <- base::list [18:41:44.339] seq.int <- base::seq.int [18:41:44.339] signalCondition <- base::signalCondition [18:41:44.339] sys.calls <- base::sys.calls [18:41:44.339] `[[` <- base::`[[` [18:41:44.339] `+` <- base::`+` [18:41:44.339] `<<-` <- base::`<<-` [18:41:44.339] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.339] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.339] 3L)] [18:41:44.339] } [18:41:44.339] function(cond) { [18:41:44.339] is_error <- inherits(cond, "error") [18:41:44.339] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.339] NULL) [18:41:44.339] if (is_error) { [18:41:44.339] sessionInformation <- function() { [18:41:44.339] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.339] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.339] search = base::search(), system = base::Sys.info()) [18:41:44.339] } [18:41:44.339] ...future.conditions[[length(...future.conditions) + [18:41:44.339] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.339] cond$call), session = sessionInformation(), [18:41:44.339] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.339] signalCondition(cond) [18:41:44.339] } [18:41:44.339] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.339] "immediateCondition"))) { [18:41:44.339] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.339] ...future.conditions[[length(...future.conditions) + [18:41:44.339] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.339] if (TRUE && !signal) { [18:41:44.339] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.339] { [18:41:44.339] inherits <- base::inherits [18:41:44.339] invokeRestart <- base::invokeRestart [18:41:44.339] is.null <- base::is.null [18:41:44.339] muffled <- FALSE [18:41:44.339] if (inherits(cond, "message")) { [18:41:44.339] muffled <- grepl(pattern, "muffleMessage") [18:41:44.339] if (muffled) [18:41:44.339] invokeRestart("muffleMessage") [18:41:44.339] } [18:41:44.339] else if (inherits(cond, "warning")) { [18:41:44.339] muffled <- grepl(pattern, "muffleWarning") [18:41:44.339] if (muffled) [18:41:44.339] invokeRestart("muffleWarning") [18:41:44.339] } [18:41:44.339] else if (inherits(cond, "condition")) { [18:41:44.339] if (!is.null(pattern)) { [18:41:44.339] computeRestarts <- base::computeRestarts [18:41:44.339] grepl <- base::grepl [18:41:44.339] restarts <- computeRestarts(cond) [18:41:44.339] for (restart in restarts) { [18:41:44.339] name <- restart$name [18:41:44.339] if (is.null(name)) [18:41:44.339] next [18:41:44.339] if (!grepl(pattern, name)) [18:41:44.339] next [18:41:44.339] invokeRestart(restart) [18:41:44.339] muffled <- TRUE [18:41:44.339] break [18:41:44.339] } [18:41:44.339] } [18:41:44.339] } [18:41:44.339] invisible(muffled) [18:41:44.339] } [18:41:44.339] muffleCondition(cond, pattern = "^muffle") [18:41:44.339] } [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] if (TRUE) { [18:41:44.339] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.339] { [18:41:44.339] inherits <- base::inherits [18:41:44.339] invokeRestart <- base::invokeRestart [18:41:44.339] is.null <- base::is.null [18:41:44.339] muffled <- FALSE [18:41:44.339] if (inherits(cond, "message")) { [18:41:44.339] muffled <- grepl(pattern, "muffleMessage") [18:41:44.339] if (muffled) [18:41:44.339] invokeRestart("muffleMessage") [18:41:44.339] } [18:41:44.339] else if (inherits(cond, "warning")) { [18:41:44.339] muffled <- grepl(pattern, "muffleWarning") [18:41:44.339] if (muffled) [18:41:44.339] invokeRestart("muffleWarning") [18:41:44.339] } [18:41:44.339] else if (inherits(cond, "condition")) { [18:41:44.339] if (!is.null(pattern)) { [18:41:44.339] computeRestarts <- base::computeRestarts [18:41:44.339] grepl <- base::grepl [18:41:44.339] restarts <- computeRestarts(cond) [18:41:44.339] for (restart in restarts) { [18:41:44.339] name <- restart$name [18:41:44.339] if (is.null(name)) [18:41:44.339] next [18:41:44.339] if (!grepl(pattern, name)) [18:41:44.339] next [18:41:44.339] invokeRestart(restart) [18:41:44.339] muffled <- TRUE [18:41:44.339] break [18:41:44.339] } [18:41:44.339] } [18:41:44.339] } [18:41:44.339] invisible(muffled) [18:41:44.339] } [18:41:44.339] muffleCondition(cond, pattern = "^muffle") [18:41:44.339] } [18:41:44.339] } [18:41:44.339] } [18:41:44.339] })) [18:41:44.339] }, error = function(ex) { [18:41:44.339] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.339] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.339] ...future.rng), started = ...future.startTime, [18:41:44.339] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.339] version = "1.8"), class = "FutureResult") [18:41:44.339] }, finally = { [18:41:44.339] if (!identical(...future.workdir, getwd())) [18:41:44.339] setwd(...future.workdir) [18:41:44.339] { [18:41:44.339] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.339] ...future.oldOptions$nwarnings <- NULL [18:41:44.339] } [18:41:44.339] base::options(...future.oldOptions) [18:41:44.339] if (.Platform$OS.type == "windows") { [18:41:44.339] old_names <- names(...future.oldEnvVars) [18:41:44.339] envs <- base::Sys.getenv() [18:41:44.339] names <- names(envs) [18:41:44.339] common <- intersect(names, old_names) [18:41:44.339] added <- setdiff(names, old_names) [18:41:44.339] removed <- setdiff(old_names, names) [18:41:44.339] changed <- common[...future.oldEnvVars[common] != [18:41:44.339] envs[common]] [18:41:44.339] NAMES <- toupper(changed) [18:41:44.339] args <- list() [18:41:44.339] for (kk in seq_along(NAMES)) { [18:41:44.339] name <- changed[[kk]] [18:41:44.339] NAME <- NAMES[[kk]] [18:41:44.339] if (name != NAME && is.element(NAME, old_names)) [18:41:44.339] next [18:41:44.339] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.339] } [18:41:44.339] NAMES <- toupper(added) [18:41:44.339] for (kk in seq_along(NAMES)) { [18:41:44.339] name <- added[[kk]] [18:41:44.339] NAME <- NAMES[[kk]] [18:41:44.339] if (name != NAME && is.element(NAME, old_names)) [18:41:44.339] next [18:41:44.339] args[[name]] <- "" [18:41:44.339] } [18:41:44.339] NAMES <- toupper(removed) [18:41:44.339] for (kk in seq_along(NAMES)) { [18:41:44.339] name <- removed[[kk]] [18:41:44.339] NAME <- NAMES[[kk]] [18:41:44.339] if (name != NAME && is.element(NAME, old_names)) [18:41:44.339] next [18:41:44.339] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.339] } [18:41:44.339] if (length(args) > 0) [18:41:44.339] base::do.call(base::Sys.setenv, args = args) [18:41:44.339] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.339] } [18:41:44.339] { [18:41:44.339] if (base::length(...future.futureOptionsAdded) > [18:41:44.339] 0L) { [18:41:44.339] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.339] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.339] base::options(opts) [18:41:44.339] } [18:41:44.339] { [18:41:44.339] { [18:41:44.339] NULL [18:41:44.339] RNGkind("Mersenne-Twister") [18:41:44.339] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.339] inherits = FALSE) [18:41:44.339] } [18:41:44.339] options(future.plan = NULL) [18:41:44.339] if (is.na(NA_character_)) [18:41:44.339] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.339] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.339] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.339] .init = FALSE) [18:41:44.339] } [18:41:44.339] } [18:41:44.339] } [18:41:44.339] }) [18:41:44.339] if (TRUE) { [18:41:44.339] base::sink(type = "output", split = FALSE) [18:41:44.339] if (TRUE) { [18:41:44.339] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.339] } [18:41:44.339] else { [18:41:44.339] ...future.result["stdout"] <- base::list(NULL) [18:41:44.339] } [18:41:44.339] base::close(...future.stdout) [18:41:44.339] ...future.stdout <- NULL [18:41:44.339] } [18:41:44.339] ...future.result$conditions <- ...future.conditions [18:41:44.339] ...future.result$finished <- base::Sys.time() [18:41:44.339] ...future.result [18:41:44.339] } [18:41:44.343] assign_globals() ... [18:41:44.343] List of 5 [18:41:44.343] $ ...future.FUN :function (x) [18:41:44.343] $ future.call.arguments : list() [18:41:44.343] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.343] $ ...future.elements_ii :List of 4 [18:41:44.343] ..$ A: num 50 [18:41:44.343] ..$ B: num 60 [18:41:44.343] ..$ C: num 70 [18:41:44.343] ..$ D: num 80 [18:41:44.343] $ ...future.seeds_ii : NULL [18:41:44.343] $ ...future.globals.maxSize: NULL [18:41:44.343] - attr(*, "where")=List of 5 [18:41:44.343] ..$ ...future.FUN : [18:41:44.343] ..$ future.call.arguments : [18:41:44.343] ..$ ...future.elements_ii : [18:41:44.343] ..$ ...future.seeds_ii : [18:41:44.343] ..$ ...future.globals.maxSize: [18:41:44.343] - attr(*, "resolved")= logi FALSE [18:41:44.343] - attr(*, "total_size")= num 4910 [18:41:44.343] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.343] - attr(*, "already-done")= logi TRUE [18:41:44.350] - copied '...future.FUN' to environment [18:41:44.350] - copied 'future.call.arguments' to environment [18:41:44.350] - copied '...future.elements_ii' to environment [18:41:44.350] - copied '...future.seeds_ii' to environment [18:41:44.350] - copied '...future.globals.maxSize' to environment [18:41:44.350] assign_globals() ... done [18:41:44.351] plan(): Setting new future strategy stack: [18:41:44.351] List of future strategies: [18:41:44.351] 1. sequential: [18:41:44.351] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.351] - tweaked: FALSE [18:41:44.351] - call: NULL [18:41:44.352] plan(): nbrOfWorkers() = 1 [18:41:44.353] plan(): Setting new future strategy stack: [18:41:44.353] List of future strategies: [18:41:44.353] 1. sequential: [18:41:44.353] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.353] - tweaked: FALSE [18:41:44.353] - call: plan(strategy) [18:41:44.354] plan(): nbrOfWorkers() = 1 [18:41:44.354] SequentialFuture started (and completed) [18:41:44.354] - Launch lazy future ... done [18:41:44.355] run() for 'SequentialFuture' ... done [18:41:44.355] Created future: [18:41:44.355] SequentialFuture: [18:41:44.355] Label: 'future_sapply-1' [18:41:44.355] Expression: [18:41:44.355] { [18:41:44.355] do.call(function(...) { [18:41:44.355] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.355] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.355] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.355] on.exit(options(oopts), add = TRUE) [18:41:44.355] } [18:41:44.355] { [18:41:44.355] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.355] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.355] ...future.FUN(...future.X_jj, ...) [18:41:44.355] }) [18:41:44.355] } [18:41:44.355] }, args = future.call.arguments) [18:41:44.355] } [18:41:44.355] Lazy evaluation: FALSE [18:41:44.355] Asynchronous evaluation: FALSE [18:41:44.355] Local evaluation: TRUE [18:41:44.355] Environment: R_GlobalEnv [18:41:44.355] Capture standard output: TRUE [18:41:44.355] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.355] Globals: 5 objects totaling 500 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.355] Packages: [18:41:44.355] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.355] Resolved: TRUE [18:41:44.355] Value: 95 bytes of class 'list' [18:41:44.355] Early signaling: FALSE [18:41:44.355] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.355] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.356] Chunk #1 of 1 ... DONE [18:41:44.356] Launching 1 futures (chunks) ... DONE [18:41:44.356] Resolving 1 futures (chunks) ... [18:41:44.357] resolve() on list ... [18:41:44.357] recursive: 0 [18:41:44.357] length: 1 [18:41:44.357] [18:41:44.357] resolved() for 'SequentialFuture' ... [18:41:44.357] - state: 'finished' [18:41:44.358] - run: TRUE [18:41:44.358] - result: 'FutureResult' [18:41:44.358] resolved() for 'SequentialFuture' ... done [18:41:44.358] Future #1 [18:41:44.358] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.359] - nx: 1 [18:41:44.359] - relay: TRUE [18:41:44.359] - stdout: TRUE [18:41:44.359] - signal: TRUE [18:41:44.359] - resignal: FALSE [18:41:44.359] - force: TRUE [18:41:44.359] - relayed: [n=1] FALSE [18:41:44.360] - queued futures: [n=1] FALSE [18:41:44.360] - until=1 [18:41:44.360] - relaying element #1 [18:41:44.360] - relayed: [n=1] TRUE [18:41:44.360] - queued futures: [n=1] TRUE [18:41:44.361] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.361] length: 0 (resolved future 1) [18:41:44.361] Relaying remaining futures [18:41:44.361] signalConditionsASAP(NULL, pos=0) ... [18:41:44.361] - nx: 1 [18:41:44.361] - relay: TRUE [18:41:44.364] - stdout: TRUE [18:41:44.365] - signal: TRUE [18:41:44.365] - resignal: FALSE [18:41:44.365] - force: TRUE [18:41:44.366] - relayed: [n=1] TRUE [18:41:44.366] - queued futures: [n=1] TRUE - flush all [18:41:44.366] - relayed: [n=1] TRUE [18:41:44.367] - queued futures: [n=1] TRUE [18:41:44.367] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.367] resolve() on list ... DONE [18:41:44.368] - Number of value chunks collected: 1 [18:41:44.368] Resolving 1 futures (chunks) ... DONE [18:41:44.368] Reducing values from 1 chunks ... [18:41:44.369] - Number of values collected after concatenation: 4 [18:41:44.369] - Number of values expected: 4 [18:41:44.369] Reducing values from 1 chunks ... DONE [18:41:44.369] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:44.373] future_lapply() ... [18:41:44.374] Number of chunks: 1 [18:41:44.374] getGlobalsAndPackagesXApply() ... [18:41:44.375] - future.globals: TRUE [18:41:44.375] getGlobalsAndPackages() ... [18:41:44.375] Searching for globals... [18:41:44.378] - globals found: [2] 'FUN', 'UseMethod' [18:41:44.378] Searching for globals ... DONE [18:41:44.378] Resolving globals: FALSE [18:41:44.379] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:44.380] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:44.380] - globals: [1] 'FUN' [18:41:44.380] [18:41:44.381] getGlobalsAndPackages() ... DONE [18:41:44.381] - globals found/used: [n=1] 'FUN' [18:41:44.381] - needed namespaces: [n=0] [18:41:44.382] Finding globals ... DONE [18:41:44.382] - use_args: TRUE [18:41:44.382] - Getting '...' globals ... [18:41:44.383] resolve() on list ... [18:41:44.383] recursive: 0 [18:41:44.384] length: 1 [18:41:44.384] elements: '...' [18:41:44.384] length: 0 (resolved future 1) [18:41:44.385] resolve() on list ... DONE [18:41:44.385] - '...' content: [n=0] [18:41:44.385] List of 1 [18:41:44.385] $ ...: list() [18:41:44.385] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.385] - attr(*, "where")=List of 1 [18:41:44.385] ..$ ...: [18:41:44.385] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.385] - attr(*, "resolved")= logi TRUE [18:41:44.385] - attr(*, "total_size")= num NA [18:41:44.390] - Getting '...' globals ... DONE [18:41:44.391] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.391] List of 2 [18:41:44.391] $ ...future.FUN:function (x, ...) [18:41:44.391] $ ... : list() [18:41:44.391] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.391] - attr(*, "where")=List of 2 [18:41:44.391] ..$ ...future.FUN: [18:41:44.391] ..$ ... : [18:41:44.391] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.391] - attr(*, "resolved")= logi FALSE [18:41:44.391] - attr(*, "total_size")= int 5150 [18:41:44.397] Packages to be attached in all futures: [n=0] [18:41:44.397] getGlobalsAndPackagesXApply() ... DONE [18:41:44.398] Number of futures (= number of chunks): 1 [18:41:44.398] Launching 1 futures (chunks) ... [18:41:44.398] Chunk #1 of 1 ... [18:41:44.399] - Finding globals in 'X' for chunk #1 ... [18:41:44.399] getGlobalsAndPackages() ... [18:41:44.399] Searching for globals... [18:41:44.400] [18:41:44.400] Searching for globals ... DONE [18:41:44.401] - globals: [0] [18:41:44.401] getGlobalsAndPackages() ... DONE [18:41:44.401] + additional globals found: [n=0] [18:41:44.401] + additional namespaces needed: [n=0] [18:41:44.402] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.402] - seeds: [18:41:44.402] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.403] getGlobalsAndPackages() ... [18:41:44.403] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.403] Resolving globals: FALSE [18:41:44.404] Tweak future expression to call with '...' arguments ... [18:41:44.404] { [18:41:44.404] do.call(function(...) { [18:41:44.404] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.404] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.404] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.404] on.exit(options(oopts), add = TRUE) [18:41:44.404] } [18:41:44.404] { [18:41:44.404] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.404] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.404] ...future.FUN(...future.X_jj, ...) [18:41:44.404] }) [18:41:44.404] } [18:41:44.404] }, args = future.call.arguments) [18:41:44.404] } [18:41:44.405] Tweak future expression to call with '...' arguments ... DONE [18:41:44.405] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.406] [18:41:44.406] getGlobalsAndPackages() ... DONE [18:41:44.407] run() for 'Future' ... [18:41:44.407] - state: 'created' [18:41:44.407] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.408] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.409] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.409] - Field: 'label' [18:41:44.409] - Field: 'local' [18:41:44.410] - Field: 'owner' [18:41:44.410] - Field: 'envir' [18:41:44.410] - Field: 'packages' [18:41:44.411] - Field: 'gc' [18:41:44.411] - Field: 'conditions' [18:41:44.411] - Field: 'expr' [18:41:44.411] - Field: 'uuid' [18:41:44.412] - Field: 'seed' [18:41:44.412] - Field: 'version' [18:41:44.412] - Field: 'result' [18:41:44.413] - Field: 'asynchronous' [18:41:44.413] - Field: 'calls' [18:41:44.413] - Field: 'globals' [18:41:44.414] - Field: 'stdout' [18:41:44.414] - Field: 'earlySignal' [18:41:44.414] - Field: 'lazy' [18:41:44.415] - Field: 'state' [18:41:44.415] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.415] - Launch lazy future ... [18:41:44.416] Packages needed by the future expression (n = 0): [18:41:44.416] Packages needed by future strategies (n = 0): [18:41:44.417] { [18:41:44.417] { [18:41:44.417] { [18:41:44.417] ...future.startTime <- base::Sys.time() [18:41:44.417] { [18:41:44.417] { [18:41:44.417] { [18:41:44.417] base::local({ [18:41:44.417] has_future <- base::requireNamespace("future", [18:41:44.417] quietly = TRUE) [18:41:44.417] if (has_future) { [18:41:44.417] ns <- base::getNamespace("future") [18:41:44.417] version <- ns[[".package"]][["version"]] [18:41:44.417] if (is.null(version)) [18:41:44.417] version <- utils::packageVersion("future") [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] version <- NULL [18:41:44.417] } [18:41:44.417] if (!has_future || version < "1.8.0") { [18:41:44.417] info <- base::c(r_version = base::gsub("R version ", [18:41:44.417] "", base::R.version$version.string), [18:41:44.417] platform = base::sprintf("%s (%s-bit)", [18:41:44.417] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.417] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.417] "release", "version")], collapse = " "), [18:41:44.417] hostname = base::Sys.info()[["nodename"]]) [18:41:44.417] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.417] info) [18:41:44.417] info <- base::paste(info, collapse = "; ") [18:41:44.417] if (!has_future) { [18:41:44.417] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.417] info) [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.417] info, version) [18:41:44.417] } [18:41:44.417] base::stop(msg) [18:41:44.417] } [18:41:44.417] }) [18:41:44.417] } [18:41:44.417] ...future.strategy.old <- future::plan("list") [18:41:44.417] options(future.plan = NULL) [18:41:44.417] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.417] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.417] } [18:41:44.417] ...future.workdir <- getwd() [18:41:44.417] } [18:41:44.417] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.417] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.417] } [18:41:44.417] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.417] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.417] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.417] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.417] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.417] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.417] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.417] base::names(...future.oldOptions)) [18:41:44.417] } [18:41:44.417] if (FALSE) { [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] if (TRUE) { [18:41:44.417] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.417] open = "w") [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.417] windows = "NUL", "/dev/null"), open = "w") [18:41:44.417] } [18:41:44.417] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.417] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.417] base::sink(type = "output", split = FALSE) [18:41:44.417] base::close(...future.stdout) [18:41:44.417] }, add = TRUE) [18:41:44.417] } [18:41:44.417] ...future.frame <- base::sys.nframe() [18:41:44.417] ...future.conditions <- base::list() [18:41:44.417] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.417] if (FALSE) { [18:41:44.417] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.417] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.417] } [18:41:44.417] ...future.result <- base::tryCatch({ [18:41:44.417] base::withCallingHandlers({ [18:41:44.417] ...future.value <- base::withVisible(base::local({ [18:41:44.417] do.call(function(...) { [18:41:44.417] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.417] if (!identical(...future.globals.maxSize.org, [18:41:44.417] ...future.globals.maxSize)) { [18:41:44.417] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.417] on.exit(options(oopts), add = TRUE) [18:41:44.417] } [18:41:44.417] { [18:41:44.417] lapply(seq_along(...future.elements_ii), [18:41:44.417] FUN = function(jj) { [18:41:44.417] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.417] ...future.FUN(...future.X_jj, ...) [18:41:44.417] }) [18:41:44.417] } [18:41:44.417] }, args = future.call.arguments) [18:41:44.417] })) [18:41:44.417] future::FutureResult(value = ...future.value$value, [18:41:44.417] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.417] ...future.rng), globalenv = if (FALSE) [18:41:44.417] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.417] ...future.globalenv.names)) [18:41:44.417] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.417] }, condition = base::local({ [18:41:44.417] c <- base::c [18:41:44.417] inherits <- base::inherits [18:41:44.417] invokeRestart <- base::invokeRestart [18:41:44.417] length <- base::length [18:41:44.417] list <- base::list [18:41:44.417] seq.int <- base::seq.int [18:41:44.417] signalCondition <- base::signalCondition [18:41:44.417] sys.calls <- base::sys.calls [18:41:44.417] `[[` <- base::`[[` [18:41:44.417] `+` <- base::`+` [18:41:44.417] `<<-` <- base::`<<-` [18:41:44.417] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.417] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.417] 3L)] [18:41:44.417] } [18:41:44.417] function(cond) { [18:41:44.417] is_error <- inherits(cond, "error") [18:41:44.417] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.417] NULL) [18:41:44.417] if (is_error) { [18:41:44.417] sessionInformation <- function() { [18:41:44.417] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.417] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.417] search = base::search(), system = base::Sys.info()) [18:41:44.417] } [18:41:44.417] ...future.conditions[[length(...future.conditions) + [18:41:44.417] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.417] cond$call), session = sessionInformation(), [18:41:44.417] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.417] signalCondition(cond) [18:41:44.417] } [18:41:44.417] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.417] "immediateCondition"))) { [18:41:44.417] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.417] ...future.conditions[[length(...future.conditions) + [18:41:44.417] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.417] if (TRUE && !signal) { [18:41:44.417] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.417] { [18:41:44.417] inherits <- base::inherits [18:41:44.417] invokeRestart <- base::invokeRestart [18:41:44.417] is.null <- base::is.null [18:41:44.417] muffled <- FALSE [18:41:44.417] if (inherits(cond, "message")) { [18:41:44.417] muffled <- grepl(pattern, "muffleMessage") [18:41:44.417] if (muffled) [18:41:44.417] invokeRestart("muffleMessage") [18:41:44.417] } [18:41:44.417] else if (inherits(cond, "warning")) { [18:41:44.417] muffled <- grepl(pattern, "muffleWarning") [18:41:44.417] if (muffled) [18:41:44.417] invokeRestart("muffleWarning") [18:41:44.417] } [18:41:44.417] else if (inherits(cond, "condition")) { [18:41:44.417] if (!is.null(pattern)) { [18:41:44.417] computeRestarts <- base::computeRestarts [18:41:44.417] grepl <- base::grepl [18:41:44.417] restarts <- computeRestarts(cond) [18:41:44.417] for (restart in restarts) { [18:41:44.417] name <- restart$name [18:41:44.417] if (is.null(name)) [18:41:44.417] next [18:41:44.417] if (!grepl(pattern, name)) [18:41:44.417] next [18:41:44.417] invokeRestart(restart) [18:41:44.417] muffled <- TRUE [18:41:44.417] break [18:41:44.417] } [18:41:44.417] } [18:41:44.417] } [18:41:44.417] invisible(muffled) [18:41:44.417] } [18:41:44.417] muffleCondition(cond, pattern = "^muffle") [18:41:44.417] } [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] if (TRUE) { [18:41:44.417] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.417] { [18:41:44.417] inherits <- base::inherits [18:41:44.417] invokeRestart <- base::invokeRestart [18:41:44.417] is.null <- base::is.null [18:41:44.417] muffled <- FALSE [18:41:44.417] if (inherits(cond, "message")) { [18:41:44.417] muffled <- grepl(pattern, "muffleMessage") [18:41:44.417] if (muffled) [18:41:44.417] invokeRestart("muffleMessage") [18:41:44.417] } [18:41:44.417] else if (inherits(cond, "warning")) { [18:41:44.417] muffled <- grepl(pattern, "muffleWarning") [18:41:44.417] if (muffled) [18:41:44.417] invokeRestart("muffleWarning") [18:41:44.417] } [18:41:44.417] else if (inherits(cond, "condition")) { [18:41:44.417] if (!is.null(pattern)) { [18:41:44.417] computeRestarts <- base::computeRestarts [18:41:44.417] grepl <- base::grepl [18:41:44.417] restarts <- computeRestarts(cond) [18:41:44.417] for (restart in restarts) { [18:41:44.417] name <- restart$name [18:41:44.417] if (is.null(name)) [18:41:44.417] next [18:41:44.417] if (!grepl(pattern, name)) [18:41:44.417] next [18:41:44.417] invokeRestart(restart) [18:41:44.417] muffled <- TRUE [18:41:44.417] break [18:41:44.417] } [18:41:44.417] } [18:41:44.417] } [18:41:44.417] invisible(muffled) [18:41:44.417] } [18:41:44.417] muffleCondition(cond, pattern = "^muffle") [18:41:44.417] } [18:41:44.417] } [18:41:44.417] } [18:41:44.417] })) [18:41:44.417] }, error = function(ex) { [18:41:44.417] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.417] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.417] ...future.rng), started = ...future.startTime, [18:41:44.417] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.417] version = "1.8"), class = "FutureResult") [18:41:44.417] }, finally = { [18:41:44.417] if (!identical(...future.workdir, getwd())) [18:41:44.417] setwd(...future.workdir) [18:41:44.417] { [18:41:44.417] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.417] ...future.oldOptions$nwarnings <- NULL [18:41:44.417] } [18:41:44.417] base::options(...future.oldOptions) [18:41:44.417] if (.Platform$OS.type == "windows") { [18:41:44.417] old_names <- names(...future.oldEnvVars) [18:41:44.417] envs <- base::Sys.getenv() [18:41:44.417] names <- names(envs) [18:41:44.417] common <- intersect(names, old_names) [18:41:44.417] added <- setdiff(names, old_names) [18:41:44.417] removed <- setdiff(old_names, names) [18:41:44.417] changed <- common[...future.oldEnvVars[common] != [18:41:44.417] envs[common]] [18:41:44.417] NAMES <- toupper(changed) [18:41:44.417] args <- list() [18:41:44.417] for (kk in seq_along(NAMES)) { [18:41:44.417] name <- changed[[kk]] [18:41:44.417] NAME <- NAMES[[kk]] [18:41:44.417] if (name != NAME && is.element(NAME, old_names)) [18:41:44.417] next [18:41:44.417] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.417] } [18:41:44.417] NAMES <- toupper(added) [18:41:44.417] for (kk in seq_along(NAMES)) { [18:41:44.417] name <- added[[kk]] [18:41:44.417] NAME <- NAMES[[kk]] [18:41:44.417] if (name != NAME && is.element(NAME, old_names)) [18:41:44.417] next [18:41:44.417] args[[name]] <- "" [18:41:44.417] } [18:41:44.417] NAMES <- toupper(removed) [18:41:44.417] for (kk in seq_along(NAMES)) { [18:41:44.417] name <- removed[[kk]] [18:41:44.417] NAME <- NAMES[[kk]] [18:41:44.417] if (name != NAME && is.element(NAME, old_names)) [18:41:44.417] next [18:41:44.417] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.417] } [18:41:44.417] if (length(args) > 0) [18:41:44.417] base::do.call(base::Sys.setenv, args = args) [18:41:44.417] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.417] } [18:41:44.417] { [18:41:44.417] if (base::length(...future.futureOptionsAdded) > [18:41:44.417] 0L) { [18:41:44.417] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.417] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.417] base::options(opts) [18:41:44.417] } [18:41:44.417] { [18:41:44.417] { [18:41:44.417] NULL [18:41:44.417] RNGkind("Mersenne-Twister") [18:41:44.417] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.417] inherits = FALSE) [18:41:44.417] } [18:41:44.417] options(future.plan = NULL) [18:41:44.417] if (is.na(NA_character_)) [18:41:44.417] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.417] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.417] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.417] .init = FALSE) [18:41:44.417] } [18:41:44.417] } [18:41:44.417] } [18:41:44.417] }) [18:41:44.417] if (TRUE) { [18:41:44.417] base::sink(type = "output", split = FALSE) [18:41:44.417] if (TRUE) { [18:41:44.417] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.417] } [18:41:44.417] else { [18:41:44.417] ...future.result["stdout"] <- base::list(NULL) [18:41:44.417] } [18:41:44.417] base::close(...future.stdout) [18:41:44.417] ...future.stdout <- NULL [18:41:44.417] } [18:41:44.417] ...future.result$conditions <- ...future.conditions [18:41:44.417] ...future.result$finished <- base::Sys.time() [18:41:44.417] ...future.result [18:41:44.417] } [18:41:44.424] assign_globals() ... [18:41:44.424] List of 5 [18:41:44.424] $ ...future.FUN :function (x, ...) [18:41:44.424] $ future.call.arguments : list() [18:41:44.424] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.424] $ ...future.elements_ii :List of 4 [18:41:44.424] ..$ A: num 50 [18:41:44.424] ..$ B: num 60 [18:41:44.424] ..$ C: num 70 [18:41:44.424] ..$ D: num 80 [18:41:44.424] $ ...future.seeds_ii : NULL [18:41:44.424] $ ...future.globals.maxSize: NULL [18:41:44.424] - attr(*, "where")=List of 5 [18:41:44.424] ..$ ...future.FUN : [18:41:44.424] ..$ future.call.arguments : [18:41:44.424] ..$ ...future.elements_ii : [18:41:44.424] ..$ ...future.seeds_ii : [18:41:44.424] ..$ ...future.globals.maxSize: [18:41:44.424] - attr(*, "resolved")= logi FALSE [18:41:44.424] - attr(*, "total_size")= num 5150 [18:41:44.424] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.424] - attr(*, "already-done")= logi TRUE [18:41:44.437] - copied '...future.FUN' to environment [18:41:44.437] - copied 'future.call.arguments' to environment [18:41:44.437] - copied '...future.elements_ii' to environment [18:41:44.438] - copied '...future.seeds_ii' to environment [18:41:44.438] - copied '...future.globals.maxSize' to environment [18:41:44.438] assign_globals() ... done [18:41:44.439] plan(): Setting new future strategy stack: [18:41:44.439] List of future strategies: [18:41:44.439] 1. sequential: [18:41:44.439] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.439] - tweaked: FALSE [18:41:44.439] - call: NULL [18:41:44.440] plan(): nbrOfWorkers() = 1 [18:41:44.443] plan(): Setting new future strategy stack: [18:41:44.443] List of future strategies: [18:41:44.443] 1. sequential: [18:41:44.443] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.443] - tweaked: FALSE [18:41:44.443] - call: plan(strategy) [18:41:44.444] plan(): nbrOfWorkers() = 1 [18:41:44.444] SequentialFuture started (and completed) [18:41:44.445] - Launch lazy future ... done [18:41:44.445] run() for 'SequentialFuture' ... done [18:41:44.445] Created future: [18:41:44.446] SequentialFuture: [18:41:44.446] Label: 'future_sapply-1' [18:41:44.446] Expression: [18:41:44.446] { [18:41:44.446] do.call(function(...) { [18:41:44.446] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.446] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.446] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.446] on.exit(options(oopts), add = TRUE) [18:41:44.446] } [18:41:44.446] { [18:41:44.446] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.446] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.446] ...future.FUN(...future.X_jj, ...) [18:41:44.446] }) [18:41:44.446] } [18:41:44.446] }, args = future.call.arguments) [18:41:44.446] } [18:41:44.446] Lazy evaluation: FALSE [18:41:44.446] Asynchronous evaluation: FALSE [18:41:44.446] Local evaluation: TRUE [18:41:44.446] Environment: R_GlobalEnv [18:41:44.446] Capture standard output: TRUE [18:41:44.446] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.446] Globals: 5 objects totaling 593 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.446] Packages: [18:41:44.446] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.446] Resolved: TRUE [18:41:44.446] Value: 218 bytes of class 'list' [18:41:44.446] Early signaling: FALSE [18:41:44.446] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.446] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.448] Chunk #1 of 1 ... DONE [18:41:44.448] Launching 1 futures (chunks) ... DONE [18:41:44.448] Resolving 1 futures (chunks) ... [18:41:44.449] resolve() on list ... [18:41:44.449] recursive: 0 [18:41:44.449] length: 1 [18:41:44.449] [18:41:44.450] resolved() for 'SequentialFuture' ... [18:41:44.450] - state: 'finished' [18:41:44.450] - run: TRUE [18:41:44.451] - result: 'FutureResult' [18:41:44.451] resolved() for 'SequentialFuture' ... done [18:41:44.451] Future #1 [18:41:44.452] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.452] - nx: 1 [18:41:44.452] - relay: TRUE [18:41:44.452] - stdout: TRUE [18:41:44.453] - signal: TRUE [18:41:44.453] - resignal: FALSE [18:41:44.453] - force: TRUE [18:41:44.453] - relayed: [n=1] FALSE [18:41:44.454] - queued futures: [n=1] FALSE [18:41:44.454] - until=1 [18:41:44.454] - relaying element #1 [18:41:44.455] - relayed: [n=1] TRUE [18:41:44.455] - queued futures: [n=1] TRUE [18:41:44.455] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.456] length: 0 (resolved future 1) [18:41:44.456] Relaying remaining futures [18:41:44.456] signalConditionsASAP(NULL, pos=0) ... [18:41:44.457] - nx: 1 [18:41:44.457] - relay: TRUE [18:41:44.457] - stdout: TRUE [18:41:44.457] - signal: TRUE [18:41:44.458] - resignal: FALSE [18:41:44.458] - force: TRUE [18:41:44.458] - relayed: [n=1] TRUE [18:41:44.458] - queued futures: [n=1] TRUE - flush all [18:41:44.459] - relayed: [n=1] TRUE [18:41:44.459] - queued futures: [n=1] TRUE [18:41:44.459] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.460] resolve() on list ... DONE [18:41:44.460] - Number of value chunks collected: 1 [18:41:44.460] Resolving 1 futures (chunks) ... DONE [18:41:44.461] Reducing values from 1 chunks ... [18:41:44.461] - Number of values collected after concatenation: 4 [18:41:44.461] - Number of values expected: 4 [18:41:44.461] Reducing values from 1 chunks ... DONE [18:41:44.462] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:44.465] future_lapply() ... [18:41:44.467] Number of chunks: 1 [18:41:44.467] getGlobalsAndPackagesXApply() ... [18:41:44.468] - future.globals: TRUE [18:41:44.468] getGlobalsAndPackages() ... [18:41:44.468] Searching for globals... [18:41:44.471] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:44.471] Searching for globals ... DONE [18:41:44.472] Resolving globals: FALSE [18:41:44.473] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:44.473] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:44.474] - globals: [1] 'FUN' [18:41:44.474] [18:41:44.474] getGlobalsAndPackages() ... DONE [18:41:44.475] - globals found/used: [n=1] 'FUN' [18:41:44.475] - needed namespaces: [n=0] [18:41:44.475] Finding globals ... DONE [18:41:44.475] - use_args: TRUE [18:41:44.476] - Getting '...' globals ... [18:41:44.476] resolve() on list ... [18:41:44.477] recursive: 0 [18:41:44.477] length: 1 [18:41:44.477] elements: '...' [18:41:44.478] length: 0 (resolved future 1) [18:41:44.478] resolve() on list ... DONE [18:41:44.478] - '...' content: [n=0] [18:41:44.479] List of 1 [18:41:44.479] $ ...: list() [18:41:44.479] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.479] - attr(*, "where")=List of 1 [18:41:44.479] ..$ ...: [18:41:44.479] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.479] - attr(*, "resolved")= logi TRUE [18:41:44.479] - attr(*, "total_size")= num NA [18:41:44.483] - Getting '...' globals ... DONE [18:41:44.484] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.484] List of 2 [18:41:44.484] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:44.484] $ ... : list() [18:41:44.484] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.484] - attr(*, "where")=List of 2 [18:41:44.484] ..$ ...future.FUN: [18:41:44.484] ..$ ... : [18:41:44.484] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.484] - attr(*, "resolved")= logi FALSE [18:41:44.484] - attr(*, "total_size")= int 6632 [18:41:44.490] Packages to be attached in all futures: [n=0] [18:41:44.490] getGlobalsAndPackagesXApply() ... DONE [18:41:44.491] Number of futures (= number of chunks): 1 [18:41:44.491] Launching 1 futures (chunks) ... [18:41:44.491] Chunk #1 of 1 ... [18:41:44.492] - Finding globals in 'X' for chunk #1 ... [18:41:44.492] getGlobalsAndPackages() ... [18:41:44.492] Searching for globals... [18:41:44.493] [18:41:44.493] Searching for globals ... DONE [18:41:44.493] - globals: [0] [18:41:44.494] getGlobalsAndPackages() ... DONE [18:41:44.494] + additional globals found: [n=0] [18:41:44.494] + additional namespaces needed: [n=0] [18:41:44.494] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.495] - seeds: [18:41:44.495] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.495] getGlobalsAndPackages() ... [18:41:44.495] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.496] Resolving globals: FALSE [18:41:44.496] Tweak future expression to call with '...' arguments ... [18:41:44.496] { [18:41:44.496] do.call(function(...) { [18:41:44.496] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.496] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.496] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.496] on.exit(options(oopts), add = TRUE) [18:41:44.496] } [18:41:44.496] { [18:41:44.496] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.496] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.496] ...future.FUN(...future.X_jj, ...) [18:41:44.496] }) [18:41:44.496] } [18:41:44.496] }, args = future.call.arguments) [18:41:44.496] } [18:41:44.497] Tweak future expression to call with '...' arguments ... DONE [18:41:44.498] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.498] [18:41:44.498] getGlobalsAndPackages() ... DONE [18:41:44.499] run() for 'Future' ... [18:41:44.499] - state: 'created' [18:41:44.500] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.500] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.501] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.501] - Field: 'label' [18:41:44.501] - Field: 'local' [18:41:44.501] - Field: 'owner' [18:41:44.502] - Field: 'envir' [18:41:44.502] - Field: 'packages' [18:41:44.502] - Field: 'gc' [18:41:44.503] - Field: 'conditions' [18:41:44.503] - Field: 'expr' [18:41:44.503] - Field: 'uuid' [18:41:44.504] - Field: 'seed' [18:41:44.504] - Field: 'version' [18:41:44.504] - Field: 'result' [18:41:44.504] - Field: 'asynchronous' [18:41:44.505] - Field: 'calls' [18:41:44.505] - Field: 'globals' [18:41:44.505] - Field: 'stdout' [18:41:44.506] - Field: 'earlySignal' [18:41:44.506] - Field: 'lazy' [18:41:44.506] - Field: 'state' [18:41:44.506] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.507] - Launch lazy future ... [18:41:44.507] Packages needed by the future expression (n = 0): [18:41:44.507] Packages needed by future strategies (n = 0): [18:41:44.508] { [18:41:44.508] { [18:41:44.508] { [18:41:44.508] ...future.startTime <- base::Sys.time() [18:41:44.508] { [18:41:44.508] { [18:41:44.508] { [18:41:44.508] base::local({ [18:41:44.508] has_future <- base::requireNamespace("future", [18:41:44.508] quietly = TRUE) [18:41:44.508] if (has_future) { [18:41:44.508] ns <- base::getNamespace("future") [18:41:44.508] version <- ns[[".package"]][["version"]] [18:41:44.508] if (is.null(version)) [18:41:44.508] version <- utils::packageVersion("future") [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] version <- NULL [18:41:44.508] } [18:41:44.508] if (!has_future || version < "1.8.0") { [18:41:44.508] info <- base::c(r_version = base::gsub("R version ", [18:41:44.508] "", base::R.version$version.string), [18:41:44.508] platform = base::sprintf("%s (%s-bit)", [18:41:44.508] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.508] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.508] "release", "version")], collapse = " "), [18:41:44.508] hostname = base::Sys.info()[["nodename"]]) [18:41:44.508] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.508] info) [18:41:44.508] info <- base::paste(info, collapse = "; ") [18:41:44.508] if (!has_future) { [18:41:44.508] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.508] info) [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.508] info, version) [18:41:44.508] } [18:41:44.508] base::stop(msg) [18:41:44.508] } [18:41:44.508] }) [18:41:44.508] } [18:41:44.508] ...future.strategy.old <- future::plan("list") [18:41:44.508] options(future.plan = NULL) [18:41:44.508] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.508] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.508] } [18:41:44.508] ...future.workdir <- getwd() [18:41:44.508] } [18:41:44.508] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.508] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.508] } [18:41:44.508] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.508] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.508] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.508] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.508] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.508] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.508] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.508] base::names(...future.oldOptions)) [18:41:44.508] } [18:41:44.508] if (FALSE) { [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] if (TRUE) { [18:41:44.508] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.508] open = "w") [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.508] windows = "NUL", "/dev/null"), open = "w") [18:41:44.508] } [18:41:44.508] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.508] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.508] base::sink(type = "output", split = FALSE) [18:41:44.508] base::close(...future.stdout) [18:41:44.508] }, add = TRUE) [18:41:44.508] } [18:41:44.508] ...future.frame <- base::sys.nframe() [18:41:44.508] ...future.conditions <- base::list() [18:41:44.508] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.508] if (FALSE) { [18:41:44.508] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.508] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.508] } [18:41:44.508] ...future.result <- base::tryCatch({ [18:41:44.508] base::withCallingHandlers({ [18:41:44.508] ...future.value <- base::withVisible(base::local({ [18:41:44.508] do.call(function(...) { [18:41:44.508] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.508] if (!identical(...future.globals.maxSize.org, [18:41:44.508] ...future.globals.maxSize)) { [18:41:44.508] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.508] on.exit(options(oopts), add = TRUE) [18:41:44.508] } [18:41:44.508] { [18:41:44.508] lapply(seq_along(...future.elements_ii), [18:41:44.508] FUN = function(jj) { [18:41:44.508] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.508] ...future.FUN(...future.X_jj, ...) [18:41:44.508] }) [18:41:44.508] } [18:41:44.508] }, args = future.call.arguments) [18:41:44.508] })) [18:41:44.508] future::FutureResult(value = ...future.value$value, [18:41:44.508] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.508] ...future.rng), globalenv = if (FALSE) [18:41:44.508] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.508] ...future.globalenv.names)) [18:41:44.508] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.508] }, condition = base::local({ [18:41:44.508] c <- base::c [18:41:44.508] inherits <- base::inherits [18:41:44.508] invokeRestart <- base::invokeRestart [18:41:44.508] length <- base::length [18:41:44.508] list <- base::list [18:41:44.508] seq.int <- base::seq.int [18:41:44.508] signalCondition <- base::signalCondition [18:41:44.508] sys.calls <- base::sys.calls [18:41:44.508] `[[` <- base::`[[` [18:41:44.508] `+` <- base::`+` [18:41:44.508] `<<-` <- base::`<<-` [18:41:44.508] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.508] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.508] 3L)] [18:41:44.508] } [18:41:44.508] function(cond) { [18:41:44.508] is_error <- inherits(cond, "error") [18:41:44.508] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.508] NULL) [18:41:44.508] if (is_error) { [18:41:44.508] sessionInformation <- function() { [18:41:44.508] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.508] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.508] search = base::search(), system = base::Sys.info()) [18:41:44.508] } [18:41:44.508] ...future.conditions[[length(...future.conditions) + [18:41:44.508] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.508] cond$call), session = sessionInformation(), [18:41:44.508] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.508] signalCondition(cond) [18:41:44.508] } [18:41:44.508] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.508] "immediateCondition"))) { [18:41:44.508] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.508] ...future.conditions[[length(...future.conditions) + [18:41:44.508] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.508] if (TRUE && !signal) { [18:41:44.508] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.508] { [18:41:44.508] inherits <- base::inherits [18:41:44.508] invokeRestart <- base::invokeRestart [18:41:44.508] is.null <- base::is.null [18:41:44.508] muffled <- FALSE [18:41:44.508] if (inherits(cond, "message")) { [18:41:44.508] muffled <- grepl(pattern, "muffleMessage") [18:41:44.508] if (muffled) [18:41:44.508] invokeRestart("muffleMessage") [18:41:44.508] } [18:41:44.508] else if (inherits(cond, "warning")) { [18:41:44.508] muffled <- grepl(pattern, "muffleWarning") [18:41:44.508] if (muffled) [18:41:44.508] invokeRestart("muffleWarning") [18:41:44.508] } [18:41:44.508] else if (inherits(cond, "condition")) { [18:41:44.508] if (!is.null(pattern)) { [18:41:44.508] computeRestarts <- base::computeRestarts [18:41:44.508] grepl <- base::grepl [18:41:44.508] restarts <- computeRestarts(cond) [18:41:44.508] for (restart in restarts) { [18:41:44.508] name <- restart$name [18:41:44.508] if (is.null(name)) [18:41:44.508] next [18:41:44.508] if (!grepl(pattern, name)) [18:41:44.508] next [18:41:44.508] invokeRestart(restart) [18:41:44.508] muffled <- TRUE [18:41:44.508] break [18:41:44.508] } [18:41:44.508] } [18:41:44.508] } [18:41:44.508] invisible(muffled) [18:41:44.508] } [18:41:44.508] muffleCondition(cond, pattern = "^muffle") [18:41:44.508] } [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] if (TRUE) { [18:41:44.508] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.508] { [18:41:44.508] inherits <- base::inherits [18:41:44.508] invokeRestart <- base::invokeRestart [18:41:44.508] is.null <- base::is.null [18:41:44.508] muffled <- FALSE [18:41:44.508] if (inherits(cond, "message")) { [18:41:44.508] muffled <- grepl(pattern, "muffleMessage") [18:41:44.508] if (muffled) [18:41:44.508] invokeRestart("muffleMessage") [18:41:44.508] } [18:41:44.508] else if (inherits(cond, "warning")) { [18:41:44.508] muffled <- grepl(pattern, "muffleWarning") [18:41:44.508] if (muffled) [18:41:44.508] invokeRestart("muffleWarning") [18:41:44.508] } [18:41:44.508] else if (inherits(cond, "condition")) { [18:41:44.508] if (!is.null(pattern)) { [18:41:44.508] computeRestarts <- base::computeRestarts [18:41:44.508] grepl <- base::grepl [18:41:44.508] restarts <- computeRestarts(cond) [18:41:44.508] for (restart in restarts) { [18:41:44.508] name <- restart$name [18:41:44.508] if (is.null(name)) [18:41:44.508] next [18:41:44.508] if (!grepl(pattern, name)) [18:41:44.508] next [18:41:44.508] invokeRestart(restart) [18:41:44.508] muffled <- TRUE [18:41:44.508] break [18:41:44.508] } [18:41:44.508] } [18:41:44.508] } [18:41:44.508] invisible(muffled) [18:41:44.508] } [18:41:44.508] muffleCondition(cond, pattern = "^muffle") [18:41:44.508] } [18:41:44.508] } [18:41:44.508] } [18:41:44.508] })) [18:41:44.508] }, error = function(ex) { [18:41:44.508] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.508] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.508] ...future.rng), started = ...future.startTime, [18:41:44.508] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.508] version = "1.8"), class = "FutureResult") [18:41:44.508] }, finally = { [18:41:44.508] if (!identical(...future.workdir, getwd())) [18:41:44.508] setwd(...future.workdir) [18:41:44.508] { [18:41:44.508] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.508] ...future.oldOptions$nwarnings <- NULL [18:41:44.508] } [18:41:44.508] base::options(...future.oldOptions) [18:41:44.508] if (.Platform$OS.type == "windows") { [18:41:44.508] old_names <- names(...future.oldEnvVars) [18:41:44.508] envs <- base::Sys.getenv() [18:41:44.508] names <- names(envs) [18:41:44.508] common <- intersect(names, old_names) [18:41:44.508] added <- setdiff(names, old_names) [18:41:44.508] removed <- setdiff(old_names, names) [18:41:44.508] changed <- common[...future.oldEnvVars[common] != [18:41:44.508] envs[common]] [18:41:44.508] NAMES <- toupper(changed) [18:41:44.508] args <- list() [18:41:44.508] for (kk in seq_along(NAMES)) { [18:41:44.508] name <- changed[[kk]] [18:41:44.508] NAME <- NAMES[[kk]] [18:41:44.508] if (name != NAME && is.element(NAME, old_names)) [18:41:44.508] next [18:41:44.508] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.508] } [18:41:44.508] NAMES <- toupper(added) [18:41:44.508] for (kk in seq_along(NAMES)) { [18:41:44.508] name <- added[[kk]] [18:41:44.508] NAME <- NAMES[[kk]] [18:41:44.508] if (name != NAME && is.element(NAME, old_names)) [18:41:44.508] next [18:41:44.508] args[[name]] <- "" [18:41:44.508] } [18:41:44.508] NAMES <- toupper(removed) [18:41:44.508] for (kk in seq_along(NAMES)) { [18:41:44.508] name <- removed[[kk]] [18:41:44.508] NAME <- NAMES[[kk]] [18:41:44.508] if (name != NAME && is.element(NAME, old_names)) [18:41:44.508] next [18:41:44.508] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.508] } [18:41:44.508] if (length(args) > 0) [18:41:44.508] base::do.call(base::Sys.setenv, args = args) [18:41:44.508] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.508] } [18:41:44.508] { [18:41:44.508] if (base::length(...future.futureOptionsAdded) > [18:41:44.508] 0L) { [18:41:44.508] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.508] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.508] base::options(opts) [18:41:44.508] } [18:41:44.508] { [18:41:44.508] { [18:41:44.508] NULL [18:41:44.508] RNGkind("Mersenne-Twister") [18:41:44.508] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.508] inherits = FALSE) [18:41:44.508] } [18:41:44.508] options(future.plan = NULL) [18:41:44.508] if (is.na(NA_character_)) [18:41:44.508] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.508] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.508] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.508] .init = FALSE) [18:41:44.508] } [18:41:44.508] } [18:41:44.508] } [18:41:44.508] }) [18:41:44.508] if (TRUE) { [18:41:44.508] base::sink(type = "output", split = FALSE) [18:41:44.508] if (TRUE) { [18:41:44.508] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.508] } [18:41:44.508] else { [18:41:44.508] ...future.result["stdout"] <- base::list(NULL) [18:41:44.508] } [18:41:44.508] base::close(...future.stdout) [18:41:44.508] ...future.stdout <- NULL [18:41:44.508] } [18:41:44.508] ...future.result$conditions <- ...future.conditions [18:41:44.508] ...future.result$finished <- base::Sys.time() [18:41:44.508] ...future.result [18:41:44.508] } [18:41:44.514] assign_globals() ... [18:41:44.515] List of 5 [18:41:44.515] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:44.515] $ future.call.arguments : list() [18:41:44.515] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.515] $ ...future.elements_ii :List of 4 [18:41:44.515] ..$ A: num 50 [18:41:44.515] ..$ B: num 60 [18:41:44.515] ..$ C: num 70 [18:41:44.515] ..$ D: num 80 [18:41:44.515] $ ...future.seeds_ii : NULL [18:41:44.515] $ ...future.globals.maxSize: NULL [18:41:44.515] - attr(*, "where")=List of 5 [18:41:44.515] ..$ ...future.FUN : [18:41:44.515] ..$ future.call.arguments : [18:41:44.515] ..$ ...future.elements_ii : [18:41:44.515] ..$ ...future.seeds_ii : [18:41:44.515] ..$ ...future.globals.maxSize: [18:41:44.515] - attr(*, "resolved")= logi FALSE [18:41:44.515] - attr(*, "total_size")= num 6632 [18:41:44.515] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.515] - attr(*, "already-done")= logi TRUE [18:41:44.526] - reassign environment for '...future.FUN' [18:41:44.527] - copied '...future.FUN' to environment [18:41:44.527] - copied 'future.call.arguments' to environment [18:41:44.527] - copied '...future.elements_ii' to environment [18:41:44.528] - copied '...future.seeds_ii' to environment [18:41:44.528] - copied '...future.globals.maxSize' to environment [18:41:44.528] assign_globals() ... done [18:41:44.529] plan(): Setting new future strategy stack: [18:41:44.529] List of future strategies: [18:41:44.529] 1. sequential: [18:41:44.529] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.529] - tweaked: FALSE [18:41:44.529] - call: NULL [18:41:44.530] plan(): nbrOfWorkers() = 1 [18:41:44.532] plan(): Setting new future strategy stack: [18:41:44.532] List of future strategies: [18:41:44.532] 1. sequential: [18:41:44.532] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.532] - tweaked: FALSE [18:41:44.532] - call: plan(strategy) [18:41:44.533] plan(): nbrOfWorkers() = 1 [18:41:44.534] SequentialFuture started (and completed) [18:41:44.534] - Launch lazy future ... done [18:41:44.534] run() for 'SequentialFuture' ... done [18:41:44.535] Created future: [18:41:44.535] SequentialFuture: [18:41:44.535] Label: 'future_sapply-1' [18:41:44.535] Expression: [18:41:44.535] { [18:41:44.535] do.call(function(...) { [18:41:44.535] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.535] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.535] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.535] on.exit(options(oopts), add = TRUE) [18:41:44.535] } [18:41:44.535] { [18:41:44.535] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.535] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.535] ...future.FUN(...future.X_jj, ...) [18:41:44.535] }) [18:41:44.535] } [18:41:44.535] }, args = future.call.arguments) [18:41:44.535] } [18:41:44.535] Lazy evaluation: FALSE [18:41:44.535] Asynchronous evaluation: FALSE [18:41:44.535] Local evaluation: TRUE [18:41:44.535] Environment: R_GlobalEnv [18:41:44.535] Capture standard output: TRUE [18:41:44.535] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.535] Globals: 5 objects totaling 1.07 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.535] Packages: [18:41:44.535] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.535] Resolved: TRUE [18:41:44.535] Value: 666 bytes of class 'list' [18:41:44.535] Early signaling: FALSE [18:41:44.535] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.535] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.537] Chunk #1 of 1 ... DONE [18:41:44.537] Launching 1 futures (chunks) ... DONE [18:41:44.537] Resolving 1 futures (chunks) ... [18:41:44.538] resolve() on list ... [18:41:44.538] recursive: 0 [18:41:44.538] length: 1 [18:41:44.539] [18:41:44.539] resolved() for 'SequentialFuture' ... [18:41:44.539] - state: 'finished' [18:41:44.539] - run: TRUE [18:41:44.540] - result: 'FutureResult' [18:41:44.540] resolved() for 'SequentialFuture' ... done [18:41:44.540] Future #1 [18:41:44.541] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.541] - nx: 1 [18:41:44.541] - relay: TRUE [18:41:44.541] - stdout: TRUE [18:41:44.542] - signal: TRUE [18:41:44.542] - resignal: FALSE [18:41:44.542] - force: TRUE [18:41:44.542] - relayed: [n=1] FALSE [18:41:44.543] - queued futures: [n=1] FALSE [18:41:44.543] - until=1 [18:41:44.543] - relaying element #1 [18:41:44.544] - relayed: [n=1] TRUE [18:41:44.544] - queued futures: [n=1] TRUE [18:41:44.544] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.544] length: 0 (resolved future 1) [18:41:44.545] Relaying remaining futures [18:41:44.545] signalConditionsASAP(NULL, pos=0) ... [18:41:44.545] - nx: 1 [18:41:44.545] - relay: TRUE [18:41:44.546] - stdout: TRUE [18:41:44.546] - signal: TRUE [18:41:44.546] - resignal: FALSE [18:41:44.546] - force: TRUE [18:41:44.547] - relayed: [n=1] TRUE [18:41:44.547] - queued futures: [n=1] TRUE - flush all [18:41:44.547] - relayed: [n=1] TRUE [18:41:44.547] - queued futures: [n=1] TRUE [18:41:44.548] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.548] resolve() on list ... DONE [18:41:44.552] - Number of value chunks collected: 1 [18:41:44.552] Resolving 1 futures (chunks) ... DONE [18:41:44.552] Reducing values from 1 chunks ... [18:41:44.553] - Number of values collected after concatenation: 4 [18:41:44.553] - Number of values expected: 4 [18:41:44.553] Reducing values from 1 chunks ... DONE [18:41:44.554] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:44.560] future_lapply() ... [18:41:44.561] Number of chunks: 1 [18:41:44.561] getGlobalsAndPackagesXApply() ... [18:41:44.561] - future.globals: TRUE [18:41:44.561] getGlobalsAndPackages() ... [18:41:44.562] Searching for globals... [18:41:44.563] - globals found: [1] 'FUN' [18:41:44.564] Searching for globals ... DONE [18:41:44.564] Resolving globals: FALSE [18:41:44.564] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:44.565] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:44.565] - globals: [1] 'FUN' [18:41:44.566] [18:41:44.566] getGlobalsAndPackages() ... DONE [18:41:44.566] - globals found/used: [n=1] 'FUN' [18:41:44.566] - needed namespaces: [n=0] [18:41:44.567] Finding globals ... DONE [18:41:44.567] - use_args: TRUE [18:41:44.567] - Getting '...' globals ... [18:41:44.568] resolve() on list ... [18:41:44.568] recursive: 0 [18:41:44.568] length: 1 [18:41:44.569] elements: '...' [18:41:44.569] length: 0 (resolved future 1) [18:41:44.569] resolve() on list ... DONE [18:41:44.569] - '...' content: [n=0] [18:41:44.570] List of 1 [18:41:44.570] $ ...: list() [18:41:44.570] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.570] - attr(*, "where")=List of 1 [18:41:44.570] ..$ ...: [18:41:44.570] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.570] - attr(*, "resolved")= logi TRUE [18:41:44.570] - attr(*, "total_size")= num NA [18:41:44.574] - Getting '...' globals ... DONE [18:41:44.575] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.575] List of 2 [18:41:44.575] $ ...future.FUN:function (x) [18:41:44.575] $ ... : list() [18:41:44.575] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.575] - attr(*, "where")=List of 2 [18:41:44.575] ..$ ...future.FUN: [18:41:44.575] ..$ ... : [18:41:44.575] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.575] - attr(*, "resolved")= logi FALSE [18:41:44.575] - attr(*, "total_size")= int 4910 [18:41:44.580] Packages to be attached in all futures: [n=0] [18:41:44.580] getGlobalsAndPackagesXApply() ... DONE [18:41:44.581] Number of futures (= number of chunks): 1 [18:41:44.581] Launching 1 futures (chunks) ... [18:41:44.581] Chunk #1 of 1 ... [18:41:44.582] - Finding globals in 'X' for chunk #1 ... [18:41:44.582] getGlobalsAndPackages() ... [18:41:44.582] Searching for globals... [18:41:44.583] [18:41:44.583] Searching for globals ... DONE [18:41:44.583] - globals: [0] [18:41:44.583] getGlobalsAndPackages() ... DONE [18:41:44.584] + additional globals found: [n=0] [18:41:44.584] + additional namespaces needed: [n=0] [18:41:44.584] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.584] - seeds: [18:41:44.585] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.585] getGlobalsAndPackages() ... [18:41:44.585] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.585] Resolving globals: FALSE [18:41:44.586] Tweak future expression to call with '...' arguments ... [18:41:44.586] { [18:41:44.586] do.call(function(...) { [18:41:44.586] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.586] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.586] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.586] on.exit(options(oopts), add = TRUE) [18:41:44.586] } [18:41:44.586] { [18:41:44.586] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.586] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.586] ...future.FUN(...future.X_jj, ...) [18:41:44.586] }) [18:41:44.586] } [18:41:44.586] }, args = future.call.arguments) [18:41:44.586] } [18:41:44.587] Tweak future expression to call with '...' arguments ... DONE [18:41:44.587] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.588] [18:41:44.588] getGlobalsAndPackages() ... DONE [18:41:44.588] run() for 'Future' ... [18:41:44.589] - state: 'created' [18:41:44.589] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.590] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.590] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.590] - Field: 'label' [18:41:44.591] - Field: 'local' [18:41:44.591] - Field: 'owner' [18:41:44.591] - Field: 'envir' [18:41:44.591] - Field: 'packages' [18:41:44.592] - Field: 'gc' [18:41:44.592] - Field: 'conditions' [18:41:44.592] - Field: 'expr' [18:41:44.593] - Field: 'uuid' [18:41:44.593] - Field: 'seed' [18:41:44.593] - Field: 'version' [18:41:44.593] - Field: 'result' [18:41:44.594] - Field: 'asynchronous' [18:41:44.594] - Field: 'calls' [18:41:44.594] - Field: 'globals' [18:41:44.594] - Field: 'stdout' [18:41:44.595] - Field: 'earlySignal' [18:41:44.595] - Field: 'lazy' [18:41:44.595] - Field: 'state' [18:41:44.596] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.596] - Launch lazy future ... [18:41:44.596] Packages needed by the future expression (n = 0): [18:41:44.597] Packages needed by future strategies (n = 0): [18:41:44.598] { [18:41:44.598] { [18:41:44.598] { [18:41:44.598] ...future.startTime <- base::Sys.time() [18:41:44.598] { [18:41:44.598] { [18:41:44.598] { [18:41:44.598] base::local({ [18:41:44.598] has_future <- base::requireNamespace("future", [18:41:44.598] quietly = TRUE) [18:41:44.598] if (has_future) { [18:41:44.598] ns <- base::getNamespace("future") [18:41:44.598] version <- ns[[".package"]][["version"]] [18:41:44.598] if (is.null(version)) [18:41:44.598] version <- utils::packageVersion("future") [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] version <- NULL [18:41:44.598] } [18:41:44.598] if (!has_future || version < "1.8.0") { [18:41:44.598] info <- base::c(r_version = base::gsub("R version ", [18:41:44.598] "", base::R.version$version.string), [18:41:44.598] platform = base::sprintf("%s (%s-bit)", [18:41:44.598] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.598] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.598] "release", "version")], collapse = " "), [18:41:44.598] hostname = base::Sys.info()[["nodename"]]) [18:41:44.598] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.598] info) [18:41:44.598] info <- base::paste(info, collapse = "; ") [18:41:44.598] if (!has_future) { [18:41:44.598] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.598] info) [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.598] info, version) [18:41:44.598] } [18:41:44.598] base::stop(msg) [18:41:44.598] } [18:41:44.598] }) [18:41:44.598] } [18:41:44.598] ...future.strategy.old <- future::plan("list") [18:41:44.598] options(future.plan = NULL) [18:41:44.598] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.598] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.598] } [18:41:44.598] ...future.workdir <- getwd() [18:41:44.598] } [18:41:44.598] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.598] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.598] } [18:41:44.598] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.598] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.598] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.598] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.598] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.598] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.598] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.598] base::names(...future.oldOptions)) [18:41:44.598] } [18:41:44.598] if (FALSE) { [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] if (TRUE) { [18:41:44.598] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.598] open = "w") [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.598] windows = "NUL", "/dev/null"), open = "w") [18:41:44.598] } [18:41:44.598] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.598] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.598] base::sink(type = "output", split = FALSE) [18:41:44.598] base::close(...future.stdout) [18:41:44.598] }, add = TRUE) [18:41:44.598] } [18:41:44.598] ...future.frame <- base::sys.nframe() [18:41:44.598] ...future.conditions <- base::list() [18:41:44.598] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.598] if (FALSE) { [18:41:44.598] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.598] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.598] } [18:41:44.598] ...future.result <- base::tryCatch({ [18:41:44.598] base::withCallingHandlers({ [18:41:44.598] ...future.value <- base::withVisible(base::local({ [18:41:44.598] do.call(function(...) { [18:41:44.598] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.598] if (!identical(...future.globals.maxSize.org, [18:41:44.598] ...future.globals.maxSize)) { [18:41:44.598] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.598] on.exit(options(oopts), add = TRUE) [18:41:44.598] } [18:41:44.598] { [18:41:44.598] lapply(seq_along(...future.elements_ii), [18:41:44.598] FUN = function(jj) { [18:41:44.598] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.598] ...future.FUN(...future.X_jj, ...) [18:41:44.598] }) [18:41:44.598] } [18:41:44.598] }, args = future.call.arguments) [18:41:44.598] })) [18:41:44.598] future::FutureResult(value = ...future.value$value, [18:41:44.598] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.598] ...future.rng), globalenv = if (FALSE) [18:41:44.598] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.598] ...future.globalenv.names)) [18:41:44.598] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.598] }, condition = base::local({ [18:41:44.598] c <- base::c [18:41:44.598] inherits <- base::inherits [18:41:44.598] invokeRestart <- base::invokeRestart [18:41:44.598] length <- base::length [18:41:44.598] list <- base::list [18:41:44.598] seq.int <- base::seq.int [18:41:44.598] signalCondition <- base::signalCondition [18:41:44.598] sys.calls <- base::sys.calls [18:41:44.598] `[[` <- base::`[[` [18:41:44.598] `+` <- base::`+` [18:41:44.598] `<<-` <- base::`<<-` [18:41:44.598] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.598] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.598] 3L)] [18:41:44.598] } [18:41:44.598] function(cond) { [18:41:44.598] is_error <- inherits(cond, "error") [18:41:44.598] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.598] NULL) [18:41:44.598] if (is_error) { [18:41:44.598] sessionInformation <- function() { [18:41:44.598] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.598] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.598] search = base::search(), system = base::Sys.info()) [18:41:44.598] } [18:41:44.598] ...future.conditions[[length(...future.conditions) + [18:41:44.598] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.598] cond$call), session = sessionInformation(), [18:41:44.598] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.598] signalCondition(cond) [18:41:44.598] } [18:41:44.598] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.598] "immediateCondition"))) { [18:41:44.598] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.598] ...future.conditions[[length(...future.conditions) + [18:41:44.598] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.598] if (TRUE && !signal) { [18:41:44.598] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.598] { [18:41:44.598] inherits <- base::inherits [18:41:44.598] invokeRestart <- base::invokeRestart [18:41:44.598] is.null <- base::is.null [18:41:44.598] muffled <- FALSE [18:41:44.598] if (inherits(cond, "message")) { [18:41:44.598] muffled <- grepl(pattern, "muffleMessage") [18:41:44.598] if (muffled) [18:41:44.598] invokeRestart("muffleMessage") [18:41:44.598] } [18:41:44.598] else if (inherits(cond, "warning")) { [18:41:44.598] muffled <- grepl(pattern, "muffleWarning") [18:41:44.598] if (muffled) [18:41:44.598] invokeRestart("muffleWarning") [18:41:44.598] } [18:41:44.598] else if (inherits(cond, "condition")) { [18:41:44.598] if (!is.null(pattern)) { [18:41:44.598] computeRestarts <- base::computeRestarts [18:41:44.598] grepl <- base::grepl [18:41:44.598] restarts <- computeRestarts(cond) [18:41:44.598] for (restart in restarts) { [18:41:44.598] name <- restart$name [18:41:44.598] if (is.null(name)) [18:41:44.598] next [18:41:44.598] if (!grepl(pattern, name)) [18:41:44.598] next [18:41:44.598] invokeRestart(restart) [18:41:44.598] muffled <- TRUE [18:41:44.598] break [18:41:44.598] } [18:41:44.598] } [18:41:44.598] } [18:41:44.598] invisible(muffled) [18:41:44.598] } [18:41:44.598] muffleCondition(cond, pattern = "^muffle") [18:41:44.598] } [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] if (TRUE) { [18:41:44.598] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.598] { [18:41:44.598] inherits <- base::inherits [18:41:44.598] invokeRestart <- base::invokeRestart [18:41:44.598] is.null <- base::is.null [18:41:44.598] muffled <- FALSE [18:41:44.598] if (inherits(cond, "message")) { [18:41:44.598] muffled <- grepl(pattern, "muffleMessage") [18:41:44.598] if (muffled) [18:41:44.598] invokeRestart("muffleMessage") [18:41:44.598] } [18:41:44.598] else if (inherits(cond, "warning")) { [18:41:44.598] muffled <- grepl(pattern, "muffleWarning") [18:41:44.598] if (muffled) [18:41:44.598] invokeRestart("muffleWarning") [18:41:44.598] } [18:41:44.598] else if (inherits(cond, "condition")) { [18:41:44.598] if (!is.null(pattern)) { [18:41:44.598] computeRestarts <- base::computeRestarts [18:41:44.598] grepl <- base::grepl [18:41:44.598] restarts <- computeRestarts(cond) [18:41:44.598] for (restart in restarts) { [18:41:44.598] name <- restart$name [18:41:44.598] if (is.null(name)) [18:41:44.598] next [18:41:44.598] if (!grepl(pattern, name)) [18:41:44.598] next [18:41:44.598] invokeRestart(restart) [18:41:44.598] muffled <- TRUE [18:41:44.598] break [18:41:44.598] } [18:41:44.598] } [18:41:44.598] } [18:41:44.598] invisible(muffled) [18:41:44.598] } [18:41:44.598] muffleCondition(cond, pattern = "^muffle") [18:41:44.598] } [18:41:44.598] } [18:41:44.598] } [18:41:44.598] })) [18:41:44.598] }, error = function(ex) { [18:41:44.598] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.598] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.598] ...future.rng), started = ...future.startTime, [18:41:44.598] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.598] version = "1.8"), class = "FutureResult") [18:41:44.598] }, finally = { [18:41:44.598] if (!identical(...future.workdir, getwd())) [18:41:44.598] setwd(...future.workdir) [18:41:44.598] { [18:41:44.598] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.598] ...future.oldOptions$nwarnings <- NULL [18:41:44.598] } [18:41:44.598] base::options(...future.oldOptions) [18:41:44.598] if (.Platform$OS.type == "windows") { [18:41:44.598] old_names <- names(...future.oldEnvVars) [18:41:44.598] envs <- base::Sys.getenv() [18:41:44.598] names <- names(envs) [18:41:44.598] common <- intersect(names, old_names) [18:41:44.598] added <- setdiff(names, old_names) [18:41:44.598] removed <- setdiff(old_names, names) [18:41:44.598] changed <- common[...future.oldEnvVars[common] != [18:41:44.598] envs[common]] [18:41:44.598] NAMES <- toupper(changed) [18:41:44.598] args <- list() [18:41:44.598] for (kk in seq_along(NAMES)) { [18:41:44.598] name <- changed[[kk]] [18:41:44.598] NAME <- NAMES[[kk]] [18:41:44.598] if (name != NAME && is.element(NAME, old_names)) [18:41:44.598] next [18:41:44.598] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.598] } [18:41:44.598] NAMES <- toupper(added) [18:41:44.598] for (kk in seq_along(NAMES)) { [18:41:44.598] name <- added[[kk]] [18:41:44.598] NAME <- NAMES[[kk]] [18:41:44.598] if (name != NAME && is.element(NAME, old_names)) [18:41:44.598] next [18:41:44.598] args[[name]] <- "" [18:41:44.598] } [18:41:44.598] NAMES <- toupper(removed) [18:41:44.598] for (kk in seq_along(NAMES)) { [18:41:44.598] name <- removed[[kk]] [18:41:44.598] NAME <- NAMES[[kk]] [18:41:44.598] if (name != NAME && is.element(NAME, old_names)) [18:41:44.598] next [18:41:44.598] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.598] } [18:41:44.598] if (length(args) > 0) [18:41:44.598] base::do.call(base::Sys.setenv, args = args) [18:41:44.598] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.598] } [18:41:44.598] { [18:41:44.598] if (base::length(...future.futureOptionsAdded) > [18:41:44.598] 0L) { [18:41:44.598] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.598] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.598] base::options(opts) [18:41:44.598] } [18:41:44.598] { [18:41:44.598] { [18:41:44.598] NULL [18:41:44.598] RNGkind("Mersenne-Twister") [18:41:44.598] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.598] inherits = FALSE) [18:41:44.598] } [18:41:44.598] options(future.plan = NULL) [18:41:44.598] if (is.na(NA_character_)) [18:41:44.598] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.598] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.598] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.598] .init = FALSE) [18:41:44.598] } [18:41:44.598] } [18:41:44.598] } [18:41:44.598] }) [18:41:44.598] if (TRUE) { [18:41:44.598] base::sink(type = "output", split = FALSE) [18:41:44.598] if (TRUE) { [18:41:44.598] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.598] } [18:41:44.598] else { [18:41:44.598] ...future.result["stdout"] <- base::list(NULL) [18:41:44.598] } [18:41:44.598] base::close(...future.stdout) [18:41:44.598] ...future.stdout <- NULL [18:41:44.598] } [18:41:44.598] ...future.result$conditions <- ...future.conditions [18:41:44.598] ...future.result$finished <- base::Sys.time() [18:41:44.598] ...future.result [18:41:44.598] } [18:41:44.603] assign_globals() ... [18:41:44.603] List of 5 [18:41:44.603] $ ...future.FUN :function (x) [18:41:44.603] $ future.call.arguments : list() [18:41:44.603] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.603] $ ...future.elements_ii :List of 4 [18:41:44.603] ..$ A: num 50 [18:41:44.603] ..$ B: num 60 [18:41:44.603] ..$ C: num 70 [18:41:44.603] ..$ D: num 80 [18:41:44.603] $ ...future.seeds_ii : NULL [18:41:44.603] $ ...future.globals.maxSize: NULL [18:41:44.603] - attr(*, "where")=List of 5 [18:41:44.603] ..$ ...future.FUN : [18:41:44.603] ..$ future.call.arguments : [18:41:44.603] ..$ ...future.elements_ii : [18:41:44.603] ..$ ...future.seeds_ii : [18:41:44.603] ..$ ...future.globals.maxSize: [18:41:44.603] - attr(*, "resolved")= logi FALSE [18:41:44.603] - attr(*, "total_size")= num 4910 [18:41:44.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.603] - attr(*, "already-done")= logi TRUE [18:41:44.614] - copied '...future.FUN' to environment [18:41:44.614] - copied 'future.call.arguments' to environment [18:41:44.615] - copied '...future.elements_ii' to environment [18:41:44.615] - copied '...future.seeds_ii' to environment [18:41:44.615] - copied '...future.globals.maxSize' to environment [18:41:44.615] assign_globals() ... done [18:41:44.616] plan(): Setting new future strategy stack: [18:41:44.616] List of future strategies: [18:41:44.616] 1. sequential: [18:41:44.616] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.616] - tweaked: FALSE [18:41:44.616] - call: NULL [18:41:44.617] plan(): nbrOfWorkers() = 1 [18:41:44.619] plan(): Setting new future strategy stack: [18:41:44.619] List of future strategies: [18:41:44.619] 1. sequential: [18:41:44.619] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.619] - tweaked: FALSE [18:41:44.619] - call: plan(strategy) [18:41:44.620] plan(): nbrOfWorkers() = 1 [18:41:44.620] SequentialFuture started (and completed) [18:41:44.621] - Launch lazy future ... done [18:41:44.621] run() for 'SequentialFuture' ... done [18:41:44.621] Created future: [18:41:44.622] SequentialFuture: [18:41:44.622] Label: 'future_sapply-1' [18:41:44.622] Expression: [18:41:44.622] { [18:41:44.622] do.call(function(...) { [18:41:44.622] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.622] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.622] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.622] on.exit(options(oopts), add = TRUE) [18:41:44.622] } [18:41:44.622] { [18:41:44.622] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.622] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.622] ...future.FUN(...future.X_jj, ...) [18:41:44.622] }) [18:41:44.622] } [18:41:44.622] }, args = future.call.arguments) [18:41:44.622] } [18:41:44.622] Lazy evaluation: FALSE [18:41:44.622] Asynchronous evaluation: FALSE [18:41:44.622] Local evaluation: TRUE [18:41:44.622] Environment: R_GlobalEnv [18:41:44.622] Capture standard output: TRUE [18:41:44.622] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.622] Globals: 5 objects totaling 500 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.622] Packages: [18:41:44.622] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.622] Resolved: TRUE [18:41:44.622] Value: 95 bytes of class 'list' [18:41:44.622] Early signaling: FALSE [18:41:44.622] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.622] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.623] Chunk #1 of 1 ... DONE [18:41:44.623] Launching 1 futures (chunks) ... DONE [18:41:44.624] Resolving 1 futures (chunks) ... [18:41:44.624] resolve() on list ... [18:41:44.624] recursive: 0 [18:41:44.624] length: 1 [18:41:44.625] [18:41:44.625] resolved() for 'SequentialFuture' ... [18:41:44.625] - state: 'finished' [18:41:44.625] - run: TRUE [18:41:44.626] - result: 'FutureResult' [18:41:44.626] resolved() for 'SequentialFuture' ... done [18:41:44.626] Future #1 [18:41:44.627] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.627] - nx: 1 [18:41:44.627] - relay: TRUE [18:41:44.627] - stdout: TRUE [18:41:44.628] - signal: TRUE [18:41:44.628] - resignal: FALSE [18:41:44.628] - force: TRUE [18:41:44.628] - relayed: [n=1] FALSE [18:41:44.628] - queued futures: [n=1] FALSE [18:41:44.629] - until=1 [18:41:44.629] - relaying element #1 [18:41:44.629] - relayed: [n=1] TRUE [18:41:44.630] - queued futures: [n=1] TRUE [18:41:44.630] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.630] length: 0 (resolved future 1) [18:41:44.630] Relaying remaining futures [18:41:44.631] signalConditionsASAP(NULL, pos=0) ... [18:41:44.631] - nx: 1 [18:41:44.631] - relay: TRUE [18:41:44.631] - stdout: TRUE [18:41:44.632] - signal: TRUE [18:41:44.632] - resignal: FALSE [18:41:44.632] - force: TRUE [18:41:44.632] - relayed: [n=1] TRUE [18:41:44.633] - queued futures: [n=1] TRUE - flush all [18:41:44.633] - relayed: [n=1] TRUE [18:41:44.633] - queued futures: [n=1] TRUE [18:41:44.633] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.634] resolve() on list ... DONE [18:41:44.634] - Number of value chunks collected: 1 [18:41:44.634] Resolving 1 futures (chunks) ... DONE [18:41:44.634] Reducing values from 1 chunks ... [18:41:44.635] - Number of values collected after concatenation: 4 [18:41:44.635] - Number of values expected: 4 [18:41:44.635] Reducing values from 1 chunks ... DONE [18:41:44.635] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y1:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y2:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 [18:41:44.648] future_lapply() ... [18:41:44.649] Number of chunks: 1 [18:41:44.649] getGlobalsAndPackagesXApply() ... [18:41:44.650] - future.globals: TRUE [18:41:44.650] getGlobalsAndPackages() ... [18:41:44.650] Searching for globals... [18:41:44.652] - globals found: [2] 'FUN', 'UseMethod' [18:41:44.652] Searching for globals ... DONE [18:41:44.652] Resolving globals: FALSE [18:41:44.653] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:44.654] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:44.654] - globals: [1] 'FUN' [18:41:44.654] [18:41:44.654] getGlobalsAndPackages() ... DONE [18:41:44.655] - globals found/used: [n=1] 'FUN' [18:41:44.655] - needed namespaces: [n=0] [18:41:44.655] Finding globals ... DONE [18:41:44.655] - use_args: TRUE [18:41:44.656] - Getting '...' globals ... [18:41:44.656] resolve() on list ... [18:41:44.656] recursive: 0 [18:41:44.657] length: 1 [18:41:44.657] elements: '...' [18:41:44.657] length: 0 (resolved future 1) [18:41:44.657] resolve() on list ... DONE [18:41:44.658] - '...' content: [n=0] [18:41:44.658] List of 1 [18:41:44.658] $ ...: list() [18:41:44.658] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.658] - attr(*, "where")=List of 1 [18:41:44.658] ..$ ...: [18:41:44.658] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.658] - attr(*, "resolved")= logi TRUE [18:41:44.658] - attr(*, "total_size")= num NA [18:41:44.662] - Getting '...' globals ... DONE [18:41:44.663] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.663] List of 2 [18:41:44.663] $ ...future.FUN:function (x, ...) [18:41:44.663] $ ... : list() [18:41:44.663] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.663] - attr(*, "where")=List of 2 [18:41:44.663] ..$ ...future.FUN: [18:41:44.663] ..$ ... : [18:41:44.663] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.663] - attr(*, "resolved")= logi FALSE [18:41:44.663] - attr(*, "total_size")= int 5150 [18:41:44.668] Packages to be attached in all futures: [n=0] [18:41:44.668] getGlobalsAndPackagesXApply() ... DONE [18:41:44.669] Number of futures (= number of chunks): 1 [18:41:44.669] Launching 1 futures (chunks) ... [18:41:44.669] Chunk #1 of 1 ... [18:41:44.670] - Finding globals in 'X' for chunk #1 ... [18:41:44.670] getGlobalsAndPackages() ... [18:41:44.670] Searching for globals... [18:41:44.670] [18:41:44.671] Searching for globals ... DONE [18:41:44.671] - globals: [0] [18:41:44.671] getGlobalsAndPackages() ... DONE [18:41:44.671] + additional globals found: [n=0] [18:41:44.672] + additional namespaces needed: [n=0] [18:41:44.672] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.672] - seeds: [18:41:44.672] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.673] getGlobalsAndPackages() ... [18:41:44.673] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.673] Resolving globals: FALSE [18:41:44.673] Tweak future expression to call with '...' arguments ... [18:41:44.674] { [18:41:44.674] do.call(function(...) { [18:41:44.674] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.674] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.674] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.674] on.exit(options(oopts), add = TRUE) [18:41:44.674] } [18:41:44.674] { [18:41:44.674] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.674] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.674] ...future.FUN(...future.X_jj, ...) [18:41:44.674] }) [18:41:44.674] } [18:41:44.674] }, args = future.call.arguments) [18:41:44.674] } [18:41:44.674] Tweak future expression to call with '...' arguments ... DONE [18:41:44.675] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.675] [18:41:44.676] getGlobalsAndPackages() ... DONE [18:41:44.676] run() for 'Future' ... [18:41:44.676] - state: 'created' [18:41:44.677] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.677] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.678] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.678] - Field: 'label' [18:41:44.678] - Field: 'local' [18:41:44.678] - Field: 'owner' [18:41:44.679] - Field: 'envir' [18:41:44.679] - Field: 'packages' [18:41:44.679] - Field: 'gc' [18:41:44.679] - Field: 'conditions' [18:41:44.680] - Field: 'expr' [18:41:44.680] - Field: 'uuid' [18:41:44.680] - Field: 'seed' [18:41:44.680] - Field: 'version' [18:41:44.681] - Field: 'result' [18:41:44.681] - Field: 'asynchronous' [18:41:44.681] - Field: 'calls' [18:41:44.681] - Field: 'globals' [18:41:44.682] - Field: 'stdout' [18:41:44.682] - Field: 'earlySignal' [18:41:44.682] - Field: 'lazy' [18:41:44.683] - Field: 'state' [18:41:44.683] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.683] - Launch lazy future ... [18:41:44.683] Packages needed by the future expression (n = 0): [18:41:44.684] Packages needed by future strategies (n = 0): [18:41:44.685] { [18:41:44.685] { [18:41:44.685] { [18:41:44.685] ...future.startTime <- base::Sys.time() [18:41:44.685] { [18:41:44.685] { [18:41:44.685] { [18:41:44.685] base::local({ [18:41:44.685] has_future <- base::requireNamespace("future", [18:41:44.685] quietly = TRUE) [18:41:44.685] if (has_future) { [18:41:44.685] ns <- base::getNamespace("future") [18:41:44.685] version <- ns[[".package"]][["version"]] [18:41:44.685] if (is.null(version)) [18:41:44.685] version <- utils::packageVersion("future") [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] version <- NULL [18:41:44.685] } [18:41:44.685] if (!has_future || version < "1.8.0") { [18:41:44.685] info <- base::c(r_version = base::gsub("R version ", [18:41:44.685] "", base::R.version$version.string), [18:41:44.685] platform = base::sprintf("%s (%s-bit)", [18:41:44.685] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.685] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.685] "release", "version")], collapse = " "), [18:41:44.685] hostname = base::Sys.info()[["nodename"]]) [18:41:44.685] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.685] info) [18:41:44.685] info <- base::paste(info, collapse = "; ") [18:41:44.685] if (!has_future) { [18:41:44.685] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.685] info) [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.685] info, version) [18:41:44.685] } [18:41:44.685] base::stop(msg) [18:41:44.685] } [18:41:44.685] }) [18:41:44.685] } [18:41:44.685] ...future.strategy.old <- future::plan("list") [18:41:44.685] options(future.plan = NULL) [18:41:44.685] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.685] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.685] } [18:41:44.685] ...future.workdir <- getwd() [18:41:44.685] } [18:41:44.685] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.685] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.685] } [18:41:44.685] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.685] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.685] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.685] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.685] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.685] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.685] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.685] base::names(...future.oldOptions)) [18:41:44.685] } [18:41:44.685] if (FALSE) { [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] if (TRUE) { [18:41:44.685] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.685] open = "w") [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.685] windows = "NUL", "/dev/null"), open = "w") [18:41:44.685] } [18:41:44.685] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.685] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.685] base::sink(type = "output", split = FALSE) [18:41:44.685] base::close(...future.stdout) [18:41:44.685] }, add = TRUE) [18:41:44.685] } [18:41:44.685] ...future.frame <- base::sys.nframe() [18:41:44.685] ...future.conditions <- base::list() [18:41:44.685] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.685] if (FALSE) { [18:41:44.685] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.685] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.685] } [18:41:44.685] ...future.result <- base::tryCatch({ [18:41:44.685] base::withCallingHandlers({ [18:41:44.685] ...future.value <- base::withVisible(base::local({ [18:41:44.685] do.call(function(...) { [18:41:44.685] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.685] if (!identical(...future.globals.maxSize.org, [18:41:44.685] ...future.globals.maxSize)) { [18:41:44.685] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.685] on.exit(options(oopts), add = TRUE) [18:41:44.685] } [18:41:44.685] { [18:41:44.685] lapply(seq_along(...future.elements_ii), [18:41:44.685] FUN = function(jj) { [18:41:44.685] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.685] ...future.FUN(...future.X_jj, ...) [18:41:44.685] }) [18:41:44.685] } [18:41:44.685] }, args = future.call.arguments) [18:41:44.685] })) [18:41:44.685] future::FutureResult(value = ...future.value$value, [18:41:44.685] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.685] ...future.rng), globalenv = if (FALSE) [18:41:44.685] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.685] ...future.globalenv.names)) [18:41:44.685] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.685] }, condition = base::local({ [18:41:44.685] c <- base::c [18:41:44.685] inherits <- base::inherits [18:41:44.685] invokeRestart <- base::invokeRestart [18:41:44.685] length <- base::length [18:41:44.685] list <- base::list [18:41:44.685] seq.int <- base::seq.int [18:41:44.685] signalCondition <- base::signalCondition [18:41:44.685] sys.calls <- base::sys.calls [18:41:44.685] `[[` <- base::`[[` [18:41:44.685] `+` <- base::`+` [18:41:44.685] `<<-` <- base::`<<-` [18:41:44.685] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.685] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.685] 3L)] [18:41:44.685] } [18:41:44.685] function(cond) { [18:41:44.685] is_error <- inherits(cond, "error") [18:41:44.685] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.685] NULL) [18:41:44.685] if (is_error) { [18:41:44.685] sessionInformation <- function() { [18:41:44.685] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.685] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.685] search = base::search(), system = base::Sys.info()) [18:41:44.685] } [18:41:44.685] ...future.conditions[[length(...future.conditions) + [18:41:44.685] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.685] cond$call), session = sessionInformation(), [18:41:44.685] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.685] signalCondition(cond) [18:41:44.685] } [18:41:44.685] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.685] "immediateCondition"))) { [18:41:44.685] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.685] ...future.conditions[[length(...future.conditions) + [18:41:44.685] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.685] if (TRUE && !signal) { [18:41:44.685] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.685] { [18:41:44.685] inherits <- base::inherits [18:41:44.685] invokeRestart <- base::invokeRestart [18:41:44.685] is.null <- base::is.null [18:41:44.685] muffled <- FALSE [18:41:44.685] if (inherits(cond, "message")) { [18:41:44.685] muffled <- grepl(pattern, "muffleMessage") [18:41:44.685] if (muffled) [18:41:44.685] invokeRestart("muffleMessage") [18:41:44.685] } [18:41:44.685] else if (inherits(cond, "warning")) { [18:41:44.685] muffled <- grepl(pattern, "muffleWarning") [18:41:44.685] if (muffled) [18:41:44.685] invokeRestart("muffleWarning") [18:41:44.685] } [18:41:44.685] else if (inherits(cond, "condition")) { [18:41:44.685] if (!is.null(pattern)) { [18:41:44.685] computeRestarts <- base::computeRestarts [18:41:44.685] grepl <- base::grepl [18:41:44.685] restarts <- computeRestarts(cond) [18:41:44.685] for (restart in restarts) { [18:41:44.685] name <- restart$name [18:41:44.685] if (is.null(name)) [18:41:44.685] next [18:41:44.685] if (!grepl(pattern, name)) [18:41:44.685] next [18:41:44.685] invokeRestart(restart) [18:41:44.685] muffled <- TRUE [18:41:44.685] break [18:41:44.685] } [18:41:44.685] } [18:41:44.685] } [18:41:44.685] invisible(muffled) [18:41:44.685] } [18:41:44.685] muffleCondition(cond, pattern = "^muffle") [18:41:44.685] } [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] if (TRUE) { [18:41:44.685] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.685] { [18:41:44.685] inherits <- base::inherits [18:41:44.685] invokeRestart <- base::invokeRestart [18:41:44.685] is.null <- base::is.null [18:41:44.685] muffled <- FALSE [18:41:44.685] if (inherits(cond, "message")) { [18:41:44.685] muffled <- grepl(pattern, "muffleMessage") [18:41:44.685] if (muffled) [18:41:44.685] invokeRestart("muffleMessage") [18:41:44.685] } [18:41:44.685] else if (inherits(cond, "warning")) { [18:41:44.685] muffled <- grepl(pattern, "muffleWarning") [18:41:44.685] if (muffled) [18:41:44.685] invokeRestart("muffleWarning") [18:41:44.685] } [18:41:44.685] else if (inherits(cond, "condition")) { [18:41:44.685] if (!is.null(pattern)) { [18:41:44.685] computeRestarts <- base::computeRestarts [18:41:44.685] grepl <- base::grepl [18:41:44.685] restarts <- computeRestarts(cond) [18:41:44.685] for (restart in restarts) { [18:41:44.685] name <- restart$name [18:41:44.685] if (is.null(name)) [18:41:44.685] next [18:41:44.685] if (!grepl(pattern, name)) [18:41:44.685] next [18:41:44.685] invokeRestart(restart) [18:41:44.685] muffled <- TRUE [18:41:44.685] break [18:41:44.685] } [18:41:44.685] } [18:41:44.685] } [18:41:44.685] invisible(muffled) [18:41:44.685] } [18:41:44.685] muffleCondition(cond, pattern = "^muffle") [18:41:44.685] } [18:41:44.685] } [18:41:44.685] } [18:41:44.685] })) [18:41:44.685] }, error = function(ex) { [18:41:44.685] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.685] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.685] ...future.rng), started = ...future.startTime, [18:41:44.685] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.685] version = "1.8"), class = "FutureResult") [18:41:44.685] }, finally = { [18:41:44.685] if (!identical(...future.workdir, getwd())) [18:41:44.685] setwd(...future.workdir) [18:41:44.685] { [18:41:44.685] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.685] ...future.oldOptions$nwarnings <- NULL [18:41:44.685] } [18:41:44.685] base::options(...future.oldOptions) [18:41:44.685] if (.Platform$OS.type == "windows") { [18:41:44.685] old_names <- names(...future.oldEnvVars) [18:41:44.685] envs <- base::Sys.getenv() [18:41:44.685] names <- names(envs) [18:41:44.685] common <- intersect(names, old_names) [18:41:44.685] added <- setdiff(names, old_names) [18:41:44.685] removed <- setdiff(old_names, names) [18:41:44.685] changed <- common[...future.oldEnvVars[common] != [18:41:44.685] envs[common]] [18:41:44.685] NAMES <- toupper(changed) [18:41:44.685] args <- list() [18:41:44.685] for (kk in seq_along(NAMES)) { [18:41:44.685] name <- changed[[kk]] [18:41:44.685] NAME <- NAMES[[kk]] [18:41:44.685] if (name != NAME && is.element(NAME, old_names)) [18:41:44.685] next [18:41:44.685] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.685] } [18:41:44.685] NAMES <- toupper(added) [18:41:44.685] for (kk in seq_along(NAMES)) { [18:41:44.685] name <- added[[kk]] [18:41:44.685] NAME <- NAMES[[kk]] [18:41:44.685] if (name != NAME && is.element(NAME, old_names)) [18:41:44.685] next [18:41:44.685] args[[name]] <- "" [18:41:44.685] } [18:41:44.685] NAMES <- toupper(removed) [18:41:44.685] for (kk in seq_along(NAMES)) { [18:41:44.685] name <- removed[[kk]] [18:41:44.685] NAME <- NAMES[[kk]] [18:41:44.685] if (name != NAME && is.element(NAME, old_names)) [18:41:44.685] next [18:41:44.685] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.685] } [18:41:44.685] if (length(args) > 0) [18:41:44.685] base::do.call(base::Sys.setenv, args = args) [18:41:44.685] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.685] } [18:41:44.685] { [18:41:44.685] if (base::length(...future.futureOptionsAdded) > [18:41:44.685] 0L) { [18:41:44.685] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.685] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.685] base::options(opts) [18:41:44.685] } [18:41:44.685] { [18:41:44.685] { [18:41:44.685] NULL [18:41:44.685] RNGkind("Mersenne-Twister") [18:41:44.685] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.685] inherits = FALSE) [18:41:44.685] } [18:41:44.685] options(future.plan = NULL) [18:41:44.685] if (is.na(NA_character_)) [18:41:44.685] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.685] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.685] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.685] .init = FALSE) [18:41:44.685] } [18:41:44.685] } [18:41:44.685] } [18:41:44.685] }) [18:41:44.685] if (TRUE) { [18:41:44.685] base::sink(type = "output", split = FALSE) [18:41:44.685] if (TRUE) { [18:41:44.685] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.685] } [18:41:44.685] else { [18:41:44.685] ...future.result["stdout"] <- base::list(NULL) [18:41:44.685] } [18:41:44.685] base::close(...future.stdout) [18:41:44.685] ...future.stdout <- NULL [18:41:44.685] } [18:41:44.685] ...future.result$conditions <- ...future.conditions [18:41:44.685] ...future.result$finished <- base::Sys.time() [18:41:44.685] ...future.result [18:41:44.685] } [18:41:44.690] assign_globals() ... [18:41:44.690] List of 5 [18:41:44.690] $ ...future.FUN :function (x, ...) [18:41:44.690] $ future.call.arguments : list() [18:41:44.690] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.690] $ ...future.elements_ii :List of 4 [18:41:44.690] ..$ A: num 50 [18:41:44.690] ..$ B: num 60 [18:41:44.690] ..$ C: num 70 [18:41:44.690] ..$ D: num 80 [18:41:44.690] $ ...future.seeds_ii : NULL [18:41:44.690] $ ...future.globals.maxSize: NULL [18:41:44.690] - attr(*, "where")=List of 5 [18:41:44.690] ..$ ...future.FUN : [18:41:44.690] ..$ future.call.arguments : [18:41:44.690] ..$ ...future.elements_ii : [18:41:44.690] ..$ ...future.seeds_ii : [18:41:44.690] ..$ ...future.globals.maxSize: [18:41:44.690] - attr(*, "resolved")= logi FALSE [18:41:44.690] - attr(*, "total_size")= num 5150 [18:41:44.690] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.690] - attr(*, "already-done")= logi TRUE [18:41:44.703] - copied '...future.FUN' to environment [18:41:44.703] - copied 'future.call.arguments' to environment [18:41:44.703] - copied '...future.elements_ii' to environment [18:41:44.704] - copied '...future.seeds_ii' to environment [18:41:44.704] - copied '...future.globals.maxSize' to environment [18:41:44.704] assign_globals() ... done [18:41:44.705] plan(): Setting new future strategy stack: [18:41:44.705] List of future strategies: [18:41:44.705] 1. sequential: [18:41:44.705] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.705] - tweaked: FALSE [18:41:44.705] - call: NULL [18:41:44.706] plan(): nbrOfWorkers() = 1 [18:41:44.709] plan(): Setting new future strategy stack: [18:41:44.709] List of future strategies: [18:41:44.709] 1. sequential: [18:41:44.709] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.709] - tweaked: FALSE [18:41:44.709] - call: plan(strategy) [18:41:44.710] plan(): nbrOfWorkers() = 1 [18:41:44.711] SequentialFuture started (and completed) [18:41:44.711] - Launch lazy future ... done [18:41:44.711] run() for 'SequentialFuture' ... done [18:41:44.715] Created future: [18:41:44.716] SequentialFuture: [18:41:44.716] Label: 'future_sapply-1' [18:41:44.716] Expression: [18:41:44.716] { [18:41:44.716] do.call(function(...) { [18:41:44.716] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.716] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.716] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.716] on.exit(options(oopts), add = TRUE) [18:41:44.716] } [18:41:44.716] { [18:41:44.716] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.716] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.716] ...future.FUN(...future.X_jj, ...) [18:41:44.716] }) [18:41:44.716] } [18:41:44.716] }, args = future.call.arguments) [18:41:44.716] } [18:41:44.716] Lazy evaluation: FALSE [18:41:44.716] Asynchronous evaluation: FALSE [18:41:44.716] Local evaluation: TRUE [18:41:44.716] Environment: R_GlobalEnv [18:41:44.716] Capture standard output: TRUE [18:41:44.716] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.716] Globals: 5 objects totaling 593 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.716] Packages: [18:41:44.716] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.716] Resolved: TRUE [18:41:44.716] Value: 218 bytes of class 'list' [18:41:44.716] Early signaling: FALSE [18:41:44.716] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.716] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.718] Chunk #1 of 1 ... DONE [18:41:44.718] Launching 1 futures (chunks) ... DONE [18:41:44.718] Resolving 1 futures (chunks) ... [18:41:44.719] resolve() on list ... [18:41:44.719] recursive: 0 [18:41:44.719] length: 1 [18:41:44.720] [18:41:44.720] resolved() for 'SequentialFuture' ... [18:41:44.720] - state: 'finished' [18:41:44.721] - run: TRUE [18:41:44.721] - result: 'FutureResult' [18:41:44.721] resolved() for 'SequentialFuture' ... done [18:41:44.722] Future #1 [18:41:44.722] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.722] - nx: 1 [18:41:44.723] - relay: TRUE [18:41:44.723] - stdout: TRUE [18:41:44.723] - signal: TRUE [18:41:44.723] - resignal: FALSE [18:41:44.724] - force: TRUE [18:41:44.724] - relayed: [n=1] FALSE [18:41:44.724] - queued futures: [n=1] FALSE [18:41:44.725] - until=1 [18:41:44.725] - relaying element #1 [18:41:44.725] - relayed: [n=1] TRUE [18:41:44.726] - queued futures: [n=1] TRUE [18:41:44.726] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.726] length: 0 (resolved future 1) [18:41:44.727] Relaying remaining futures [18:41:44.727] signalConditionsASAP(NULL, pos=0) ... [18:41:44.727] - nx: 1 [18:41:44.727] - relay: TRUE [18:41:44.728] - stdout: TRUE [18:41:44.728] - signal: TRUE [18:41:44.728] - resignal: FALSE [18:41:44.728] - force: TRUE [18:41:44.729] - relayed: [n=1] TRUE [18:41:44.729] - queued futures: [n=1] TRUE - flush all [18:41:44.729] - relayed: [n=1] TRUE [18:41:44.730] - queued futures: [n=1] TRUE [18:41:44.730] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.730] resolve() on list ... DONE [18:41:44.731] - Number of value chunks collected: 1 [18:41:44.731] Resolving 1 futures (chunks) ... DONE [18:41:44.731] Reducing values from 1 chunks ... [18:41:44.732] - Number of values collected after concatenation: 4 [18:41:44.732] - Number of values expected: 4 [18:41:44.732] Reducing values from 1 chunks ... DONE [18:41:44.732] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y1:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y2:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 [18:41:44.749] future_lapply() ... [18:41:44.751] Number of chunks: 1 [18:41:44.751] getGlobalsAndPackagesXApply() ... [18:41:44.751] - future.globals: TRUE [18:41:44.752] getGlobalsAndPackages() ... [18:41:44.752] Searching for globals... [18:41:44.755] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:44.755] Searching for globals ... DONE [18:41:44.756] Resolving globals: FALSE [18:41:44.757] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:44.757] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:44.758] - globals: [1] 'FUN' [18:41:44.758] [18:41:44.758] getGlobalsAndPackages() ... DONE [18:41:44.759] - globals found/used: [n=1] 'FUN' [18:41:44.759] - needed namespaces: [n=0] [18:41:44.759] Finding globals ... DONE [18:41:44.760] - use_args: TRUE [18:41:44.760] - Getting '...' globals ... [18:41:44.761] resolve() on list ... [18:41:44.761] recursive: 0 [18:41:44.761] length: 1 [18:41:44.762] elements: '...' [18:41:44.762] length: 0 (resolved future 1) [18:41:44.762] resolve() on list ... DONE [18:41:44.763] - '...' content: [n=0] [18:41:44.763] List of 1 [18:41:44.763] $ ...: list() [18:41:44.763] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.763] - attr(*, "where")=List of 1 [18:41:44.763] ..$ ...: [18:41:44.763] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.763] - attr(*, "resolved")= logi TRUE [18:41:44.763] - attr(*, "total_size")= num NA [18:41:44.768] - Getting '...' globals ... DONE [18:41:44.769] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.769] List of 2 [18:41:44.769] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:44.769] $ ... : list() [18:41:44.769] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.769] - attr(*, "where")=List of 2 [18:41:44.769] ..$ ...future.FUN: [18:41:44.769] ..$ ... : [18:41:44.769] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.769] - attr(*, "resolved")= logi FALSE [18:41:44.769] - attr(*, "total_size")= int 6632 [18:41:44.775] Packages to be attached in all futures: [n=0] [18:41:44.776] getGlobalsAndPackagesXApply() ... DONE [18:41:44.776] Number of futures (= number of chunks): 1 [18:41:44.776] Launching 1 futures (chunks) ... [18:41:44.777] Chunk #1 of 1 ... [18:41:44.777] - Finding globals in 'X' for chunk #1 ... [18:41:44.777] getGlobalsAndPackages() ... [18:41:44.778] Searching for globals... [18:41:44.778] [18:41:44.779] Searching for globals ... DONE [18:41:44.779] - globals: [0] [18:41:44.779] getGlobalsAndPackages() ... DONE [18:41:44.779] + additional globals found: [n=0] [18:41:44.780] + additional namespaces needed: [n=0] [18:41:44.780] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.780] - seeds: [18:41:44.781] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.781] getGlobalsAndPackages() ... [18:41:44.781] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.782] Resolving globals: FALSE [18:41:44.782] Tweak future expression to call with '...' arguments ... [18:41:44.782] { [18:41:44.782] do.call(function(...) { [18:41:44.782] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.782] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.782] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.782] on.exit(options(oopts), add = TRUE) [18:41:44.782] } [18:41:44.782] { [18:41:44.782] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.782] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.782] ...future.FUN(...future.X_jj, ...) [18:41:44.782] }) [18:41:44.782] } [18:41:44.782] }, args = future.call.arguments) [18:41:44.782] } [18:41:44.783] Tweak future expression to call with '...' arguments ... DONE [18:41:44.784] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.784] [18:41:44.785] getGlobalsAndPackages() ... DONE [18:41:44.785] run() for 'Future' ... [18:41:44.786] - state: 'created' [18:41:44.786] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.787] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.787] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.787] - Field: 'label' [18:41:44.788] - Field: 'local' [18:41:44.788] - Field: 'owner' [18:41:44.788] - Field: 'envir' [18:41:44.789] - Field: 'packages' [18:41:44.789] - Field: 'gc' [18:41:44.789] - Field: 'conditions' [18:41:44.790] - Field: 'expr' [18:41:44.790] - Field: 'uuid' [18:41:44.790] - Field: 'seed' [18:41:44.791] - Field: 'version' [18:41:44.791] - Field: 'result' [18:41:44.791] - Field: 'asynchronous' [18:41:44.792] - Field: 'calls' [18:41:44.792] - Field: 'globals' [18:41:44.792] - Field: 'stdout' [18:41:44.793] - Field: 'earlySignal' [18:41:44.793] - Field: 'lazy' [18:41:44.793] - Field: 'state' [18:41:44.794] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.794] - Launch lazy future ... [18:41:44.794] Packages needed by the future expression (n = 0): [18:41:44.795] Packages needed by future strategies (n = 0): [18:41:44.796] { [18:41:44.796] { [18:41:44.796] { [18:41:44.796] ...future.startTime <- base::Sys.time() [18:41:44.796] { [18:41:44.796] { [18:41:44.796] { [18:41:44.796] base::local({ [18:41:44.796] has_future <- base::requireNamespace("future", [18:41:44.796] quietly = TRUE) [18:41:44.796] if (has_future) { [18:41:44.796] ns <- base::getNamespace("future") [18:41:44.796] version <- ns[[".package"]][["version"]] [18:41:44.796] if (is.null(version)) [18:41:44.796] version <- utils::packageVersion("future") [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] version <- NULL [18:41:44.796] } [18:41:44.796] if (!has_future || version < "1.8.0") { [18:41:44.796] info <- base::c(r_version = base::gsub("R version ", [18:41:44.796] "", base::R.version$version.string), [18:41:44.796] platform = base::sprintf("%s (%s-bit)", [18:41:44.796] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.796] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.796] "release", "version")], collapse = " "), [18:41:44.796] hostname = base::Sys.info()[["nodename"]]) [18:41:44.796] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.796] info) [18:41:44.796] info <- base::paste(info, collapse = "; ") [18:41:44.796] if (!has_future) { [18:41:44.796] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.796] info) [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.796] info, version) [18:41:44.796] } [18:41:44.796] base::stop(msg) [18:41:44.796] } [18:41:44.796] }) [18:41:44.796] } [18:41:44.796] ...future.strategy.old <- future::plan("list") [18:41:44.796] options(future.plan = NULL) [18:41:44.796] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.796] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.796] } [18:41:44.796] ...future.workdir <- getwd() [18:41:44.796] } [18:41:44.796] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.796] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.796] } [18:41:44.796] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.796] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.796] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.796] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.796] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.796] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.796] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.796] base::names(...future.oldOptions)) [18:41:44.796] } [18:41:44.796] if (FALSE) { [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] if (TRUE) { [18:41:44.796] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.796] open = "w") [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.796] windows = "NUL", "/dev/null"), open = "w") [18:41:44.796] } [18:41:44.796] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.796] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.796] base::sink(type = "output", split = FALSE) [18:41:44.796] base::close(...future.stdout) [18:41:44.796] }, add = TRUE) [18:41:44.796] } [18:41:44.796] ...future.frame <- base::sys.nframe() [18:41:44.796] ...future.conditions <- base::list() [18:41:44.796] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.796] if (FALSE) { [18:41:44.796] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.796] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.796] } [18:41:44.796] ...future.result <- base::tryCatch({ [18:41:44.796] base::withCallingHandlers({ [18:41:44.796] ...future.value <- base::withVisible(base::local({ [18:41:44.796] do.call(function(...) { [18:41:44.796] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.796] if (!identical(...future.globals.maxSize.org, [18:41:44.796] ...future.globals.maxSize)) { [18:41:44.796] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.796] on.exit(options(oopts), add = TRUE) [18:41:44.796] } [18:41:44.796] { [18:41:44.796] lapply(seq_along(...future.elements_ii), [18:41:44.796] FUN = function(jj) { [18:41:44.796] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.796] ...future.FUN(...future.X_jj, ...) [18:41:44.796] }) [18:41:44.796] } [18:41:44.796] }, args = future.call.arguments) [18:41:44.796] })) [18:41:44.796] future::FutureResult(value = ...future.value$value, [18:41:44.796] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.796] ...future.rng), globalenv = if (FALSE) [18:41:44.796] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.796] ...future.globalenv.names)) [18:41:44.796] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.796] }, condition = base::local({ [18:41:44.796] c <- base::c [18:41:44.796] inherits <- base::inherits [18:41:44.796] invokeRestart <- base::invokeRestart [18:41:44.796] length <- base::length [18:41:44.796] list <- base::list [18:41:44.796] seq.int <- base::seq.int [18:41:44.796] signalCondition <- base::signalCondition [18:41:44.796] sys.calls <- base::sys.calls [18:41:44.796] `[[` <- base::`[[` [18:41:44.796] `+` <- base::`+` [18:41:44.796] `<<-` <- base::`<<-` [18:41:44.796] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.796] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.796] 3L)] [18:41:44.796] } [18:41:44.796] function(cond) { [18:41:44.796] is_error <- inherits(cond, "error") [18:41:44.796] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.796] NULL) [18:41:44.796] if (is_error) { [18:41:44.796] sessionInformation <- function() { [18:41:44.796] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.796] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.796] search = base::search(), system = base::Sys.info()) [18:41:44.796] } [18:41:44.796] ...future.conditions[[length(...future.conditions) + [18:41:44.796] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.796] cond$call), session = sessionInformation(), [18:41:44.796] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.796] signalCondition(cond) [18:41:44.796] } [18:41:44.796] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.796] "immediateCondition"))) { [18:41:44.796] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.796] ...future.conditions[[length(...future.conditions) + [18:41:44.796] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.796] if (TRUE && !signal) { [18:41:44.796] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.796] { [18:41:44.796] inherits <- base::inherits [18:41:44.796] invokeRestart <- base::invokeRestart [18:41:44.796] is.null <- base::is.null [18:41:44.796] muffled <- FALSE [18:41:44.796] if (inherits(cond, "message")) { [18:41:44.796] muffled <- grepl(pattern, "muffleMessage") [18:41:44.796] if (muffled) [18:41:44.796] invokeRestart("muffleMessage") [18:41:44.796] } [18:41:44.796] else if (inherits(cond, "warning")) { [18:41:44.796] muffled <- grepl(pattern, "muffleWarning") [18:41:44.796] if (muffled) [18:41:44.796] invokeRestart("muffleWarning") [18:41:44.796] } [18:41:44.796] else if (inherits(cond, "condition")) { [18:41:44.796] if (!is.null(pattern)) { [18:41:44.796] computeRestarts <- base::computeRestarts [18:41:44.796] grepl <- base::grepl [18:41:44.796] restarts <- computeRestarts(cond) [18:41:44.796] for (restart in restarts) { [18:41:44.796] name <- restart$name [18:41:44.796] if (is.null(name)) [18:41:44.796] next [18:41:44.796] if (!grepl(pattern, name)) [18:41:44.796] next [18:41:44.796] invokeRestart(restart) [18:41:44.796] muffled <- TRUE [18:41:44.796] break [18:41:44.796] } [18:41:44.796] } [18:41:44.796] } [18:41:44.796] invisible(muffled) [18:41:44.796] } [18:41:44.796] muffleCondition(cond, pattern = "^muffle") [18:41:44.796] } [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] if (TRUE) { [18:41:44.796] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.796] { [18:41:44.796] inherits <- base::inherits [18:41:44.796] invokeRestart <- base::invokeRestart [18:41:44.796] is.null <- base::is.null [18:41:44.796] muffled <- FALSE [18:41:44.796] if (inherits(cond, "message")) { [18:41:44.796] muffled <- grepl(pattern, "muffleMessage") [18:41:44.796] if (muffled) [18:41:44.796] invokeRestart("muffleMessage") [18:41:44.796] } [18:41:44.796] else if (inherits(cond, "warning")) { [18:41:44.796] muffled <- grepl(pattern, "muffleWarning") [18:41:44.796] if (muffled) [18:41:44.796] invokeRestart("muffleWarning") [18:41:44.796] } [18:41:44.796] else if (inherits(cond, "condition")) { [18:41:44.796] if (!is.null(pattern)) { [18:41:44.796] computeRestarts <- base::computeRestarts [18:41:44.796] grepl <- base::grepl [18:41:44.796] restarts <- computeRestarts(cond) [18:41:44.796] for (restart in restarts) { [18:41:44.796] name <- restart$name [18:41:44.796] if (is.null(name)) [18:41:44.796] next [18:41:44.796] if (!grepl(pattern, name)) [18:41:44.796] next [18:41:44.796] invokeRestart(restart) [18:41:44.796] muffled <- TRUE [18:41:44.796] break [18:41:44.796] } [18:41:44.796] } [18:41:44.796] } [18:41:44.796] invisible(muffled) [18:41:44.796] } [18:41:44.796] muffleCondition(cond, pattern = "^muffle") [18:41:44.796] } [18:41:44.796] } [18:41:44.796] } [18:41:44.796] })) [18:41:44.796] }, error = function(ex) { [18:41:44.796] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.796] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.796] ...future.rng), started = ...future.startTime, [18:41:44.796] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.796] version = "1.8"), class = "FutureResult") [18:41:44.796] }, finally = { [18:41:44.796] if (!identical(...future.workdir, getwd())) [18:41:44.796] setwd(...future.workdir) [18:41:44.796] { [18:41:44.796] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.796] ...future.oldOptions$nwarnings <- NULL [18:41:44.796] } [18:41:44.796] base::options(...future.oldOptions) [18:41:44.796] if (.Platform$OS.type == "windows") { [18:41:44.796] old_names <- names(...future.oldEnvVars) [18:41:44.796] envs <- base::Sys.getenv() [18:41:44.796] names <- names(envs) [18:41:44.796] common <- intersect(names, old_names) [18:41:44.796] added <- setdiff(names, old_names) [18:41:44.796] removed <- setdiff(old_names, names) [18:41:44.796] changed <- common[...future.oldEnvVars[common] != [18:41:44.796] envs[common]] [18:41:44.796] NAMES <- toupper(changed) [18:41:44.796] args <- list() [18:41:44.796] for (kk in seq_along(NAMES)) { [18:41:44.796] name <- changed[[kk]] [18:41:44.796] NAME <- NAMES[[kk]] [18:41:44.796] if (name != NAME && is.element(NAME, old_names)) [18:41:44.796] next [18:41:44.796] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.796] } [18:41:44.796] NAMES <- toupper(added) [18:41:44.796] for (kk in seq_along(NAMES)) { [18:41:44.796] name <- added[[kk]] [18:41:44.796] NAME <- NAMES[[kk]] [18:41:44.796] if (name != NAME && is.element(NAME, old_names)) [18:41:44.796] next [18:41:44.796] args[[name]] <- "" [18:41:44.796] } [18:41:44.796] NAMES <- toupper(removed) [18:41:44.796] for (kk in seq_along(NAMES)) { [18:41:44.796] name <- removed[[kk]] [18:41:44.796] NAME <- NAMES[[kk]] [18:41:44.796] if (name != NAME && is.element(NAME, old_names)) [18:41:44.796] next [18:41:44.796] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.796] } [18:41:44.796] if (length(args) > 0) [18:41:44.796] base::do.call(base::Sys.setenv, args = args) [18:41:44.796] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.796] } [18:41:44.796] { [18:41:44.796] if (base::length(...future.futureOptionsAdded) > [18:41:44.796] 0L) { [18:41:44.796] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.796] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.796] base::options(opts) [18:41:44.796] } [18:41:44.796] { [18:41:44.796] { [18:41:44.796] NULL [18:41:44.796] RNGkind("Mersenne-Twister") [18:41:44.796] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.796] inherits = FALSE) [18:41:44.796] } [18:41:44.796] options(future.plan = NULL) [18:41:44.796] if (is.na(NA_character_)) [18:41:44.796] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.796] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.796] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.796] .init = FALSE) [18:41:44.796] } [18:41:44.796] } [18:41:44.796] } [18:41:44.796] }) [18:41:44.796] if (TRUE) { [18:41:44.796] base::sink(type = "output", split = FALSE) [18:41:44.796] if (TRUE) { [18:41:44.796] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.796] } [18:41:44.796] else { [18:41:44.796] ...future.result["stdout"] <- base::list(NULL) [18:41:44.796] } [18:41:44.796] base::close(...future.stdout) [18:41:44.796] ...future.stdout <- NULL [18:41:44.796] } [18:41:44.796] ...future.result$conditions <- ...future.conditions [18:41:44.796] ...future.result$finished <- base::Sys.time() [18:41:44.796] ...future.result [18:41:44.796] } [18:41:44.802] assign_globals() ... [18:41:44.803] List of 5 [18:41:44.803] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:44.803] $ future.call.arguments : list() [18:41:44.803] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.803] $ ...future.elements_ii :List of 4 [18:41:44.803] ..$ A: num 50 [18:41:44.803] ..$ B: num 60 [18:41:44.803] ..$ C: num 70 [18:41:44.803] ..$ D: num 80 [18:41:44.803] $ ...future.seeds_ii : NULL [18:41:44.803] $ ...future.globals.maxSize: NULL [18:41:44.803] - attr(*, "where")=List of 5 [18:41:44.803] ..$ ...future.FUN : [18:41:44.803] ..$ future.call.arguments : [18:41:44.803] ..$ ...future.elements_ii : [18:41:44.803] ..$ ...future.seeds_ii : [18:41:44.803] ..$ ...future.globals.maxSize: [18:41:44.803] - attr(*, "resolved")= logi FALSE [18:41:44.803] - attr(*, "total_size")= num 6632 [18:41:44.803] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.803] - attr(*, "already-done")= logi TRUE [18:41:44.816] - reassign environment for '...future.FUN' [18:41:44.816] - copied '...future.FUN' to environment [18:41:44.816] - copied 'future.call.arguments' to environment [18:41:44.817] - copied '...future.elements_ii' to environment [18:41:44.817] - copied '...future.seeds_ii' to environment [18:41:44.817] - copied '...future.globals.maxSize' to environment [18:41:44.818] assign_globals() ... done [18:41:44.818] plan(): Setting new future strategy stack: [18:41:44.819] List of future strategies: [18:41:44.819] 1. sequential: [18:41:44.819] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.819] - tweaked: FALSE [18:41:44.819] - call: NULL [18:41:44.820] plan(): nbrOfWorkers() = 1 [18:41:44.822] plan(): Setting new future strategy stack: [18:41:44.822] List of future strategies: [18:41:44.822] 1. sequential: [18:41:44.822] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.822] - tweaked: FALSE [18:41:44.822] - call: plan(strategy) [18:41:44.824] plan(): nbrOfWorkers() = 1 [18:41:44.824] SequentialFuture started (and completed) [18:41:44.824] - Launch lazy future ... done [18:41:44.825] run() for 'SequentialFuture' ... done [18:41:44.825] Created future: [18:41:44.825] SequentialFuture: [18:41:44.825] Label: 'future_sapply-1' [18:41:44.825] Expression: [18:41:44.825] { [18:41:44.825] do.call(function(...) { [18:41:44.825] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.825] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.825] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.825] on.exit(options(oopts), add = TRUE) [18:41:44.825] } [18:41:44.825] { [18:41:44.825] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.825] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.825] ...future.FUN(...future.X_jj, ...) [18:41:44.825] }) [18:41:44.825] } [18:41:44.825] }, args = future.call.arguments) [18:41:44.825] } [18:41:44.825] Lazy evaluation: FALSE [18:41:44.825] Asynchronous evaluation: FALSE [18:41:44.825] Local evaluation: TRUE [18:41:44.825] Environment: R_GlobalEnv [18:41:44.825] Capture standard output: TRUE [18:41:44.825] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.825] Globals: 5 objects totaling 1.07 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.825] Packages: [18:41:44.825] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.825] Resolved: TRUE [18:41:44.825] Value: 666 bytes of class 'list' [18:41:44.825] Early signaling: FALSE [18:41:44.825] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.825] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.827] Chunk #1 of 1 ... DONE [18:41:44.828] Launching 1 futures (chunks) ... DONE [18:41:44.828] Resolving 1 futures (chunks) ... [18:41:44.828] resolve() on list ... [18:41:44.829] recursive: 0 [18:41:44.829] length: 1 [18:41:44.829] [18:41:44.829] resolved() for 'SequentialFuture' ... [18:41:44.830] - state: 'finished' [18:41:44.830] - run: TRUE [18:41:44.830] - result: 'FutureResult' [18:41:44.831] resolved() for 'SequentialFuture' ... done [18:41:44.831] Future #1 [18:41:44.832] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.832] - nx: 1 [18:41:44.832] - relay: TRUE [18:41:44.832] - stdout: TRUE [18:41:44.833] - signal: TRUE [18:41:44.833] - resignal: FALSE [18:41:44.833] - force: TRUE [18:41:44.833] - relayed: [n=1] FALSE [18:41:44.834] - queued futures: [n=1] FALSE [18:41:44.834] - until=1 [18:41:44.834] - relaying element #1 [18:41:44.835] - relayed: [n=1] TRUE [18:41:44.835] - queued futures: [n=1] TRUE [18:41:44.836] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.836] length: 0 (resolved future 1) [18:41:44.836] Relaying remaining futures [18:41:44.836] signalConditionsASAP(NULL, pos=0) ... [18:41:44.837] - nx: 1 [18:41:44.837] - relay: TRUE [18:41:44.837] - stdout: TRUE [18:41:44.838] - signal: TRUE [18:41:44.838] - resignal: FALSE [18:41:44.838] - force: TRUE [18:41:44.838] - relayed: [n=1] TRUE [18:41:44.839] - queued futures: [n=1] TRUE - flush all [18:41:44.839] - relayed: [n=1] TRUE [18:41:44.839] - queued futures: [n=1] TRUE [18:41:44.840] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.840] resolve() on list ... DONE [18:41:44.840] - Number of value chunks collected: 1 [18:41:44.841] Resolving 1 futures (chunks) ... DONE [18:41:44.841] Reducing values from 1 chunks ... [18:41:44.841] - Number of values collected after concatenation: 4 [18:41:44.842] - Number of values expected: 4 [18:41:44.842] Reducing values from 1 chunks ... DONE [18:41:44.842] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y1:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y2:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... [18:41:44.860] future_lapply() ... [18:41:44.861] Number of chunks: 1 [18:41:44.862] getGlobalsAndPackagesXApply() ... [18:41:44.862] - future.globals: TRUE [18:41:44.862] getGlobalsAndPackages() ... [18:41:44.863] Searching for globals... [18:41:44.865] - globals found: [1] 'FUN' [18:41:44.865] Searching for globals ... DONE [18:41:44.865] Resolving globals: FALSE [18:41:44.866] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:44.867] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:44.867] - globals: [1] 'FUN' [18:41:44.868] [18:41:44.868] getGlobalsAndPackages() ... DONE [18:41:44.868] - globals found/used: [n=1] 'FUN' [18:41:44.868] - needed namespaces: [n=0] [18:41:44.869] Finding globals ... DONE [18:41:44.869] - use_args: TRUE [18:41:44.869] - Getting '...' globals ... [18:41:44.870] resolve() on list ... [18:41:44.870] recursive: 0 [18:41:44.871] length: 1 [18:41:44.871] elements: '...' [18:41:44.871] length: 0 (resolved future 1) [18:41:44.872] resolve() on list ... DONE [18:41:44.872] - '...' content: [n=0] [18:41:44.872] List of 1 [18:41:44.872] $ ...: list() [18:41:44.872] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.872] - attr(*, "where")=List of 1 [18:41:44.872] ..$ ...: [18:41:44.872] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.872] - attr(*, "resolved")= logi TRUE [18:41:44.872] - attr(*, "total_size")= num NA [18:41:44.877] - Getting '...' globals ... DONE [18:41:44.878] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.878] List of 2 [18:41:44.878] $ ...future.FUN:function (x) [18:41:44.878] $ ... : list() [18:41:44.878] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.878] - attr(*, "where")=List of 2 [18:41:44.878] ..$ ...future.FUN: [18:41:44.878] ..$ ... : [18:41:44.878] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.878] - attr(*, "resolved")= logi FALSE [18:41:44.878] - attr(*, "total_size")= int 4910 [18:41:44.884] Packages to be attached in all futures: [n=0] [18:41:44.885] getGlobalsAndPackagesXApply() ... DONE [18:41:44.885] Number of futures (= number of chunks): 1 [18:41:44.886] Launching 1 futures (chunks) ... [18:41:44.886] Chunk #1 of 1 ... [18:41:44.886] - Finding globals in 'X' for chunk #1 ... [18:41:44.887] getGlobalsAndPackages() ... [18:41:44.887] Searching for globals... [18:41:44.888] [18:41:44.888] Searching for globals ... DONE [18:41:44.888] - globals: [0] [18:41:44.888] getGlobalsAndPackages() ... DONE [18:41:44.889] + additional globals found: [n=0] [18:41:44.889] + additional namespaces needed: [n=0] [18:41:44.889] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.890] - seeds: [18:41:44.890] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.890] getGlobalsAndPackages() ... [18:41:44.890] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.891] Resolving globals: FALSE [18:41:44.891] Tweak future expression to call with '...' arguments ... [18:41:44.891] { [18:41:44.891] do.call(function(...) { [18:41:44.891] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.891] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.891] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.891] on.exit(options(oopts), add = TRUE) [18:41:44.891] } [18:41:44.891] { [18:41:44.891] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.891] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.891] ...future.FUN(...future.X_jj, ...) [18:41:44.891] }) [18:41:44.891] } [18:41:44.891] }, args = future.call.arguments) [18:41:44.891] } [18:41:44.892] Tweak future expression to call with '...' arguments ... DONE [18:41:44.893] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.894] [18:41:44.894] getGlobalsAndPackages() ... DONE [18:41:44.895] run() for 'Future' ... [18:41:44.895] - state: 'created' [18:41:44.895] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.896] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.896] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.897] - Field: 'label' [18:41:44.897] - Field: 'local' [18:41:44.897] - Field: 'owner' [18:41:44.898] - Field: 'envir' [18:41:44.898] - Field: 'packages' [18:41:44.898] - Field: 'gc' [18:41:44.902] - Field: 'conditions' [18:41:44.903] - Field: 'expr' [18:41:44.903] - Field: 'uuid' [18:41:44.904] - Field: 'seed' [18:41:44.904] - Field: 'version' [18:41:44.904] - Field: 'result' [18:41:44.905] - Field: 'asynchronous' [18:41:44.905] - Field: 'calls' [18:41:44.905] - Field: 'globals' [18:41:44.906] - Field: 'stdout' [18:41:44.906] - Field: 'earlySignal' [18:41:44.906] - Field: 'lazy' [18:41:44.907] - Field: 'state' [18:41:44.907] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:44.907] - Launch lazy future ... [18:41:44.908] Packages needed by the future expression (n = 0): [18:41:44.908] Packages needed by future strategies (n = 0): [18:41:44.909] { [18:41:44.909] { [18:41:44.909] { [18:41:44.909] ...future.startTime <- base::Sys.time() [18:41:44.909] { [18:41:44.909] { [18:41:44.909] { [18:41:44.909] base::local({ [18:41:44.909] has_future <- base::requireNamespace("future", [18:41:44.909] quietly = TRUE) [18:41:44.909] if (has_future) { [18:41:44.909] ns <- base::getNamespace("future") [18:41:44.909] version <- ns[[".package"]][["version"]] [18:41:44.909] if (is.null(version)) [18:41:44.909] version <- utils::packageVersion("future") [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] version <- NULL [18:41:44.909] } [18:41:44.909] if (!has_future || version < "1.8.0") { [18:41:44.909] info <- base::c(r_version = base::gsub("R version ", [18:41:44.909] "", base::R.version$version.string), [18:41:44.909] platform = base::sprintf("%s (%s-bit)", [18:41:44.909] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:44.909] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:44.909] "release", "version")], collapse = " "), [18:41:44.909] hostname = base::Sys.info()[["nodename"]]) [18:41:44.909] info <- base::sprintf("%s: %s", base::names(info), [18:41:44.909] info) [18:41:44.909] info <- base::paste(info, collapse = "; ") [18:41:44.909] if (!has_future) { [18:41:44.909] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:44.909] info) [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:44.909] info, version) [18:41:44.909] } [18:41:44.909] base::stop(msg) [18:41:44.909] } [18:41:44.909] }) [18:41:44.909] } [18:41:44.909] ...future.strategy.old <- future::plan("list") [18:41:44.909] options(future.plan = NULL) [18:41:44.909] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.909] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:44.909] } [18:41:44.909] ...future.workdir <- getwd() [18:41:44.909] } [18:41:44.909] ...future.oldOptions <- base::as.list(base::.Options) [18:41:44.909] ...future.oldEnvVars <- base::Sys.getenv() [18:41:44.909] } [18:41:44.909] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:44.909] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:44.909] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:44.909] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:44.909] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:44.909] future.stdout.windows.reencode = NULL, width = 80L) [18:41:44.909] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:44.909] base::names(...future.oldOptions)) [18:41:44.909] } [18:41:44.909] if (FALSE) { [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] if (TRUE) { [18:41:44.909] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:44.909] open = "w") [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:44.909] windows = "NUL", "/dev/null"), open = "w") [18:41:44.909] } [18:41:44.909] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:44.909] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:44.909] base::sink(type = "output", split = FALSE) [18:41:44.909] base::close(...future.stdout) [18:41:44.909] }, add = TRUE) [18:41:44.909] } [18:41:44.909] ...future.frame <- base::sys.nframe() [18:41:44.909] ...future.conditions <- base::list() [18:41:44.909] ...future.rng <- base::globalenv()$.Random.seed [18:41:44.909] if (FALSE) { [18:41:44.909] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:44.909] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:44.909] } [18:41:44.909] ...future.result <- base::tryCatch({ [18:41:44.909] base::withCallingHandlers({ [18:41:44.909] ...future.value <- base::withVisible(base::local({ [18:41:44.909] do.call(function(...) { [18:41:44.909] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.909] if (!identical(...future.globals.maxSize.org, [18:41:44.909] ...future.globals.maxSize)) { [18:41:44.909] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.909] on.exit(options(oopts), add = TRUE) [18:41:44.909] } [18:41:44.909] { [18:41:44.909] lapply(seq_along(...future.elements_ii), [18:41:44.909] FUN = function(jj) { [18:41:44.909] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.909] ...future.FUN(...future.X_jj, ...) [18:41:44.909] }) [18:41:44.909] } [18:41:44.909] }, args = future.call.arguments) [18:41:44.909] })) [18:41:44.909] future::FutureResult(value = ...future.value$value, [18:41:44.909] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.909] ...future.rng), globalenv = if (FALSE) [18:41:44.909] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:44.909] ...future.globalenv.names)) [18:41:44.909] else NULL, started = ...future.startTime, version = "1.8") [18:41:44.909] }, condition = base::local({ [18:41:44.909] c <- base::c [18:41:44.909] inherits <- base::inherits [18:41:44.909] invokeRestart <- base::invokeRestart [18:41:44.909] length <- base::length [18:41:44.909] list <- base::list [18:41:44.909] seq.int <- base::seq.int [18:41:44.909] signalCondition <- base::signalCondition [18:41:44.909] sys.calls <- base::sys.calls [18:41:44.909] `[[` <- base::`[[` [18:41:44.909] `+` <- base::`+` [18:41:44.909] `<<-` <- base::`<<-` [18:41:44.909] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:44.909] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:44.909] 3L)] [18:41:44.909] } [18:41:44.909] function(cond) { [18:41:44.909] is_error <- inherits(cond, "error") [18:41:44.909] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:44.909] NULL) [18:41:44.909] if (is_error) { [18:41:44.909] sessionInformation <- function() { [18:41:44.909] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:44.909] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:44.909] search = base::search(), system = base::Sys.info()) [18:41:44.909] } [18:41:44.909] ...future.conditions[[length(...future.conditions) + [18:41:44.909] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:44.909] cond$call), session = sessionInformation(), [18:41:44.909] timestamp = base::Sys.time(), signaled = 0L) [18:41:44.909] signalCondition(cond) [18:41:44.909] } [18:41:44.909] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:44.909] "immediateCondition"))) { [18:41:44.909] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:44.909] ...future.conditions[[length(...future.conditions) + [18:41:44.909] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:44.909] if (TRUE && !signal) { [18:41:44.909] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.909] { [18:41:44.909] inherits <- base::inherits [18:41:44.909] invokeRestart <- base::invokeRestart [18:41:44.909] is.null <- base::is.null [18:41:44.909] muffled <- FALSE [18:41:44.909] if (inherits(cond, "message")) { [18:41:44.909] muffled <- grepl(pattern, "muffleMessage") [18:41:44.909] if (muffled) [18:41:44.909] invokeRestart("muffleMessage") [18:41:44.909] } [18:41:44.909] else if (inherits(cond, "warning")) { [18:41:44.909] muffled <- grepl(pattern, "muffleWarning") [18:41:44.909] if (muffled) [18:41:44.909] invokeRestart("muffleWarning") [18:41:44.909] } [18:41:44.909] else if (inherits(cond, "condition")) { [18:41:44.909] if (!is.null(pattern)) { [18:41:44.909] computeRestarts <- base::computeRestarts [18:41:44.909] grepl <- base::grepl [18:41:44.909] restarts <- computeRestarts(cond) [18:41:44.909] for (restart in restarts) { [18:41:44.909] name <- restart$name [18:41:44.909] if (is.null(name)) [18:41:44.909] next [18:41:44.909] if (!grepl(pattern, name)) [18:41:44.909] next [18:41:44.909] invokeRestart(restart) [18:41:44.909] muffled <- TRUE [18:41:44.909] break [18:41:44.909] } [18:41:44.909] } [18:41:44.909] } [18:41:44.909] invisible(muffled) [18:41:44.909] } [18:41:44.909] muffleCondition(cond, pattern = "^muffle") [18:41:44.909] } [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] if (TRUE) { [18:41:44.909] muffleCondition <- function (cond, pattern = "^muffle") [18:41:44.909] { [18:41:44.909] inherits <- base::inherits [18:41:44.909] invokeRestart <- base::invokeRestart [18:41:44.909] is.null <- base::is.null [18:41:44.909] muffled <- FALSE [18:41:44.909] if (inherits(cond, "message")) { [18:41:44.909] muffled <- grepl(pattern, "muffleMessage") [18:41:44.909] if (muffled) [18:41:44.909] invokeRestart("muffleMessage") [18:41:44.909] } [18:41:44.909] else if (inherits(cond, "warning")) { [18:41:44.909] muffled <- grepl(pattern, "muffleWarning") [18:41:44.909] if (muffled) [18:41:44.909] invokeRestart("muffleWarning") [18:41:44.909] } [18:41:44.909] else if (inherits(cond, "condition")) { [18:41:44.909] if (!is.null(pattern)) { [18:41:44.909] computeRestarts <- base::computeRestarts [18:41:44.909] grepl <- base::grepl [18:41:44.909] restarts <- computeRestarts(cond) [18:41:44.909] for (restart in restarts) { [18:41:44.909] name <- restart$name [18:41:44.909] if (is.null(name)) [18:41:44.909] next [18:41:44.909] if (!grepl(pattern, name)) [18:41:44.909] next [18:41:44.909] invokeRestart(restart) [18:41:44.909] muffled <- TRUE [18:41:44.909] break [18:41:44.909] } [18:41:44.909] } [18:41:44.909] } [18:41:44.909] invisible(muffled) [18:41:44.909] } [18:41:44.909] muffleCondition(cond, pattern = "^muffle") [18:41:44.909] } [18:41:44.909] } [18:41:44.909] } [18:41:44.909] })) [18:41:44.909] }, error = function(ex) { [18:41:44.909] base::structure(base::list(value = NULL, visible = NULL, [18:41:44.909] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:44.909] ...future.rng), started = ...future.startTime, [18:41:44.909] finished = Sys.time(), session_uuid = NA_character_, [18:41:44.909] version = "1.8"), class = "FutureResult") [18:41:44.909] }, finally = { [18:41:44.909] if (!identical(...future.workdir, getwd())) [18:41:44.909] setwd(...future.workdir) [18:41:44.909] { [18:41:44.909] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:44.909] ...future.oldOptions$nwarnings <- NULL [18:41:44.909] } [18:41:44.909] base::options(...future.oldOptions) [18:41:44.909] if (.Platform$OS.type == "windows") { [18:41:44.909] old_names <- names(...future.oldEnvVars) [18:41:44.909] envs <- base::Sys.getenv() [18:41:44.909] names <- names(envs) [18:41:44.909] common <- intersect(names, old_names) [18:41:44.909] added <- setdiff(names, old_names) [18:41:44.909] removed <- setdiff(old_names, names) [18:41:44.909] changed <- common[...future.oldEnvVars[common] != [18:41:44.909] envs[common]] [18:41:44.909] NAMES <- toupper(changed) [18:41:44.909] args <- list() [18:41:44.909] for (kk in seq_along(NAMES)) { [18:41:44.909] name <- changed[[kk]] [18:41:44.909] NAME <- NAMES[[kk]] [18:41:44.909] if (name != NAME && is.element(NAME, old_names)) [18:41:44.909] next [18:41:44.909] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.909] } [18:41:44.909] NAMES <- toupper(added) [18:41:44.909] for (kk in seq_along(NAMES)) { [18:41:44.909] name <- added[[kk]] [18:41:44.909] NAME <- NAMES[[kk]] [18:41:44.909] if (name != NAME && is.element(NAME, old_names)) [18:41:44.909] next [18:41:44.909] args[[name]] <- "" [18:41:44.909] } [18:41:44.909] NAMES <- toupper(removed) [18:41:44.909] for (kk in seq_along(NAMES)) { [18:41:44.909] name <- removed[[kk]] [18:41:44.909] NAME <- NAMES[[kk]] [18:41:44.909] if (name != NAME && is.element(NAME, old_names)) [18:41:44.909] next [18:41:44.909] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:44.909] } [18:41:44.909] if (length(args) > 0) [18:41:44.909] base::do.call(base::Sys.setenv, args = args) [18:41:44.909] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:44.909] } [18:41:44.909] { [18:41:44.909] if (base::length(...future.futureOptionsAdded) > [18:41:44.909] 0L) { [18:41:44.909] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:44.909] base::names(opts) <- ...future.futureOptionsAdded [18:41:44.909] base::options(opts) [18:41:44.909] } [18:41:44.909] { [18:41:44.909] { [18:41:44.909] NULL [18:41:44.909] RNGkind("Mersenne-Twister") [18:41:44.909] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:44.909] inherits = FALSE) [18:41:44.909] } [18:41:44.909] options(future.plan = NULL) [18:41:44.909] if (is.na(NA_character_)) [18:41:44.909] Sys.unsetenv("R_FUTURE_PLAN") [18:41:44.909] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:44.909] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:44.909] .init = FALSE) [18:41:44.909] } [18:41:44.909] } [18:41:44.909] } [18:41:44.909] }) [18:41:44.909] if (TRUE) { [18:41:44.909] base::sink(type = "output", split = FALSE) [18:41:44.909] if (TRUE) { [18:41:44.909] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:44.909] } [18:41:44.909] else { [18:41:44.909] ...future.result["stdout"] <- base::list(NULL) [18:41:44.909] } [18:41:44.909] base::close(...future.stdout) [18:41:44.909] ...future.stdout <- NULL [18:41:44.909] } [18:41:44.909] ...future.result$conditions <- ...future.conditions [18:41:44.909] ...future.result$finished <- base::Sys.time() [18:41:44.909] ...future.result [18:41:44.909] } [18:41:44.916] assign_globals() ... [18:41:44.916] List of 5 [18:41:44.916] $ ...future.FUN :function (x) [18:41:44.916] $ future.call.arguments : list() [18:41:44.916] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.916] $ ...future.elements_ii :List of 4 [18:41:44.916] ..$ A: num 50 [18:41:44.916] ..$ B: num 60 [18:41:44.916] ..$ C: num 70 [18:41:44.916] ..$ D: num 80 [18:41:44.916] $ ...future.seeds_ii : NULL [18:41:44.916] $ ...future.globals.maxSize: NULL [18:41:44.916] - attr(*, "where")=List of 5 [18:41:44.916] ..$ ...future.FUN : [18:41:44.916] ..$ future.call.arguments : [18:41:44.916] ..$ ...future.elements_ii : [18:41:44.916] ..$ ...future.seeds_ii : [18:41:44.916] ..$ ...future.globals.maxSize: [18:41:44.916] - attr(*, "resolved")= logi FALSE [18:41:44.916] - attr(*, "total_size")= num 4910 [18:41:44.916] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.916] - attr(*, "already-done")= logi TRUE [18:41:44.928] - copied '...future.FUN' to environment [18:41:44.929] - copied 'future.call.arguments' to environment [18:41:44.929] - copied '...future.elements_ii' to environment [18:41:44.929] - copied '...future.seeds_ii' to environment [18:41:44.930] - copied '...future.globals.maxSize' to environment [18:41:44.930] assign_globals() ... done [18:41:44.931] plan(): Setting new future strategy stack: [18:41:44.931] List of future strategies: [18:41:44.931] 1. sequential: [18:41:44.931] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.931] - tweaked: FALSE [18:41:44.931] - call: NULL [18:41:44.932] plan(): nbrOfWorkers() = 1 [18:41:44.934] plan(): Setting new future strategy stack: [18:41:44.935] List of future strategies: [18:41:44.935] 1. sequential: [18:41:44.935] - args: function (..., envir = parent.frame(), workers = "") [18:41:44.935] - tweaked: FALSE [18:41:44.935] - call: plan(strategy) [18:41:44.936] plan(): nbrOfWorkers() = 1 [18:41:44.936] SequentialFuture started (and completed) [18:41:44.936] - Launch lazy future ... done [18:41:44.937] run() for 'SequentialFuture' ... done [18:41:44.937] Created future: [18:41:44.937] SequentialFuture: [18:41:44.937] Label: 'future_sapply-1' [18:41:44.937] Expression: [18:41:44.937] { [18:41:44.937] do.call(function(...) { [18:41:44.937] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.937] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.937] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.937] on.exit(options(oopts), add = TRUE) [18:41:44.937] } [18:41:44.937] { [18:41:44.937] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.937] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.937] ...future.FUN(...future.X_jj, ...) [18:41:44.937] }) [18:41:44.937] } [18:41:44.937] }, args = future.call.arguments) [18:41:44.937] } [18:41:44.937] Lazy evaluation: FALSE [18:41:44.937] Asynchronous evaluation: FALSE [18:41:44.937] Local evaluation: TRUE [18:41:44.937] Environment: R_GlobalEnv [18:41:44.937] Capture standard output: TRUE [18:41:44.937] Capture condition classes: 'condition' (excluding 'nothing') [18:41:44.937] Globals: 5 objects totaling 500 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:44.937] Packages: [18:41:44.937] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:44.937] Resolved: TRUE [18:41:44.937] Value: 95 bytes of class 'list' [18:41:44.937] Early signaling: FALSE [18:41:44.937] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:44.937] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.939] Chunk #1 of 1 ... DONE [18:41:44.940] Launching 1 futures (chunks) ... DONE [18:41:44.940] Resolving 1 futures (chunks) ... [18:41:44.940] resolve() on list ... [18:41:44.941] recursive: 0 [18:41:44.941] length: 1 [18:41:44.941] [18:41:44.941] resolved() for 'SequentialFuture' ... [18:41:44.942] - state: 'finished' [18:41:44.942] - run: TRUE [18:41:44.942] - result: 'FutureResult' [18:41:44.943] resolved() for 'SequentialFuture' ... done [18:41:44.943] Future #1 [18:41:44.944] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:44.944] - nx: 1 [18:41:44.944] - relay: TRUE [18:41:44.944] - stdout: TRUE [18:41:44.945] - signal: TRUE [18:41:44.945] - resignal: FALSE [18:41:44.945] - force: TRUE [18:41:44.946] - relayed: [n=1] FALSE [18:41:44.946] - queued futures: [n=1] FALSE [18:41:44.946] - until=1 [18:41:44.946] - relaying element #1 [18:41:44.947] - relayed: [n=1] TRUE [18:41:44.947] - queued futures: [n=1] TRUE [18:41:44.947] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:44.948] length: 0 (resolved future 1) [18:41:44.948] Relaying remaining futures [18:41:44.948] signalConditionsASAP(NULL, pos=0) ... [18:41:44.949] - nx: 1 [18:41:44.949] - relay: TRUE [18:41:44.949] - stdout: TRUE [18:41:44.949] - signal: TRUE [18:41:44.950] - resignal: FALSE [18:41:44.950] - force: TRUE [18:41:44.950] - relayed: [n=1] TRUE [18:41:44.951] - queued futures: [n=1] TRUE - flush all [18:41:44.951] - relayed: [n=1] TRUE [18:41:44.951] - queued futures: [n=1] TRUE [18:41:44.952] signalConditionsASAP(NULL, pos=0) ... done [18:41:44.952] resolve() on list ... DONE [18:41:44.952] - Number of value chunks collected: 1 [18:41:44.953] Resolving 1 futures (chunks) ... DONE [18:41:44.953] Reducing values from 1 chunks ... [18:41:44.953] - Number of values collected after concatenation: 4 [18:41:44.953] - Number of values expected: 4 [18:41:44.954] Reducing values from 1 chunks ... DONE [18:41:44.954] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:44.958] future_lapply() ... [18:41:44.959] Number of chunks: 1 [18:41:44.959] getGlobalsAndPackagesXApply() ... [18:41:44.959] - future.globals: TRUE [18:41:44.960] getGlobalsAndPackages() ... [18:41:44.960] Searching for globals... [18:41:44.962] - globals found: [2] 'FUN', 'UseMethod' [18:41:44.963] Searching for globals ... DONE [18:41:44.963] Resolving globals: FALSE [18:41:44.964] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:44.964] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:44.965] - globals: [1] 'FUN' [18:41:44.965] [18:41:44.965] getGlobalsAndPackages() ... DONE [18:41:44.966] - globals found/used: [n=1] 'FUN' [18:41:44.966] - needed namespaces: [n=0] [18:41:44.966] Finding globals ... DONE [18:41:44.967] - use_args: TRUE [18:41:44.967] - Getting '...' globals ... [18:41:44.968] resolve() on list ... [18:41:44.968] recursive: 0 [18:41:44.968] length: 1 [18:41:44.969] elements: '...' [18:41:44.969] length: 0 (resolved future 1) [18:41:44.969] resolve() on list ... DONE [18:41:44.970] - '...' content: [n=0] [18:41:44.970] List of 1 [18:41:44.970] $ ...: list() [18:41:44.970] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.970] - attr(*, "where")=List of 1 [18:41:44.970] ..$ ...: [18:41:44.970] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.970] - attr(*, "resolved")= logi TRUE [18:41:44.970] - attr(*, "total_size")= num NA [18:41:44.975] - Getting '...' globals ... DONE [18:41:44.976] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:44.976] List of 2 [18:41:44.976] $ ...future.FUN:function (x, ...) [18:41:44.976] $ ... : list() [18:41:44.976] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:44.976] - attr(*, "where")=List of 2 [18:41:44.976] ..$ ...future.FUN: [18:41:44.976] ..$ ... : [18:41:44.976] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:44.976] - attr(*, "resolved")= logi FALSE [18:41:44.976] - attr(*, "total_size")= int 5150 [18:41:44.982] Packages to be attached in all futures: [n=0] [18:41:44.982] getGlobalsAndPackagesXApply() ... DONE [18:41:44.983] Number of futures (= number of chunks): 1 [18:41:44.983] Launching 1 futures (chunks) ... [18:41:44.983] Chunk #1 of 1 ... [18:41:44.984] - Finding globals in 'X' for chunk #1 ... [18:41:44.984] getGlobalsAndPackages() ... [18:41:44.984] Searching for globals... [18:41:44.985] [18:41:44.985] Searching for globals ... DONE [18:41:44.985] - globals: [0] [18:41:44.986] getGlobalsAndPackages() ... DONE [18:41:44.986] + additional globals found: [n=0] [18:41:44.986] + additional namespaces needed: [n=0] [18:41:44.987] - Finding globals in 'X' for chunk #1 ... DONE [18:41:44.987] - seeds: [18:41:44.987] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.987] getGlobalsAndPackages() ... [18:41:44.988] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.988] Resolving globals: FALSE [18:41:44.989] Tweak future expression to call with '...' arguments ... [18:41:44.989] { [18:41:44.989] do.call(function(...) { [18:41:44.989] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:44.989] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:44.989] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:44.989] on.exit(options(oopts), add = TRUE) [18:41:44.989] } [18:41:44.989] { [18:41:44.989] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:44.989] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:44.989] ...future.FUN(...future.X_jj, ...) [18:41:44.989] }) [18:41:44.989] } [18:41:44.989] }, args = future.call.arguments) [18:41:44.989] } [18:41:44.990] Tweak future expression to call with '...' arguments ... DONE [18:41:44.991] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:44.991] [18:41:44.991] getGlobalsAndPackages() ... DONE [18:41:44.992] run() for 'Future' ... [18:41:44.992] - state: 'created' [18:41:44.993] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:44.993] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:44.994] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:44.994] - Field: 'label' [18:41:44.994] - Field: 'local' [18:41:44.995] - Field: 'owner' [18:41:44.995] - Field: 'envir' [18:41:44.995] - Field: 'packages' [18:41:44.996] - Field: 'gc' [18:41:44.996] - Field: 'conditions' [18:41:44.996] - Field: 'expr' [18:41:44.996] - Field: 'uuid' [18:41:44.997] - Field: 'seed' [18:41:44.997] - Field: 'version' [18:41:44.997] - Field: 'result' [18:41:44.998] - Field: 'asynchronous' [18:41:44.998] - Field: 'calls' [18:41:44.998] - Field: 'globals' [18:41:44.999] - Field: 'stdout' [18:41:44.999] - Field: 'earlySignal' [18:41:44.999] - Field: 'lazy' [18:41:45.000] - Field: 'state' [18:41:45.000] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.000] - Launch lazy future ... [18:41:45.001] Packages needed by the future expression (n = 0): [18:41:45.001] Packages needed by future strategies (n = 0): [18:41:45.002] { [18:41:45.002] { [18:41:45.002] { [18:41:45.002] ...future.startTime <- base::Sys.time() [18:41:45.002] { [18:41:45.002] { [18:41:45.002] { [18:41:45.002] base::local({ [18:41:45.002] has_future <- base::requireNamespace("future", [18:41:45.002] quietly = TRUE) [18:41:45.002] if (has_future) { [18:41:45.002] ns <- base::getNamespace("future") [18:41:45.002] version <- ns[[".package"]][["version"]] [18:41:45.002] if (is.null(version)) [18:41:45.002] version <- utils::packageVersion("future") [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] version <- NULL [18:41:45.002] } [18:41:45.002] if (!has_future || version < "1.8.0") { [18:41:45.002] info <- base::c(r_version = base::gsub("R version ", [18:41:45.002] "", base::R.version$version.string), [18:41:45.002] platform = base::sprintf("%s (%s-bit)", [18:41:45.002] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.002] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.002] "release", "version")], collapse = " "), [18:41:45.002] hostname = base::Sys.info()[["nodename"]]) [18:41:45.002] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.002] info) [18:41:45.002] info <- base::paste(info, collapse = "; ") [18:41:45.002] if (!has_future) { [18:41:45.002] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.002] info) [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.002] info, version) [18:41:45.002] } [18:41:45.002] base::stop(msg) [18:41:45.002] } [18:41:45.002] }) [18:41:45.002] } [18:41:45.002] ...future.strategy.old <- future::plan("list") [18:41:45.002] options(future.plan = NULL) [18:41:45.002] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.002] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.002] } [18:41:45.002] ...future.workdir <- getwd() [18:41:45.002] } [18:41:45.002] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.002] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.002] } [18:41:45.002] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.002] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.002] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.002] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.002] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.002] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.002] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.002] base::names(...future.oldOptions)) [18:41:45.002] } [18:41:45.002] if (FALSE) { [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] if (TRUE) { [18:41:45.002] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.002] open = "w") [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.002] windows = "NUL", "/dev/null"), open = "w") [18:41:45.002] } [18:41:45.002] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.002] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.002] base::sink(type = "output", split = FALSE) [18:41:45.002] base::close(...future.stdout) [18:41:45.002] }, add = TRUE) [18:41:45.002] } [18:41:45.002] ...future.frame <- base::sys.nframe() [18:41:45.002] ...future.conditions <- base::list() [18:41:45.002] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.002] if (FALSE) { [18:41:45.002] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.002] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.002] } [18:41:45.002] ...future.result <- base::tryCatch({ [18:41:45.002] base::withCallingHandlers({ [18:41:45.002] ...future.value <- base::withVisible(base::local({ [18:41:45.002] do.call(function(...) { [18:41:45.002] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.002] if (!identical(...future.globals.maxSize.org, [18:41:45.002] ...future.globals.maxSize)) { [18:41:45.002] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.002] on.exit(options(oopts), add = TRUE) [18:41:45.002] } [18:41:45.002] { [18:41:45.002] lapply(seq_along(...future.elements_ii), [18:41:45.002] FUN = function(jj) { [18:41:45.002] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.002] ...future.FUN(...future.X_jj, ...) [18:41:45.002] }) [18:41:45.002] } [18:41:45.002] }, args = future.call.arguments) [18:41:45.002] })) [18:41:45.002] future::FutureResult(value = ...future.value$value, [18:41:45.002] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.002] ...future.rng), globalenv = if (FALSE) [18:41:45.002] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.002] ...future.globalenv.names)) [18:41:45.002] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.002] }, condition = base::local({ [18:41:45.002] c <- base::c [18:41:45.002] inherits <- base::inherits [18:41:45.002] invokeRestart <- base::invokeRestart [18:41:45.002] length <- base::length [18:41:45.002] list <- base::list [18:41:45.002] seq.int <- base::seq.int [18:41:45.002] signalCondition <- base::signalCondition [18:41:45.002] sys.calls <- base::sys.calls [18:41:45.002] `[[` <- base::`[[` [18:41:45.002] `+` <- base::`+` [18:41:45.002] `<<-` <- base::`<<-` [18:41:45.002] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.002] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.002] 3L)] [18:41:45.002] } [18:41:45.002] function(cond) { [18:41:45.002] is_error <- inherits(cond, "error") [18:41:45.002] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.002] NULL) [18:41:45.002] if (is_error) { [18:41:45.002] sessionInformation <- function() { [18:41:45.002] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.002] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.002] search = base::search(), system = base::Sys.info()) [18:41:45.002] } [18:41:45.002] ...future.conditions[[length(...future.conditions) + [18:41:45.002] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.002] cond$call), session = sessionInformation(), [18:41:45.002] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.002] signalCondition(cond) [18:41:45.002] } [18:41:45.002] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.002] "immediateCondition"))) { [18:41:45.002] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.002] ...future.conditions[[length(...future.conditions) + [18:41:45.002] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.002] if (TRUE && !signal) { [18:41:45.002] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.002] { [18:41:45.002] inherits <- base::inherits [18:41:45.002] invokeRestart <- base::invokeRestart [18:41:45.002] is.null <- base::is.null [18:41:45.002] muffled <- FALSE [18:41:45.002] if (inherits(cond, "message")) { [18:41:45.002] muffled <- grepl(pattern, "muffleMessage") [18:41:45.002] if (muffled) [18:41:45.002] invokeRestart("muffleMessage") [18:41:45.002] } [18:41:45.002] else if (inherits(cond, "warning")) { [18:41:45.002] muffled <- grepl(pattern, "muffleWarning") [18:41:45.002] if (muffled) [18:41:45.002] invokeRestart("muffleWarning") [18:41:45.002] } [18:41:45.002] else if (inherits(cond, "condition")) { [18:41:45.002] if (!is.null(pattern)) { [18:41:45.002] computeRestarts <- base::computeRestarts [18:41:45.002] grepl <- base::grepl [18:41:45.002] restarts <- computeRestarts(cond) [18:41:45.002] for (restart in restarts) { [18:41:45.002] name <- restart$name [18:41:45.002] if (is.null(name)) [18:41:45.002] next [18:41:45.002] if (!grepl(pattern, name)) [18:41:45.002] next [18:41:45.002] invokeRestart(restart) [18:41:45.002] muffled <- TRUE [18:41:45.002] break [18:41:45.002] } [18:41:45.002] } [18:41:45.002] } [18:41:45.002] invisible(muffled) [18:41:45.002] } [18:41:45.002] muffleCondition(cond, pattern = "^muffle") [18:41:45.002] } [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] if (TRUE) { [18:41:45.002] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.002] { [18:41:45.002] inherits <- base::inherits [18:41:45.002] invokeRestart <- base::invokeRestart [18:41:45.002] is.null <- base::is.null [18:41:45.002] muffled <- FALSE [18:41:45.002] if (inherits(cond, "message")) { [18:41:45.002] muffled <- grepl(pattern, "muffleMessage") [18:41:45.002] if (muffled) [18:41:45.002] invokeRestart("muffleMessage") [18:41:45.002] } [18:41:45.002] else if (inherits(cond, "warning")) { [18:41:45.002] muffled <- grepl(pattern, "muffleWarning") [18:41:45.002] if (muffled) [18:41:45.002] invokeRestart("muffleWarning") [18:41:45.002] } [18:41:45.002] else if (inherits(cond, "condition")) { [18:41:45.002] if (!is.null(pattern)) { [18:41:45.002] computeRestarts <- base::computeRestarts [18:41:45.002] grepl <- base::grepl [18:41:45.002] restarts <- computeRestarts(cond) [18:41:45.002] for (restart in restarts) { [18:41:45.002] name <- restart$name [18:41:45.002] if (is.null(name)) [18:41:45.002] next [18:41:45.002] if (!grepl(pattern, name)) [18:41:45.002] next [18:41:45.002] invokeRestart(restart) [18:41:45.002] muffled <- TRUE [18:41:45.002] break [18:41:45.002] } [18:41:45.002] } [18:41:45.002] } [18:41:45.002] invisible(muffled) [18:41:45.002] } [18:41:45.002] muffleCondition(cond, pattern = "^muffle") [18:41:45.002] } [18:41:45.002] } [18:41:45.002] } [18:41:45.002] })) [18:41:45.002] }, error = function(ex) { [18:41:45.002] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.002] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.002] ...future.rng), started = ...future.startTime, [18:41:45.002] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.002] version = "1.8"), class = "FutureResult") [18:41:45.002] }, finally = { [18:41:45.002] if (!identical(...future.workdir, getwd())) [18:41:45.002] setwd(...future.workdir) [18:41:45.002] { [18:41:45.002] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.002] ...future.oldOptions$nwarnings <- NULL [18:41:45.002] } [18:41:45.002] base::options(...future.oldOptions) [18:41:45.002] if (.Platform$OS.type == "windows") { [18:41:45.002] old_names <- names(...future.oldEnvVars) [18:41:45.002] envs <- base::Sys.getenv() [18:41:45.002] names <- names(envs) [18:41:45.002] common <- intersect(names, old_names) [18:41:45.002] added <- setdiff(names, old_names) [18:41:45.002] removed <- setdiff(old_names, names) [18:41:45.002] changed <- common[...future.oldEnvVars[common] != [18:41:45.002] envs[common]] [18:41:45.002] NAMES <- toupper(changed) [18:41:45.002] args <- list() [18:41:45.002] for (kk in seq_along(NAMES)) { [18:41:45.002] name <- changed[[kk]] [18:41:45.002] NAME <- NAMES[[kk]] [18:41:45.002] if (name != NAME && is.element(NAME, old_names)) [18:41:45.002] next [18:41:45.002] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.002] } [18:41:45.002] NAMES <- toupper(added) [18:41:45.002] for (kk in seq_along(NAMES)) { [18:41:45.002] name <- added[[kk]] [18:41:45.002] NAME <- NAMES[[kk]] [18:41:45.002] if (name != NAME && is.element(NAME, old_names)) [18:41:45.002] next [18:41:45.002] args[[name]] <- "" [18:41:45.002] } [18:41:45.002] NAMES <- toupper(removed) [18:41:45.002] for (kk in seq_along(NAMES)) { [18:41:45.002] name <- removed[[kk]] [18:41:45.002] NAME <- NAMES[[kk]] [18:41:45.002] if (name != NAME && is.element(NAME, old_names)) [18:41:45.002] next [18:41:45.002] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.002] } [18:41:45.002] if (length(args) > 0) [18:41:45.002] base::do.call(base::Sys.setenv, args = args) [18:41:45.002] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.002] } [18:41:45.002] { [18:41:45.002] if (base::length(...future.futureOptionsAdded) > [18:41:45.002] 0L) { [18:41:45.002] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.002] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.002] base::options(opts) [18:41:45.002] } [18:41:45.002] { [18:41:45.002] { [18:41:45.002] NULL [18:41:45.002] RNGkind("Mersenne-Twister") [18:41:45.002] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.002] inherits = FALSE) [18:41:45.002] } [18:41:45.002] options(future.plan = NULL) [18:41:45.002] if (is.na(NA_character_)) [18:41:45.002] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.002] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.002] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.002] .init = FALSE) [18:41:45.002] } [18:41:45.002] } [18:41:45.002] } [18:41:45.002] }) [18:41:45.002] if (TRUE) { [18:41:45.002] base::sink(type = "output", split = FALSE) [18:41:45.002] if (TRUE) { [18:41:45.002] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.002] } [18:41:45.002] else { [18:41:45.002] ...future.result["stdout"] <- base::list(NULL) [18:41:45.002] } [18:41:45.002] base::close(...future.stdout) [18:41:45.002] ...future.stdout <- NULL [18:41:45.002] } [18:41:45.002] ...future.result$conditions <- ...future.conditions [18:41:45.002] ...future.result$finished <- base::Sys.time() [18:41:45.002] ...future.result [18:41:45.002] } [18:41:45.009] assign_globals() ... [18:41:45.009] List of 5 [18:41:45.009] $ ...future.FUN :function (x, ...) [18:41:45.009] $ future.call.arguments : list() [18:41:45.009] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.009] $ ...future.elements_ii :List of 4 [18:41:45.009] ..$ A: num 50 [18:41:45.009] ..$ B: num 60 [18:41:45.009] ..$ C: num 70 [18:41:45.009] ..$ D: num 80 [18:41:45.009] $ ...future.seeds_ii : NULL [18:41:45.009] $ ...future.globals.maxSize: NULL [18:41:45.009] - attr(*, "where")=List of 5 [18:41:45.009] ..$ ...future.FUN : [18:41:45.009] ..$ future.call.arguments : [18:41:45.009] ..$ ...future.elements_ii : [18:41:45.009] ..$ ...future.seeds_ii : [18:41:45.009] ..$ ...future.globals.maxSize: [18:41:45.009] - attr(*, "resolved")= logi FALSE [18:41:45.009] - attr(*, "total_size")= num 5150 [18:41:45.009] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.009] - attr(*, "already-done")= logi TRUE [18:41:45.021] - copied '...future.FUN' to environment [18:41:45.022] - copied 'future.call.arguments' to environment [18:41:45.022] - copied '...future.elements_ii' to environment [18:41:45.022] - copied '...future.seeds_ii' to environment [18:41:45.023] - copied '...future.globals.maxSize' to environment [18:41:45.023] assign_globals() ... done [18:41:45.024] plan(): Setting new future strategy stack: [18:41:45.024] List of future strategies: [18:41:45.024] 1. sequential: [18:41:45.024] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.024] - tweaked: FALSE [18:41:45.024] - call: NULL [18:41:45.025] plan(): nbrOfWorkers() = 1 [18:41:45.027] plan(): Setting new future strategy stack: [18:41:45.028] List of future strategies: [18:41:45.028] 1. sequential: [18:41:45.028] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.028] - tweaked: FALSE [18:41:45.028] - call: plan(strategy) [18:41:45.029] plan(): nbrOfWorkers() = 1 [18:41:45.029] SequentialFuture started (and completed) [18:41:45.030] - Launch lazy future ... done [18:41:45.030] run() for 'SequentialFuture' ... done [18:41:45.030] Created future: [18:41:45.031] SequentialFuture: [18:41:45.031] Label: 'future_sapply-1' [18:41:45.031] Expression: [18:41:45.031] { [18:41:45.031] do.call(function(...) { [18:41:45.031] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.031] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.031] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.031] on.exit(options(oopts), add = TRUE) [18:41:45.031] } [18:41:45.031] { [18:41:45.031] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.031] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.031] ...future.FUN(...future.X_jj, ...) [18:41:45.031] }) [18:41:45.031] } [18:41:45.031] }, args = future.call.arguments) [18:41:45.031] } [18:41:45.031] Lazy evaluation: FALSE [18:41:45.031] Asynchronous evaluation: FALSE [18:41:45.031] Local evaluation: TRUE [18:41:45.031] Environment: R_GlobalEnv [18:41:45.031] Capture standard output: TRUE [18:41:45.031] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.031] Globals: 5 objects totaling 593 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:45.031] Packages: [18:41:45.031] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.031] Resolved: TRUE [18:41:45.031] Value: 218 bytes of class 'list' [18:41:45.031] Early signaling: FALSE [18:41:45.031] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.031] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.033] Chunk #1 of 1 ... DONE [18:41:45.033] Launching 1 futures (chunks) ... DONE [18:41:45.033] Resolving 1 futures (chunks) ... [18:41:45.033] resolve() on list ... [18:41:45.034] recursive: 0 [18:41:45.034] length: 1 [18:41:45.034] [18:41:45.035] resolved() for 'SequentialFuture' ... [18:41:45.035] - state: 'finished' [18:41:45.035] - run: TRUE [18:41:45.036] - result: 'FutureResult' [18:41:45.036] resolved() for 'SequentialFuture' ... done [18:41:45.036] Future #1 [18:41:45.037] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.037] - nx: 1 [18:41:45.037] - relay: TRUE [18:41:45.038] - stdout: TRUE [18:41:45.038] - signal: TRUE [18:41:45.038] - resignal: FALSE [18:41:45.038] - force: TRUE [18:41:45.039] - relayed: [n=1] FALSE [18:41:45.039] - queued futures: [n=1] FALSE [18:41:45.039] - until=1 [18:41:45.040] - relaying element #1 [18:41:45.040] - relayed: [n=1] TRUE [18:41:45.040] - queued futures: [n=1] TRUE [18:41:45.041] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.041] length: 0 (resolved future 1) [18:41:45.041] Relaying remaining futures [18:41:45.042] signalConditionsASAP(NULL, pos=0) ... [18:41:45.042] - nx: 1 [18:41:45.042] - relay: TRUE [18:41:45.042] - stdout: TRUE [18:41:45.043] - signal: TRUE [18:41:45.043] - resignal: FALSE [18:41:45.043] - force: TRUE [18:41:45.043] - relayed: [n=1] TRUE [18:41:45.044] - queued futures: [n=1] TRUE - flush all [18:41:45.044] - relayed: [n=1] TRUE [18:41:45.044] - queued futures: [n=1] TRUE [18:41:45.045] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.045] resolve() on list ... DONE [18:41:45.045] - Number of value chunks collected: 1 [18:41:45.046] Resolving 1 futures (chunks) ... DONE [18:41:45.046] Reducing values from 1 chunks ... [18:41:45.046] - Number of values collected after concatenation: 4 [18:41:45.047] - Number of values expected: 4 [18:41:45.047] Reducing values from 1 chunks ... DONE [18:41:45.047] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:45.051] future_lapply() ... [18:41:45.053] Number of chunks: 1 [18:41:45.053] getGlobalsAndPackagesXApply() ... [18:41:45.053] - future.globals: TRUE [18:41:45.053] getGlobalsAndPackages() ... [18:41:45.054] Searching for globals... [18:41:45.057] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:45.057] Searching for globals ... DONE [18:41:45.058] Resolving globals: FALSE [18:41:45.059] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:45.059] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:45.060] - globals: [1] 'FUN' [18:41:45.060] [18:41:45.060] getGlobalsAndPackages() ... DONE [18:41:45.060] - globals found/used: [n=1] 'FUN' [18:41:45.061] - needed namespaces: [n=0] [18:41:45.061] Finding globals ... DONE [18:41:45.061] - use_args: TRUE [18:41:45.062] - Getting '...' globals ... [18:41:45.062] resolve() on list ... [18:41:45.063] recursive: 0 [18:41:45.063] length: 1 [18:41:45.063] elements: '...' [18:41:45.064] length: 0 (resolved future 1) [18:41:45.064] resolve() on list ... DONE [18:41:45.064] - '...' content: [n=0] [18:41:45.065] List of 1 [18:41:45.065] $ ...: list() [18:41:45.065] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.065] - attr(*, "where")=List of 1 [18:41:45.065] ..$ ...: [18:41:45.065] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.065] - attr(*, "resolved")= logi TRUE [18:41:45.065] - attr(*, "total_size")= num NA [18:41:45.070] - Getting '...' globals ... DONE [18:41:45.070] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:45.071] List of 2 [18:41:45.071] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:45.071] $ ... : list() [18:41:45.071] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.071] - attr(*, "where")=List of 2 [18:41:45.071] ..$ ...future.FUN: [18:41:45.071] ..$ ... : [18:41:45.071] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.071] - attr(*, "resolved")= logi FALSE [18:41:45.071] - attr(*, "total_size")= int 6632 [18:41:45.077] Packages to be attached in all futures: [n=0] [18:41:45.077] getGlobalsAndPackagesXApply() ... DONE [18:41:45.077] Number of futures (= number of chunks): 1 [18:41:45.078] Launching 1 futures (chunks) ... [18:41:45.078] Chunk #1 of 1 ... [18:41:45.078] - Finding globals in 'X' for chunk #1 ... [18:41:45.079] getGlobalsAndPackages() ... [18:41:45.079] Searching for globals... [18:41:45.079] [18:41:45.080] Searching for globals ... DONE [18:41:45.080] - globals: [0] [18:41:45.080] getGlobalsAndPackages() ... DONE [18:41:45.081] + additional globals found: [n=0] [18:41:45.081] + additional namespaces needed: [n=0] [18:41:45.081] - Finding globals in 'X' for chunk #1 ... DONE [18:41:45.081] - seeds: [18:41:45.082] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.082] getGlobalsAndPackages() ... [18:41:45.082] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.083] Resolving globals: FALSE [18:41:45.083] Tweak future expression to call with '...' arguments ... [18:41:45.083] { [18:41:45.083] do.call(function(...) { [18:41:45.083] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.083] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.083] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.083] on.exit(options(oopts), add = TRUE) [18:41:45.083] } [18:41:45.083] { [18:41:45.083] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.083] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.083] ...future.FUN(...future.X_jj, ...) [18:41:45.083] }) [18:41:45.083] } [18:41:45.083] }, args = future.call.arguments) [18:41:45.083] } [18:41:45.084] Tweak future expression to call with '...' arguments ... DONE [18:41:45.085] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.085] [18:41:45.086] getGlobalsAndPackages() ... DONE [18:41:45.086] run() for 'Future' ... [18:41:45.087] - state: 'created' [18:41:45.087] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:45.088] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.088] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:45.088] - Field: 'label' [18:41:45.089] - Field: 'local' [18:41:45.089] - Field: 'owner' [18:41:45.089] - Field: 'envir' [18:41:45.090] - Field: 'packages' [18:41:45.090] - Field: 'gc' [18:41:45.090] - Field: 'conditions' [18:41:45.091] - Field: 'expr' [18:41:45.091] - Field: 'uuid' [18:41:45.091] - Field: 'seed' [18:41:45.091] - Field: 'version' [18:41:45.092] - Field: 'result' [18:41:45.096] - Field: 'asynchronous' [18:41:45.096] - Field: 'calls' [18:41:45.097] - Field: 'globals' [18:41:45.097] - Field: 'stdout' [18:41:45.097] - Field: 'earlySignal' [18:41:45.098] - Field: 'lazy' [18:41:45.098] - Field: 'state' [18:41:45.098] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.099] - Launch lazy future ... [18:41:45.099] Packages needed by the future expression (n = 0): [18:41:45.099] Packages needed by future strategies (n = 0): [18:41:45.100] { [18:41:45.100] { [18:41:45.100] { [18:41:45.100] ...future.startTime <- base::Sys.time() [18:41:45.100] { [18:41:45.100] { [18:41:45.100] { [18:41:45.100] base::local({ [18:41:45.100] has_future <- base::requireNamespace("future", [18:41:45.100] quietly = TRUE) [18:41:45.100] if (has_future) { [18:41:45.100] ns <- base::getNamespace("future") [18:41:45.100] version <- ns[[".package"]][["version"]] [18:41:45.100] if (is.null(version)) [18:41:45.100] version <- utils::packageVersion("future") [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] version <- NULL [18:41:45.100] } [18:41:45.100] if (!has_future || version < "1.8.0") { [18:41:45.100] info <- base::c(r_version = base::gsub("R version ", [18:41:45.100] "", base::R.version$version.string), [18:41:45.100] platform = base::sprintf("%s (%s-bit)", [18:41:45.100] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.100] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.100] "release", "version")], collapse = " "), [18:41:45.100] hostname = base::Sys.info()[["nodename"]]) [18:41:45.100] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.100] info) [18:41:45.100] info <- base::paste(info, collapse = "; ") [18:41:45.100] if (!has_future) { [18:41:45.100] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.100] info) [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.100] info, version) [18:41:45.100] } [18:41:45.100] base::stop(msg) [18:41:45.100] } [18:41:45.100] }) [18:41:45.100] } [18:41:45.100] ...future.strategy.old <- future::plan("list") [18:41:45.100] options(future.plan = NULL) [18:41:45.100] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.100] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.100] } [18:41:45.100] ...future.workdir <- getwd() [18:41:45.100] } [18:41:45.100] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.100] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.100] } [18:41:45.100] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.100] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.100] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.100] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.100] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.100] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.100] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.100] base::names(...future.oldOptions)) [18:41:45.100] } [18:41:45.100] if (FALSE) { [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] if (TRUE) { [18:41:45.100] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.100] open = "w") [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.100] windows = "NUL", "/dev/null"), open = "w") [18:41:45.100] } [18:41:45.100] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.100] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.100] base::sink(type = "output", split = FALSE) [18:41:45.100] base::close(...future.stdout) [18:41:45.100] }, add = TRUE) [18:41:45.100] } [18:41:45.100] ...future.frame <- base::sys.nframe() [18:41:45.100] ...future.conditions <- base::list() [18:41:45.100] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.100] if (FALSE) { [18:41:45.100] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.100] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.100] } [18:41:45.100] ...future.result <- base::tryCatch({ [18:41:45.100] base::withCallingHandlers({ [18:41:45.100] ...future.value <- base::withVisible(base::local({ [18:41:45.100] do.call(function(...) { [18:41:45.100] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.100] if (!identical(...future.globals.maxSize.org, [18:41:45.100] ...future.globals.maxSize)) { [18:41:45.100] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.100] on.exit(options(oopts), add = TRUE) [18:41:45.100] } [18:41:45.100] { [18:41:45.100] lapply(seq_along(...future.elements_ii), [18:41:45.100] FUN = function(jj) { [18:41:45.100] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.100] ...future.FUN(...future.X_jj, ...) [18:41:45.100] }) [18:41:45.100] } [18:41:45.100] }, args = future.call.arguments) [18:41:45.100] })) [18:41:45.100] future::FutureResult(value = ...future.value$value, [18:41:45.100] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.100] ...future.rng), globalenv = if (FALSE) [18:41:45.100] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.100] ...future.globalenv.names)) [18:41:45.100] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.100] }, condition = base::local({ [18:41:45.100] c <- base::c [18:41:45.100] inherits <- base::inherits [18:41:45.100] invokeRestart <- base::invokeRestart [18:41:45.100] length <- base::length [18:41:45.100] list <- base::list [18:41:45.100] seq.int <- base::seq.int [18:41:45.100] signalCondition <- base::signalCondition [18:41:45.100] sys.calls <- base::sys.calls [18:41:45.100] `[[` <- base::`[[` [18:41:45.100] `+` <- base::`+` [18:41:45.100] `<<-` <- base::`<<-` [18:41:45.100] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.100] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.100] 3L)] [18:41:45.100] } [18:41:45.100] function(cond) { [18:41:45.100] is_error <- inherits(cond, "error") [18:41:45.100] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.100] NULL) [18:41:45.100] if (is_error) { [18:41:45.100] sessionInformation <- function() { [18:41:45.100] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.100] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.100] search = base::search(), system = base::Sys.info()) [18:41:45.100] } [18:41:45.100] ...future.conditions[[length(...future.conditions) + [18:41:45.100] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.100] cond$call), session = sessionInformation(), [18:41:45.100] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.100] signalCondition(cond) [18:41:45.100] } [18:41:45.100] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.100] "immediateCondition"))) { [18:41:45.100] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.100] ...future.conditions[[length(...future.conditions) + [18:41:45.100] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.100] if (TRUE && !signal) { [18:41:45.100] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.100] { [18:41:45.100] inherits <- base::inherits [18:41:45.100] invokeRestart <- base::invokeRestart [18:41:45.100] is.null <- base::is.null [18:41:45.100] muffled <- FALSE [18:41:45.100] if (inherits(cond, "message")) { [18:41:45.100] muffled <- grepl(pattern, "muffleMessage") [18:41:45.100] if (muffled) [18:41:45.100] invokeRestart("muffleMessage") [18:41:45.100] } [18:41:45.100] else if (inherits(cond, "warning")) { [18:41:45.100] muffled <- grepl(pattern, "muffleWarning") [18:41:45.100] if (muffled) [18:41:45.100] invokeRestart("muffleWarning") [18:41:45.100] } [18:41:45.100] else if (inherits(cond, "condition")) { [18:41:45.100] if (!is.null(pattern)) { [18:41:45.100] computeRestarts <- base::computeRestarts [18:41:45.100] grepl <- base::grepl [18:41:45.100] restarts <- computeRestarts(cond) [18:41:45.100] for (restart in restarts) { [18:41:45.100] name <- restart$name [18:41:45.100] if (is.null(name)) [18:41:45.100] next [18:41:45.100] if (!grepl(pattern, name)) [18:41:45.100] next [18:41:45.100] invokeRestart(restart) [18:41:45.100] muffled <- TRUE [18:41:45.100] break [18:41:45.100] } [18:41:45.100] } [18:41:45.100] } [18:41:45.100] invisible(muffled) [18:41:45.100] } [18:41:45.100] muffleCondition(cond, pattern = "^muffle") [18:41:45.100] } [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] if (TRUE) { [18:41:45.100] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.100] { [18:41:45.100] inherits <- base::inherits [18:41:45.100] invokeRestart <- base::invokeRestart [18:41:45.100] is.null <- base::is.null [18:41:45.100] muffled <- FALSE [18:41:45.100] if (inherits(cond, "message")) { [18:41:45.100] muffled <- grepl(pattern, "muffleMessage") [18:41:45.100] if (muffled) [18:41:45.100] invokeRestart("muffleMessage") [18:41:45.100] } [18:41:45.100] else if (inherits(cond, "warning")) { [18:41:45.100] muffled <- grepl(pattern, "muffleWarning") [18:41:45.100] if (muffled) [18:41:45.100] invokeRestart("muffleWarning") [18:41:45.100] } [18:41:45.100] else if (inherits(cond, "condition")) { [18:41:45.100] if (!is.null(pattern)) { [18:41:45.100] computeRestarts <- base::computeRestarts [18:41:45.100] grepl <- base::grepl [18:41:45.100] restarts <- computeRestarts(cond) [18:41:45.100] for (restart in restarts) { [18:41:45.100] name <- restart$name [18:41:45.100] if (is.null(name)) [18:41:45.100] next [18:41:45.100] if (!grepl(pattern, name)) [18:41:45.100] next [18:41:45.100] invokeRestart(restart) [18:41:45.100] muffled <- TRUE [18:41:45.100] break [18:41:45.100] } [18:41:45.100] } [18:41:45.100] } [18:41:45.100] invisible(muffled) [18:41:45.100] } [18:41:45.100] muffleCondition(cond, pattern = "^muffle") [18:41:45.100] } [18:41:45.100] } [18:41:45.100] } [18:41:45.100] })) [18:41:45.100] }, error = function(ex) { [18:41:45.100] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.100] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.100] ...future.rng), started = ...future.startTime, [18:41:45.100] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.100] version = "1.8"), class = "FutureResult") [18:41:45.100] }, finally = { [18:41:45.100] if (!identical(...future.workdir, getwd())) [18:41:45.100] setwd(...future.workdir) [18:41:45.100] { [18:41:45.100] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.100] ...future.oldOptions$nwarnings <- NULL [18:41:45.100] } [18:41:45.100] base::options(...future.oldOptions) [18:41:45.100] if (.Platform$OS.type == "windows") { [18:41:45.100] old_names <- names(...future.oldEnvVars) [18:41:45.100] envs <- base::Sys.getenv() [18:41:45.100] names <- names(envs) [18:41:45.100] common <- intersect(names, old_names) [18:41:45.100] added <- setdiff(names, old_names) [18:41:45.100] removed <- setdiff(old_names, names) [18:41:45.100] changed <- common[...future.oldEnvVars[common] != [18:41:45.100] envs[common]] [18:41:45.100] NAMES <- toupper(changed) [18:41:45.100] args <- list() [18:41:45.100] for (kk in seq_along(NAMES)) { [18:41:45.100] name <- changed[[kk]] [18:41:45.100] NAME <- NAMES[[kk]] [18:41:45.100] if (name != NAME && is.element(NAME, old_names)) [18:41:45.100] next [18:41:45.100] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.100] } [18:41:45.100] NAMES <- toupper(added) [18:41:45.100] for (kk in seq_along(NAMES)) { [18:41:45.100] name <- added[[kk]] [18:41:45.100] NAME <- NAMES[[kk]] [18:41:45.100] if (name != NAME && is.element(NAME, old_names)) [18:41:45.100] next [18:41:45.100] args[[name]] <- "" [18:41:45.100] } [18:41:45.100] NAMES <- toupper(removed) [18:41:45.100] for (kk in seq_along(NAMES)) { [18:41:45.100] name <- removed[[kk]] [18:41:45.100] NAME <- NAMES[[kk]] [18:41:45.100] if (name != NAME && is.element(NAME, old_names)) [18:41:45.100] next [18:41:45.100] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.100] } [18:41:45.100] if (length(args) > 0) [18:41:45.100] base::do.call(base::Sys.setenv, args = args) [18:41:45.100] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.100] } [18:41:45.100] { [18:41:45.100] if (base::length(...future.futureOptionsAdded) > [18:41:45.100] 0L) { [18:41:45.100] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.100] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.100] base::options(opts) [18:41:45.100] } [18:41:45.100] { [18:41:45.100] { [18:41:45.100] NULL [18:41:45.100] RNGkind("Mersenne-Twister") [18:41:45.100] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.100] inherits = FALSE) [18:41:45.100] } [18:41:45.100] options(future.plan = NULL) [18:41:45.100] if (is.na(NA_character_)) [18:41:45.100] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.100] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.100] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.100] .init = FALSE) [18:41:45.100] } [18:41:45.100] } [18:41:45.100] } [18:41:45.100] }) [18:41:45.100] if (TRUE) { [18:41:45.100] base::sink(type = "output", split = FALSE) [18:41:45.100] if (TRUE) { [18:41:45.100] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.100] } [18:41:45.100] else { [18:41:45.100] ...future.result["stdout"] <- base::list(NULL) [18:41:45.100] } [18:41:45.100] base::close(...future.stdout) [18:41:45.100] ...future.stdout <- NULL [18:41:45.100] } [18:41:45.100] ...future.result$conditions <- ...future.conditions [18:41:45.100] ...future.result$finished <- base::Sys.time() [18:41:45.100] ...future.result [18:41:45.100] } [18:41:45.107] assign_globals() ... [18:41:45.107] List of 5 [18:41:45.107] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:45.107] $ future.call.arguments : list() [18:41:45.107] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.107] $ ...future.elements_ii :List of 4 [18:41:45.107] ..$ A: num 50 [18:41:45.107] ..$ B: num 60 [18:41:45.107] ..$ C: num 70 [18:41:45.107] ..$ D: num 80 [18:41:45.107] $ ...future.seeds_ii : NULL [18:41:45.107] $ ...future.globals.maxSize: NULL [18:41:45.107] - attr(*, "where")=List of 5 [18:41:45.107] ..$ ...future.FUN : [18:41:45.107] ..$ future.call.arguments : [18:41:45.107] ..$ ...future.elements_ii : [18:41:45.107] ..$ ...future.seeds_ii : [18:41:45.107] ..$ ...future.globals.maxSize: [18:41:45.107] - attr(*, "resolved")= logi FALSE [18:41:45.107] - attr(*, "total_size")= num 6632 [18:41:45.107] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.107] - attr(*, "already-done")= logi TRUE [18:41:45.119] - reassign environment for '...future.FUN' [18:41:45.120] - copied '...future.FUN' to environment [18:41:45.120] - copied 'future.call.arguments' to environment [18:41:45.120] - copied '...future.elements_ii' to environment [18:41:45.120] - copied '...future.seeds_ii' to environment [18:41:45.121] - copied '...future.globals.maxSize' to environment [18:41:45.121] assign_globals() ... done [18:41:45.122] plan(): Setting new future strategy stack: [18:41:45.122] List of future strategies: [18:41:45.122] 1. sequential: [18:41:45.122] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.122] - tweaked: FALSE [18:41:45.122] - call: NULL [18:41:45.123] plan(): nbrOfWorkers() = 1 [18:41:45.125] plan(): Setting new future strategy stack: [18:41:45.126] List of future strategies: [18:41:45.126] 1. sequential: [18:41:45.126] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.126] - tweaked: FALSE [18:41:45.126] - call: plan(strategy) [18:41:45.127] plan(): nbrOfWorkers() = 1 [18:41:45.127] SequentialFuture started (and completed) [18:41:45.127] - Launch lazy future ... done [18:41:45.128] run() for 'SequentialFuture' ... done [18:41:45.128] Created future: [18:41:45.128] SequentialFuture: [18:41:45.128] Label: 'future_sapply-1' [18:41:45.128] Expression: [18:41:45.128] { [18:41:45.128] do.call(function(...) { [18:41:45.128] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.128] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.128] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.128] on.exit(options(oopts), add = TRUE) [18:41:45.128] } [18:41:45.128] { [18:41:45.128] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.128] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.128] ...future.FUN(...future.X_jj, ...) [18:41:45.128] }) [18:41:45.128] } [18:41:45.128] }, args = future.call.arguments) [18:41:45.128] } [18:41:45.128] Lazy evaluation: FALSE [18:41:45.128] Asynchronous evaluation: FALSE [18:41:45.128] Local evaluation: TRUE [18:41:45.128] Environment: R_GlobalEnv [18:41:45.128] Capture standard output: TRUE [18:41:45.128] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.128] Globals: 5 objects totaling 1.07 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:45.128] Packages: [18:41:45.128] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.128] Resolved: TRUE [18:41:45.128] Value: 666 bytes of class 'list' [18:41:45.128] Early signaling: FALSE [18:41:45.128] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.128] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.130] Chunk #1 of 1 ... DONE [18:41:45.130] Launching 1 futures (chunks) ... DONE [18:41:45.131] Resolving 1 futures (chunks) ... [18:41:45.131] resolve() on list ... [18:41:45.131] recursive: 0 [18:41:45.132] length: 1 [18:41:45.132] [18:41:45.132] resolved() for 'SequentialFuture' ... [18:41:45.133] - state: 'finished' [18:41:45.133] - run: TRUE [18:41:45.133] - result: 'FutureResult' [18:41:45.133] resolved() for 'SequentialFuture' ... done [18:41:45.134] Future #1 [18:41:45.134] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.134] - nx: 1 [18:41:45.135] - relay: TRUE [18:41:45.135] - stdout: TRUE [18:41:45.135] - signal: TRUE [18:41:45.136] - resignal: FALSE [18:41:45.136] - force: TRUE [18:41:45.136] - relayed: [n=1] FALSE [18:41:45.136] - queued futures: [n=1] FALSE [18:41:45.137] - until=1 [18:41:45.137] - relaying element #1 [18:41:45.137] - relayed: [n=1] TRUE [18:41:45.138] - queued futures: [n=1] TRUE [18:41:45.138] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.138] length: 0 (resolved future 1) [18:41:45.139] Relaying remaining futures [18:41:45.139] signalConditionsASAP(NULL, pos=0) ... [18:41:45.139] - nx: 1 [18:41:45.139] - relay: TRUE [18:41:45.140] - stdout: TRUE [18:41:45.140] - signal: TRUE [18:41:45.140] - resignal: FALSE [18:41:45.140] - force: TRUE [18:41:45.141] - relayed: [n=1] TRUE [18:41:45.141] - queued futures: [n=1] TRUE - flush all [18:41:45.141] - relayed: [n=1] TRUE [18:41:45.142] - queued futures: [n=1] TRUE [18:41:45.142] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.142] resolve() on list ... DONE [18:41:45.143] - Number of value chunks collected: 1 [18:41:45.143] Resolving 1 futures (chunks) ... DONE [18:41:45.143] Reducing values from 1 chunks ... [18:41:45.143] - Number of values collected after concatenation: 4 [18:41:45.144] - Number of values expected: 4 [18:41:45.144] Reducing values from 1 chunks ... DONE [18:41:45.144] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:45.150] future_lapply() ... [18:41:45.151] Number of chunks: 1 [18:41:45.151] getGlobalsAndPackagesXApply() ... [18:41:45.152] - future.globals: TRUE [18:41:45.152] getGlobalsAndPackages() ... [18:41:45.152] Searching for globals... [18:41:45.154] - globals found: [1] 'FUN' [18:41:45.154] Searching for globals ... DONE [18:41:45.155] Resolving globals: FALSE [18:41:45.155] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:45.156] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:45.156] - globals: [1] 'FUN' [18:41:45.157] [18:41:45.157] getGlobalsAndPackages() ... DONE [18:41:45.157] - globals found/used: [n=1] 'FUN' [18:41:45.158] - needed namespaces: [n=0] [18:41:45.158] Finding globals ... DONE [18:41:45.158] - use_args: TRUE [18:41:45.158] - Getting '...' globals ... [18:41:45.159] resolve() on list ... [18:41:45.159] recursive: 0 [18:41:45.160] length: 1 [18:41:45.160] elements: '...' [18:41:45.160] length: 0 (resolved future 1) [18:41:45.161] resolve() on list ... DONE [18:41:45.161] - '...' content: [n=0] [18:41:45.161] List of 1 [18:41:45.161] $ ...: list() [18:41:45.161] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.161] - attr(*, "where")=List of 1 [18:41:45.161] ..$ ...: [18:41:45.161] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.161] - attr(*, "resolved")= logi TRUE [18:41:45.161] - attr(*, "total_size")= num NA [18:41:45.166] - Getting '...' globals ... DONE [18:41:45.167] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:45.167] List of 2 [18:41:45.167] $ ...future.FUN:function (x) [18:41:45.167] $ ... : list() [18:41:45.167] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.167] - attr(*, "where")=List of 2 [18:41:45.167] ..$ ...future.FUN: [18:41:45.167] ..$ ... : [18:41:45.167] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.167] - attr(*, "resolved")= logi FALSE [18:41:45.167] - attr(*, "total_size")= int 4910 [18:41:45.173] Packages to be attached in all futures: [n=0] [18:41:45.173] getGlobalsAndPackagesXApply() ... DONE [18:41:45.174] Number of futures (= number of chunks): 1 [18:41:45.174] Launching 1 futures (chunks) ... [18:41:45.174] Chunk #1 of 1 ... [18:41:45.175] - Finding globals in 'X' for chunk #1 ... [18:41:45.175] getGlobalsAndPackages() ... [18:41:45.175] Searching for globals... [18:41:45.176] [18:41:45.176] Searching for globals ... DONE [18:41:45.176] - globals: [0] [18:41:45.177] getGlobalsAndPackages() ... DONE [18:41:45.177] + additional globals found: [n=0] [18:41:45.177] + additional namespaces needed: [n=0] [18:41:45.177] - Finding globals in 'X' for chunk #1 ... DONE [18:41:45.178] - seeds: [18:41:45.178] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.178] getGlobalsAndPackages() ... [18:41:45.179] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.179] Resolving globals: FALSE [18:41:45.179] Tweak future expression to call with '...' arguments ... [18:41:45.180] { [18:41:45.180] do.call(function(...) { [18:41:45.180] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.180] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.180] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.180] on.exit(options(oopts), add = TRUE) [18:41:45.180] } [18:41:45.180] { [18:41:45.180] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.180] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.180] ...future.FUN(...future.X_jj, ...) [18:41:45.180] }) [18:41:45.180] } [18:41:45.180] }, args = future.call.arguments) [18:41:45.180] } [18:41:45.180] Tweak future expression to call with '...' arguments ... DONE [18:41:45.181] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.181] [18:41:45.182] getGlobalsAndPackages() ... DONE [18:41:45.182] run() for 'Future' ... [18:41:45.183] - state: 'created' [18:41:45.183] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:45.184] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.184] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:45.184] - Field: 'label' [18:41:45.185] - Field: 'local' [18:41:45.185] - Field: 'owner' [18:41:45.185] - Field: 'envir' [18:41:45.186] - Field: 'packages' [18:41:45.186] - Field: 'gc' [18:41:45.186] - Field: 'conditions' [18:41:45.187] - Field: 'expr' [18:41:45.187] - Field: 'uuid' [18:41:45.187] - Field: 'seed' [18:41:45.187] - Field: 'version' [18:41:45.188] - Field: 'result' [18:41:45.188] - Field: 'asynchronous' [18:41:45.188] - Field: 'calls' [18:41:45.189] - Field: 'globals' [18:41:45.189] - Field: 'stdout' [18:41:45.189] - Field: 'earlySignal' [18:41:45.190] - Field: 'lazy' [18:41:45.190] - Field: 'state' [18:41:45.190] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.190] - Launch lazy future ... [18:41:45.191] Packages needed by the future expression (n = 0): [18:41:45.191] Packages needed by future strategies (n = 0): [18:41:45.192] { [18:41:45.192] { [18:41:45.192] { [18:41:45.192] ...future.startTime <- base::Sys.time() [18:41:45.192] { [18:41:45.192] { [18:41:45.192] { [18:41:45.192] base::local({ [18:41:45.192] has_future <- base::requireNamespace("future", [18:41:45.192] quietly = TRUE) [18:41:45.192] if (has_future) { [18:41:45.192] ns <- base::getNamespace("future") [18:41:45.192] version <- ns[[".package"]][["version"]] [18:41:45.192] if (is.null(version)) [18:41:45.192] version <- utils::packageVersion("future") [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] version <- NULL [18:41:45.192] } [18:41:45.192] if (!has_future || version < "1.8.0") { [18:41:45.192] info <- base::c(r_version = base::gsub("R version ", [18:41:45.192] "", base::R.version$version.string), [18:41:45.192] platform = base::sprintf("%s (%s-bit)", [18:41:45.192] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.192] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.192] "release", "version")], collapse = " "), [18:41:45.192] hostname = base::Sys.info()[["nodename"]]) [18:41:45.192] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.192] info) [18:41:45.192] info <- base::paste(info, collapse = "; ") [18:41:45.192] if (!has_future) { [18:41:45.192] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.192] info) [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.192] info, version) [18:41:45.192] } [18:41:45.192] base::stop(msg) [18:41:45.192] } [18:41:45.192] }) [18:41:45.192] } [18:41:45.192] ...future.strategy.old <- future::plan("list") [18:41:45.192] options(future.plan = NULL) [18:41:45.192] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.192] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.192] } [18:41:45.192] ...future.workdir <- getwd() [18:41:45.192] } [18:41:45.192] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.192] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.192] } [18:41:45.192] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.192] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.192] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.192] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.192] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.192] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.192] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.192] base::names(...future.oldOptions)) [18:41:45.192] } [18:41:45.192] if (FALSE) { [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] if (TRUE) { [18:41:45.192] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.192] open = "w") [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.192] windows = "NUL", "/dev/null"), open = "w") [18:41:45.192] } [18:41:45.192] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.192] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.192] base::sink(type = "output", split = FALSE) [18:41:45.192] base::close(...future.stdout) [18:41:45.192] }, add = TRUE) [18:41:45.192] } [18:41:45.192] ...future.frame <- base::sys.nframe() [18:41:45.192] ...future.conditions <- base::list() [18:41:45.192] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.192] if (FALSE) { [18:41:45.192] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.192] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.192] } [18:41:45.192] ...future.result <- base::tryCatch({ [18:41:45.192] base::withCallingHandlers({ [18:41:45.192] ...future.value <- base::withVisible(base::local({ [18:41:45.192] do.call(function(...) { [18:41:45.192] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.192] if (!identical(...future.globals.maxSize.org, [18:41:45.192] ...future.globals.maxSize)) { [18:41:45.192] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.192] on.exit(options(oopts), add = TRUE) [18:41:45.192] } [18:41:45.192] { [18:41:45.192] lapply(seq_along(...future.elements_ii), [18:41:45.192] FUN = function(jj) { [18:41:45.192] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.192] ...future.FUN(...future.X_jj, ...) [18:41:45.192] }) [18:41:45.192] } [18:41:45.192] }, args = future.call.arguments) [18:41:45.192] })) [18:41:45.192] future::FutureResult(value = ...future.value$value, [18:41:45.192] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.192] ...future.rng), globalenv = if (FALSE) [18:41:45.192] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.192] ...future.globalenv.names)) [18:41:45.192] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.192] }, condition = base::local({ [18:41:45.192] c <- base::c [18:41:45.192] inherits <- base::inherits [18:41:45.192] invokeRestart <- base::invokeRestart [18:41:45.192] length <- base::length [18:41:45.192] list <- base::list [18:41:45.192] seq.int <- base::seq.int [18:41:45.192] signalCondition <- base::signalCondition [18:41:45.192] sys.calls <- base::sys.calls [18:41:45.192] `[[` <- base::`[[` [18:41:45.192] `+` <- base::`+` [18:41:45.192] `<<-` <- base::`<<-` [18:41:45.192] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.192] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.192] 3L)] [18:41:45.192] } [18:41:45.192] function(cond) { [18:41:45.192] is_error <- inherits(cond, "error") [18:41:45.192] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.192] NULL) [18:41:45.192] if (is_error) { [18:41:45.192] sessionInformation <- function() { [18:41:45.192] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.192] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.192] search = base::search(), system = base::Sys.info()) [18:41:45.192] } [18:41:45.192] ...future.conditions[[length(...future.conditions) + [18:41:45.192] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.192] cond$call), session = sessionInformation(), [18:41:45.192] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.192] signalCondition(cond) [18:41:45.192] } [18:41:45.192] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.192] "immediateCondition"))) { [18:41:45.192] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.192] ...future.conditions[[length(...future.conditions) + [18:41:45.192] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.192] if (TRUE && !signal) { [18:41:45.192] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.192] { [18:41:45.192] inherits <- base::inherits [18:41:45.192] invokeRestart <- base::invokeRestart [18:41:45.192] is.null <- base::is.null [18:41:45.192] muffled <- FALSE [18:41:45.192] if (inherits(cond, "message")) { [18:41:45.192] muffled <- grepl(pattern, "muffleMessage") [18:41:45.192] if (muffled) [18:41:45.192] invokeRestart("muffleMessage") [18:41:45.192] } [18:41:45.192] else if (inherits(cond, "warning")) { [18:41:45.192] muffled <- grepl(pattern, "muffleWarning") [18:41:45.192] if (muffled) [18:41:45.192] invokeRestart("muffleWarning") [18:41:45.192] } [18:41:45.192] else if (inherits(cond, "condition")) { [18:41:45.192] if (!is.null(pattern)) { [18:41:45.192] computeRestarts <- base::computeRestarts [18:41:45.192] grepl <- base::grepl [18:41:45.192] restarts <- computeRestarts(cond) [18:41:45.192] for (restart in restarts) { [18:41:45.192] name <- restart$name [18:41:45.192] if (is.null(name)) [18:41:45.192] next [18:41:45.192] if (!grepl(pattern, name)) [18:41:45.192] next [18:41:45.192] invokeRestart(restart) [18:41:45.192] muffled <- TRUE [18:41:45.192] break [18:41:45.192] } [18:41:45.192] } [18:41:45.192] } [18:41:45.192] invisible(muffled) [18:41:45.192] } [18:41:45.192] muffleCondition(cond, pattern = "^muffle") [18:41:45.192] } [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] if (TRUE) { [18:41:45.192] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.192] { [18:41:45.192] inherits <- base::inherits [18:41:45.192] invokeRestart <- base::invokeRestart [18:41:45.192] is.null <- base::is.null [18:41:45.192] muffled <- FALSE [18:41:45.192] if (inherits(cond, "message")) { [18:41:45.192] muffled <- grepl(pattern, "muffleMessage") [18:41:45.192] if (muffled) [18:41:45.192] invokeRestart("muffleMessage") [18:41:45.192] } [18:41:45.192] else if (inherits(cond, "warning")) { [18:41:45.192] muffled <- grepl(pattern, "muffleWarning") [18:41:45.192] if (muffled) [18:41:45.192] invokeRestart("muffleWarning") [18:41:45.192] } [18:41:45.192] else if (inherits(cond, "condition")) { [18:41:45.192] if (!is.null(pattern)) { [18:41:45.192] computeRestarts <- base::computeRestarts [18:41:45.192] grepl <- base::grepl [18:41:45.192] restarts <- computeRestarts(cond) [18:41:45.192] for (restart in restarts) { [18:41:45.192] name <- restart$name [18:41:45.192] if (is.null(name)) [18:41:45.192] next [18:41:45.192] if (!grepl(pattern, name)) [18:41:45.192] next [18:41:45.192] invokeRestart(restart) [18:41:45.192] muffled <- TRUE [18:41:45.192] break [18:41:45.192] } [18:41:45.192] } [18:41:45.192] } [18:41:45.192] invisible(muffled) [18:41:45.192] } [18:41:45.192] muffleCondition(cond, pattern = "^muffle") [18:41:45.192] } [18:41:45.192] } [18:41:45.192] } [18:41:45.192] })) [18:41:45.192] }, error = function(ex) { [18:41:45.192] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.192] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.192] ...future.rng), started = ...future.startTime, [18:41:45.192] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.192] version = "1.8"), class = "FutureResult") [18:41:45.192] }, finally = { [18:41:45.192] if (!identical(...future.workdir, getwd())) [18:41:45.192] setwd(...future.workdir) [18:41:45.192] { [18:41:45.192] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.192] ...future.oldOptions$nwarnings <- NULL [18:41:45.192] } [18:41:45.192] base::options(...future.oldOptions) [18:41:45.192] if (.Platform$OS.type == "windows") { [18:41:45.192] old_names <- names(...future.oldEnvVars) [18:41:45.192] envs <- base::Sys.getenv() [18:41:45.192] names <- names(envs) [18:41:45.192] common <- intersect(names, old_names) [18:41:45.192] added <- setdiff(names, old_names) [18:41:45.192] removed <- setdiff(old_names, names) [18:41:45.192] changed <- common[...future.oldEnvVars[common] != [18:41:45.192] envs[common]] [18:41:45.192] NAMES <- toupper(changed) [18:41:45.192] args <- list() [18:41:45.192] for (kk in seq_along(NAMES)) { [18:41:45.192] name <- changed[[kk]] [18:41:45.192] NAME <- NAMES[[kk]] [18:41:45.192] if (name != NAME && is.element(NAME, old_names)) [18:41:45.192] next [18:41:45.192] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.192] } [18:41:45.192] NAMES <- toupper(added) [18:41:45.192] for (kk in seq_along(NAMES)) { [18:41:45.192] name <- added[[kk]] [18:41:45.192] NAME <- NAMES[[kk]] [18:41:45.192] if (name != NAME && is.element(NAME, old_names)) [18:41:45.192] next [18:41:45.192] args[[name]] <- "" [18:41:45.192] } [18:41:45.192] NAMES <- toupper(removed) [18:41:45.192] for (kk in seq_along(NAMES)) { [18:41:45.192] name <- removed[[kk]] [18:41:45.192] NAME <- NAMES[[kk]] [18:41:45.192] if (name != NAME && is.element(NAME, old_names)) [18:41:45.192] next [18:41:45.192] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.192] } [18:41:45.192] if (length(args) > 0) [18:41:45.192] base::do.call(base::Sys.setenv, args = args) [18:41:45.192] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.192] } [18:41:45.192] { [18:41:45.192] if (base::length(...future.futureOptionsAdded) > [18:41:45.192] 0L) { [18:41:45.192] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.192] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.192] base::options(opts) [18:41:45.192] } [18:41:45.192] { [18:41:45.192] { [18:41:45.192] NULL [18:41:45.192] RNGkind("Mersenne-Twister") [18:41:45.192] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.192] inherits = FALSE) [18:41:45.192] } [18:41:45.192] options(future.plan = NULL) [18:41:45.192] if (is.na(NA_character_)) [18:41:45.192] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.192] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.192] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.192] .init = FALSE) [18:41:45.192] } [18:41:45.192] } [18:41:45.192] } [18:41:45.192] }) [18:41:45.192] if (TRUE) { [18:41:45.192] base::sink(type = "output", split = FALSE) [18:41:45.192] if (TRUE) { [18:41:45.192] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.192] } [18:41:45.192] else { [18:41:45.192] ...future.result["stdout"] <- base::list(NULL) [18:41:45.192] } [18:41:45.192] base::close(...future.stdout) [18:41:45.192] ...future.stdout <- NULL [18:41:45.192] } [18:41:45.192] ...future.result$conditions <- ...future.conditions [18:41:45.192] ...future.result$finished <- base::Sys.time() [18:41:45.192] ...future.result [18:41:45.192] } [18:41:45.199] assign_globals() ... [18:41:45.199] List of 5 [18:41:45.199] $ ...future.FUN :function (x) [18:41:45.199] $ future.call.arguments : list() [18:41:45.199] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.199] $ ...future.elements_ii :List of 4 [18:41:45.199] ..$ A: num 50 [18:41:45.199] ..$ B: num 60 [18:41:45.199] ..$ C: num 70 [18:41:45.199] ..$ D: num 80 [18:41:45.199] $ ...future.seeds_ii : NULL [18:41:45.199] $ ...future.globals.maxSize: NULL [18:41:45.199] - attr(*, "where")=List of 5 [18:41:45.199] ..$ ...future.FUN : [18:41:45.199] ..$ future.call.arguments : [18:41:45.199] ..$ ...future.elements_ii : [18:41:45.199] ..$ ...future.seeds_ii : [18:41:45.199] ..$ ...future.globals.maxSize: [18:41:45.199] - attr(*, "resolved")= logi FALSE [18:41:45.199] - attr(*, "total_size")= num 4910 [18:41:45.199] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.199] - attr(*, "already-done")= logi TRUE [18:41:45.211] - copied '...future.FUN' to environment [18:41:45.211] - copied 'future.call.arguments' to environment [18:41:45.211] - copied '...future.elements_ii' to environment [18:41:45.212] - copied '...future.seeds_ii' to environment [18:41:45.212] - copied '...future.globals.maxSize' to environment [18:41:45.212] assign_globals() ... done [18:41:45.213] plan(): Setting new future strategy stack: [18:41:45.213] List of future strategies: [18:41:45.213] 1. sequential: [18:41:45.213] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.213] - tweaked: FALSE [18:41:45.213] - call: NULL [18:41:45.214] plan(): nbrOfWorkers() = 1 [18:41:45.216] plan(): Setting new future strategy stack: [18:41:45.217] List of future strategies: [18:41:45.217] 1. sequential: [18:41:45.217] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.217] - tweaked: FALSE [18:41:45.217] - call: plan(strategy) [18:41:45.218] plan(): nbrOfWorkers() = 1 [18:41:45.218] SequentialFuture started (and completed) [18:41:45.218] - Launch lazy future ... done [18:41:45.219] run() for 'SequentialFuture' ... done [18:41:45.219] Created future: [18:41:45.219] SequentialFuture: [18:41:45.219] Label: 'future_sapply-1' [18:41:45.219] Expression: [18:41:45.219] { [18:41:45.219] do.call(function(...) { [18:41:45.219] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.219] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.219] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.219] on.exit(options(oopts), add = TRUE) [18:41:45.219] } [18:41:45.219] { [18:41:45.219] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.219] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.219] ...future.FUN(...future.X_jj, ...) [18:41:45.219] }) [18:41:45.219] } [18:41:45.219] }, args = future.call.arguments) [18:41:45.219] } [18:41:45.219] Lazy evaluation: FALSE [18:41:45.219] Asynchronous evaluation: FALSE [18:41:45.219] Local evaluation: TRUE [18:41:45.219] Environment: R_GlobalEnv [18:41:45.219] Capture standard output: TRUE [18:41:45.219] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.219] Globals: 5 objects totaling 500 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:45.219] Packages: [18:41:45.219] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.219] Resolved: TRUE [18:41:45.219] Value: 95 bytes of class 'list' [18:41:45.219] Early signaling: FALSE [18:41:45.219] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.219] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.221] Chunk #1 of 1 ... DONE [18:41:45.221] Launching 1 futures (chunks) ... DONE [18:41:45.222] Resolving 1 futures (chunks) ... [18:41:45.222] resolve() on list ... [18:41:45.222] recursive: 0 [18:41:45.222] length: 1 [18:41:45.223] [18:41:45.223] resolved() for 'SequentialFuture' ... [18:41:45.223] - state: 'finished' [18:41:45.224] - run: TRUE [18:41:45.224] - result: 'FutureResult' [18:41:45.224] resolved() for 'SequentialFuture' ... done [18:41:45.225] Future #1 [18:41:45.225] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.225] - nx: 1 [18:41:45.226] - relay: TRUE [18:41:45.226] - stdout: TRUE [18:41:45.226] - signal: TRUE [18:41:45.226] - resignal: FALSE [18:41:45.227] - force: TRUE [18:41:45.227] - relayed: [n=1] FALSE [18:41:45.227] - queued futures: [n=1] FALSE [18:41:45.227] - until=1 [18:41:45.228] - relaying element #1 [18:41:45.228] - relayed: [n=1] TRUE [18:41:45.228] - queued futures: [n=1] TRUE [18:41:45.229] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.229] length: 0 (resolved future 1) [18:41:45.229] Relaying remaining futures [18:41:45.230] signalConditionsASAP(NULL, pos=0) ... [18:41:45.230] - nx: 1 [18:41:45.230] - relay: TRUE [18:41:45.230] - stdout: TRUE [18:41:45.231] - signal: TRUE [18:41:45.231] - resignal: FALSE [18:41:45.231] - force: TRUE [18:41:45.231] - relayed: [n=1] TRUE [18:41:45.232] - queued futures: [n=1] TRUE - flush all [18:41:45.232] - relayed: [n=1] TRUE [18:41:45.232] - queued futures: [n=1] TRUE [18:41:45.233] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.233] resolve() on list ... DONE [18:41:45.233] - Number of value chunks collected: 1 [18:41:45.233] Resolving 1 futures (chunks) ... DONE [18:41:45.234] Reducing values from 1 chunks ... [18:41:45.234] - Number of values collected after concatenation: 4 [18:41:45.234] - Number of values expected: 4 [18:41:45.235] Reducing values from 1 chunks ... DONE [18:41:45.235] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:45.238] future_lapply() ... [18:41:45.239] Number of chunks: 1 [18:41:45.240] getGlobalsAndPackagesXApply() ... [18:41:45.240] - future.globals: TRUE [18:41:45.240] getGlobalsAndPackages() ... [18:41:45.240] Searching for globals... [18:41:45.242] - globals found: [2] 'FUN', 'UseMethod' [18:41:45.243] Searching for globals ... DONE [18:41:45.243] Resolving globals: FALSE [18:41:45.244] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:45.244] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:45.245] - globals: [1] 'FUN' [18:41:45.245] [18:41:45.245] getGlobalsAndPackages() ... DONE [18:41:45.246] - globals found/used: [n=1] 'FUN' [18:41:45.246] - needed namespaces: [n=0] [18:41:45.246] Finding globals ... DONE [18:41:45.246] - use_args: TRUE [18:41:45.247] - Getting '...' globals ... [18:41:45.247] resolve() on list ... [18:41:45.248] recursive: 0 [18:41:45.248] length: 1 [18:41:45.248] elements: '...' [18:41:45.249] length: 0 (resolved future 1) [18:41:45.249] resolve() on list ... DONE [18:41:45.249] - '...' content: [n=0] [18:41:45.249] List of 1 [18:41:45.249] $ ...: list() [18:41:45.249] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.249] - attr(*, "where")=List of 1 [18:41:45.249] ..$ ...: [18:41:45.249] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.249] - attr(*, "resolved")= logi TRUE [18:41:45.249] - attr(*, "total_size")= num NA [18:41:45.254] - Getting '...' globals ... DONE [18:41:45.255] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:45.255] List of 2 [18:41:45.255] $ ...future.FUN:function (x, ...) [18:41:45.255] $ ... : list() [18:41:45.255] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.255] - attr(*, "where")=List of 2 [18:41:45.255] ..$ ...future.FUN: [18:41:45.255] ..$ ... : [18:41:45.255] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.255] - attr(*, "resolved")= logi FALSE [18:41:45.255] - attr(*, "total_size")= int 5150 [18:41:45.261] Packages to be attached in all futures: [n=0] [18:41:45.261] getGlobalsAndPackagesXApply() ... DONE [18:41:45.261] Number of futures (= number of chunks): 1 [18:41:45.262] Launching 1 futures (chunks) ... [18:41:45.262] Chunk #1 of 1 ... [18:41:45.262] - Finding globals in 'X' for chunk #1 ... [18:41:45.262] getGlobalsAndPackages() ... [18:41:45.263] Searching for globals... [18:41:45.263] [18:41:45.264] Searching for globals ... DONE [18:41:45.264] - globals: [0] [18:41:45.264] getGlobalsAndPackages() ... DONE [18:41:45.264] + additional globals found: [n=0] [18:41:45.265] + additional namespaces needed: [n=0] [18:41:45.265] - Finding globals in 'X' for chunk #1 ... DONE [18:41:45.265] - seeds: [18:41:45.265] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.266] getGlobalsAndPackages() ... [18:41:45.266] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.266] Resolving globals: FALSE [18:41:45.267] Tweak future expression to call with '...' arguments ... [18:41:45.267] { [18:41:45.267] do.call(function(...) { [18:41:45.267] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.267] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.267] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.267] on.exit(options(oopts), add = TRUE) [18:41:45.267] } [18:41:45.267] { [18:41:45.267] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.267] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.267] ...future.FUN(...future.X_jj, ...) [18:41:45.267] }) [18:41:45.267] } [18:41:45.267] }, args = future.call.arguments) [18:41:45.267] } [18:41:45.268] Tweak future expression to call with '...' arguments ... DONE [18:41:45.268] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.269] [18:41:45.269] getGlobalsAndPackages() ... DONE [18:41:45.270] run() for 'Future' ... [18:41:45.270] - state: 'created' [18:41:45.270] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:45.271] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.271] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:45.271] - Field: 'label' [18:41:45.272] - Field: 'local' [18:41:45.272] - Field: 'owner' [18:41:45.272] - Field: 'envir' [18:41:45.273] - Field: 'packages' [18:41:45.273] - Field: 'gc' [18:41:45.273] - Field: 'conditions' [18:41:45.274] - Field: 'expr' [18:41:45.274] - Field: 'uuid' [18:41:45.274] - Field: 'seed' [18:41:45.274] - Field: 'version' [18:41:45.275] - Field: 'result' [18:41:45.275] - Field: 'asynchronous' [18:41:45.275] - Field: 'calls' [18:41:45.279] - Field: 'globals' [18:41:45.280] - Field: 'stdout' [18:41:45.280] - Field: 'earlySignal' [18:41:45.280] - Field: 'lazy' [18:41:45.281] - Field: 'state' [18:41:45.281] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.281] - Launch lazy future ... [18:41:45.282] Packages needed by the future expression (n = 0): [18:41:45.282] Packages needed by future strategies (n = 0): [18:41:45.283] { [18:41:45.283] { [18:41:45.283] { [18:41:45.283] ...future.startTime <- base::Sys.time() [18:41:45.283] { [18:41:45.283] { [18:41:45.283] { [18:41:45.283] base::local({ [18:41:45.283] has_future <- base::requireNamespace("future", [18:41:45.283] quietly = TRUE) [18:41:45.283] if (has_future) { [18:41:45.283] ns <- base::getNamespace("future") [18:41:45.283] version <- ns[[".package"]][["version"]] [18:41:45.283] if (is.null(version)) [18:41:45.283] version <- utils::packageVersion("future") [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] version <- NULL [18:41:45.283] } [18:41:45.283] if (!has_future || version < "1.8.0") { [18:41:45.283] info <- base::c(r_version = base::gsub("R version ", [18:41:45.283] "", base::R.version$version.string), [18:41:45.283] platform = base::sprintf("%s (%s-bit)", [18:41:45.283] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.283] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.283] "release", "version")], collapse = " "), [18:41:45.283] hostname = base::Sys.info()[["nodename"]]) [18:41:45.283] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.283] info) [18:41:45.283] info <- base::paste(info, collapse = "; ") [18:41:45.283] if (!has_future) { [18:41:45.283] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.283] info) [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.283] info, version) [18:41:45.283] } [18:41:45.283] base::stop(msg) [18:41:45.283] } [18:41:45.283] }) [18:41:45.283] } [18:41:45.283] ...future.strategy.old <- future::plan("list") [18:41:45.283] options(future.plan = NULL) [18:41:45.283] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.283] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.283] } [18:41:45.283] ...future.workdir <- getwd() [18:41:45.283] } [18:41:45.283] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.283] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.283] } [18:41:45.283] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.283] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.283] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.283] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.283] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.283] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.283] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.283] base::names(...future.oldOptions)) [18:41:45.283] } [18:41:45.283] if (FALSE) { [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] if (TRUE) { [18:41:45.283] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.283] open = "w") [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.283] windows = "NUL", "/dev/null"), open = "w") [18:41:45.283] } [18:41:45.283] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.283] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.283] base::sink(type = "output", split = FALSE) [18:41:45.283] base::close(...future.stdout) [18:41:45.283] }, add = TRUE) [18:41:45.283] } [18:41:45.283] ...future.frame <- base::sys.nframe() [18:41:45.283] ...future.conditions <- base::list() [18:41:45.283] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.283] if (FALSE) { [18:41:45.283] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.283] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.283] } [18:41:45.283] ...future.result <- base::tryCatch({ [18:41:45.283] base::withCallingHandlers({ [18:41:45.283] ...future.value <- base::withVisible(base::local({ [18:41:45.283] do.call(function(...) { [18:41:45.283] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.283] if (!identical(...future.globals.maxSize.org, [18:41:45.283] ...future.globals.maxSize)) { [18:41:45.283] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.283] on.exit(options(oopts), add = TRUE) [18:41:45.283] } [18:41:45.283] { [18:41:45.283] lapply(seq_along(...future.elements_ii), [18:41:45.283] FUN = function(jj) { [18:41:45.283] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.283] ...future.FUN(...future.X_jj, ...) [18:41:45.283] }) [18:41:45.283] } [18:41:45.283] }, args = future.call.arguments) [18:41:45.283] })) [18:41:45.283] future::FutureResult(value = ...future.value$value, [18:41:45.283] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.283] ...future.rng), globalenv = if (FALSE) [18:41:45.283] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.283] ...future.globalenv.names)) [18:41:45.283] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.283] }, condition = base::local({ [18:41:45.283] c <- base::c [18:41:45.283] inherits <- base::inherits [18:41:45.283] invokeRestart <- base::invokeRestart [18:41:45.283] length <- base::length [18:41:45.283] list <- base::list [18:41:45.283] seq.int <- base::seq.int [18:41:45.283] signalCondition <- base::signalCondition [18:41:45.283] sys.calls <- base::sys.calls [18:41:45.283] `[[` <- base::`[[` [18:41:45.283] `+` <- base::`+` [18:41:45.283] `<<-` <- base::`<<-` [18:41:45.283] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.283] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.283] 3L)] [18:41:45.283] } [18:41:45.283] function(cond) { [18:41:45.283] is_error <- inherits(cond, "error") [18:41:45.283] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.283] NULL) [18:41:45.283] if (is_error) { [18:41:45.283] sessionInformation <- function() { [18:41:45.283] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.283] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.283] search = base::search(), system = base::Sys.info()) [18:41:45.283] } [18:41:45.283] ...future.conditions[[length(...future.conditions) + [18:41:45.283] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.283] cond$call), session = sessionInformation(), [18:41:45.283] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.283] signalCondition(cond) [18:41:45.283] } [18:41:45.283] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.283] "immediateCondition"))) { [18:41:45.283] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.283] ...future.conditions[[length(...future.conditions) + [18:41:45.283] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.283] if (TRUE && !signal) { [18:41:45.283] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.283] { [18:41:45.283] inherits <- base::inherits [18:41:45.283] invokeRestart <- base::invokeRestart [18:41:45.283] is.null <- base::is.null [18:41:45.283] muffled <- FALSE [18:41:45.283] if (inherits(cond, "message")) { [18:41:45.283] muffled <- grepl(pattern, "muffleMessage") [18:41:45.283] if (muffled) [18:41:45.283] invokeRestart("muffleMessage") [18:41:45.283] } [18:41:45.283] else if (inherits(cond, "warning")) { [18:41:45.283] muffled <- grepl(pattern, "muffleWarning") [18:41:45.283] if (muffled) [18:41:45.283] invokeRestart("muffleWarning") [18:41:45.283] } [18:41:45.283] else if (inherits(cond, "condition")) { [18:41:45.283] if (!is.null(pattern)) { [18:41:45.283] computeRestarts <- base::computeRestarts [18:41:45.283] grepl <- base::grepl [18:41:45.283] restarts <- computeRestarts(cond) [18:41:45.283] for (restart in restarts) { [18:41:45.283] name <- restart$name [18:41:45.283] if (is.null(name)) [18:41:45.283] next [18:41:45.283] if (!grepl(pattern, name)) [18:41:45.283] next [18:41:45.283] invokeRestart(restart) [18:41:45.283] muffled <- TRUE [18:41:45.283] break [18:41:45.283] } [18:41:45.283] } [18:41:45.283] } [18:41:45.283] invisible(muffled) [18:41:45.283] } [18:41:45.283] muffleCondition(cond, pattern = "^muffle") [18:41:45.283] } [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] if (TRUE) { [18:41:45.283] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.283] { [18:41:45.283] inherits <- base::inherits [18:41:45.283] invokeRestart <- base::invokeRestart [18:41:45.283] is.null <- base::is.null [18:41:45.283] muffled <- FALSE [18:41:45.283] if (inherits(cond, "message")) { [18:41:45.283] muffled <- grepl(pattern, "muffleMessage") [18:41:45.283] if (muffled) [18:41:45.283] invokeRestart("muffleMessage") [18:41:45.283] } [18:41:45.283] else if (inherits(cond, "warning")) { [18:41:45.283] muffled <- grepl(pattern, "muffleWarning") [18:41:45.283] if (muffled) [18:41:45.283] invokeRestart("muffleWarning") [18:41:45.283] } [18:41:45.283] else if (inherits(cond, "condition")) { [18:41:45.283] if (!is.null(pattern)) { [18:41:45.283] computeRestarts <- base::computeRestarts [18:41:45.283] grepl <- base::grepl [18:41:45.283] restarts <- computeRestarts(cond) [18:41:45.283] for (restart in restarts) { [18:41:45.283] name <- restart$name [18:41:45.283] if (is.null(name)) [18:41:45.283] next [18:41:45.283] if (!grepl(pattern, name)) [18:41:45.283] next [18:41:45.283] invokeRestart(restart) [18:41:45.283] muffled <- TRUE [18:41:45.283] break [18:41:45.283] } [18:41:45.283] } [18:41:45.283] } [18:41:45.283] invisible(muffled) [18:41:45.283] } [18:41:45.283] muffleCondition(cond, pattern = "^muffle") [18:41:45.283] } [18:41:45.283] } [18:41:45.283] } [18:41:45.283] })) [18:41:45.283] }, error = function(ex) { [18:41:45.283] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.283] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.283] ...future.rng), started = ...future.startTime, [18:41:45.283] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.283] version = "1.8"), class = "FutureResult") [18:41:45.283] }, finally = { [18:41:45.283] if (!identical(...future.workdir, getwd())) [18:41:45.283] setwd(...future.workdir) [18:41:45.283] { [18:41:45.283] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.283] ...future.oldOptions$nwarnings <- NULL [18:41:45.283] } [18:41:45.283] base::options(...future.oldOptions) [18:41:45.283] if (.Platform$OS.type == "windows") { [18:41:45.283] old_names <- names(...future.oldEnvVars) [18:41:45.283] envs <- base::Sys.getenv() [18:41:45.283] names <- names(envs) [18:41:45.283] common <- intersect(names, old_names) [18:41:45.283] added <- setdiff(names, old_names) [18:41:45.283] removed <- setdiff(old_names, names) [18:41:45.283] changed <- common[...future.oldEnvVars[common] != [18:41:45.283] envs[common]] [18:41:45.283] NAMES <- toupper(changed) [18:41:45.283] args <- list() [18:41:45.283] for (kk in seq_along(NAMES)) { [18:41:45.283] name <- changed[[kk]] [18:41:45.283] NAME <- NAMES[[kk]] [18:41:45.283] if (name != NAME && is.element(NAME, old_names)) [18:41:45.283] next [18:41:45.283] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.283] } [18:41:45.283] NAMES <- toupper(added) [18:41:45.283] for (kk in seq_along(NAMES)) { [18:41:45.283] name <- added[[kk]] [18:41:45.283] NAME <- NAMES[[kk]] [18:41:45.283] if (name != NAME && is.element(NAME, old_names)) [18:41:45.283] next [18:41:45.283] args[[name]] <- "" [18:41:45.283] } [18:41:45.283] NAMES <- toupper(removed) [18:41:45.283] for (kk in seq_along(NAMES)) { [18:41:45.283] name <- removed[[kk]] [18:41:45.283] NAME <- NAMES[[kk]] [18:41:45.283] if (name != NAME && is.element(NAME, old_names)) [18:41:45.283] next [18:41:45.283] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.283] } [18:41:45.283] if (length(args) > 0) [18:41:45.283] base::do.call(base::Sys.setenv, args = args) [18:41:45.283] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.283] } [18:41:45.283] { [18:41:45.283] if (base::length(...future.futureOptionsAdded) > [18:41:45.283] 0L) { [18:41:45.283] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.283] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.283] base::options(opts) [18:41:45.283] } [18:41:45.283] { [18:41:45.283] { [18:41:45.283] NULL [18:41:45.283] RNGkind("Mersenne-Twister") [18:41:45.283] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.283] inherits = FALSE) [18:41:45.283] } [18:41:45.283] options(future.plan = NULL) [18:41:45.283] if (is.na(NA_character_)) [18:41:45.283] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.283] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.283] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.283] .init = FALSE) [18:41:45.283] } [18:41:45.283] } [18:41:45.283] } [18:41:45.283] }) [18:41:45.283] if (TRUE) { [18:41:45.283] base::sink(type = "output", split = FALSE) [18:41:45.283] if (TRUE) { [18:41:45.283] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.283] } [18:41:45.283] else { [18:41:45.283] ...future.result["stdout"] <- base::list(NULL) [18:41:45.283] } [18:41:45.283] base::close(...future.stdout) [18:41:45.283] ...future.stdout <- NULL [18:41:45.283] } [18:41:45.283] ...future.result$conditions <- ...future.conditions [18:41:45.283] ...future.result$finished <- base::Sys.time() [18:41:45.283] ...future.result [18:41:45.283] } [18:41:45.289] assign_globals() ... [18:41:45.290] List of 5 [18:41:45.290] $ ...future.FUN :function (x, ...) [18:41:45.290] $ future.call.arguments : list() [18:41:45.290] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.290] $ ...future.elements_ii :List of 4 [18:41:45.290] ..$ A: num 50 [18:41:45.290] ..$ B: num 60 [18:41:45.290] ..$ C: num 70 [18:41:45.290] ..$ D: num 80 [18:41:45.290] $ ...future.seeds_ii : NULL [18:41:45.290] $ ...future.globals.maxSize: NULL [18:41:45.290] - attr(*, "where")=List of 5 [18:41:45.290] ..$ ...future.FUN : [18:41:45.290] ..$ future.call.arguments : [18:41:45.290] ..$ ...future.elements_ii : [18:41:45.290] ..$ ...future.seeds_ii : [18:41:45.290] ..$ ...future.globals.maxSize: [18:41:45.290] - attr(*, "resolved")= logi FALSE [18:41:45.290] - attr(*, "total_size")= num 5150 [18:41:45.290] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.290] - attr(*, "already-done")= logi TRUE [18:41:45.298] - copied '...future.FUN' to environment [18:41:45.298] - copied 'future.call.arguments' to environment [18:41:45.298] - copied '...future.elements_ii' to environment [18:41:45.298] - copied '...future.seeds_ii' to environment [18:41:45.298] - copied '...future.globals.maxSize' to environment [18:41:45.299] assign_globals() ... done [18:41:45.299] plan(): Setting new future strategy stack: [18:41:45.299] List of future strategies: [18:41:45.299] 1. sequential: [18:41:45.299] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.299] - tweaked: FALSE [18:41:45.299] - call: NULL [18:41:45.300] plan(): nbrOfWorkers() = 1 [18:41:45.301] plan(): Setting new future strategy stack: [18:41:45.301] List of future strategies: [18:41:45.301] 1. sequential: [18:41:45.301] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.301] - tweaked: FALSE [18:41:45.301] - call: plan(strategy) [18:41:45.302] plan(): nbrOfWorkers() = 1 [18:41:45.302] SequentialFuture started (and completed) [18:41:45.302] - Launch lazy future ... done [18:41:45.303] run() for 'SequentialFuture' ... done [18:41:45.303] Created future: [18:41:45.303] SequentialFuture: [18:41:45.303] Label: 'future_sapply-1' [18:41:45.303] Expression: [18:41:45.303] { [18:41:45.303] do.call(function(...) { [18:41:45.303] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.303] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.303] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.303] on.exit(options(oopts), add = TRUE) [18:41:45.303] } [18:41:45.303] { [18:41:45.303] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.303] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.303] ...future.FUN(...future.X_jj, ...) [18:41:45.303] }) [18:41:45.303] } [18:41:45.303] }, args = future.call.arguments) [18:41:45.303] } [18:41:45.303] Lazy evaluation: FALSE [18:41:45.303] Asynchronous evaluation: FALSE [18:41:45.303] Local evaluation: TRUE [18:41:45.303] Environment: R_GlobalEnv [18:41:45.303] Capture standard output: TRUE [18:41:45.303] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.303] Globals: 5 objects totaling 593 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:45.303] Packages: [18:41:45.303] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.303] Resolved: TRUE [18:41:45.303] Value: 218 bytes of class 'list' [18:41:45.303] Early signaling: FALSE [18:41:45.303] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.303] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.304] Chunk #1 of 1 ... DONE [18:41:45.304] Launching 1 futures (chunks) ... DONE [18:41:45.304] Resolving 1 futures (chunks) ... [18:41:45.305] resolve() on list ... [18:41:45.305] recursive: 0 [18:41:45.305] length: 1 [18:41:45.305] [18:41:45.305] resolved() for 'SequentialFuture' ... [18:41:45.305] - state: 'finished' [18:41:45.306] - run: TRUE [18:41:45.306] - result: 'FutureResult' [18:41:45.306] resolved() for 'SequentialFuture' ... done [18:41:45.306] Future #1 [18:41:45.306] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.307] - nx: 1 [18:41:45.307] - relay: TRUE [18:41:45.307] - stdout: TRUE [18:41:45.307] - signal: TRUE [18:41:45.307] - resignal: FALSE [18:41:45.307] - force: TRUE [18:41:45.307] - relayed: [n=1] FALSE [18:41:45.308] - queued futures: [n=1] FALSE [18:41:45.308] - until=1 [18:41:45.308] - relaying element #1 [18:41:45.308] - relayed: [n=1] TRUE [18:41:45.308] - queued futures: [n=1] TRUE [18:41:45.309] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.309] length: 0 (resolved future 1) [18:41:45.309] Relaying remaining futures [18:41:45.309] signalConditionsASAP(NULL, pos=0) ... [18:41:45.309] - nx: 1 [18:41:45.309] - relay: TRUE [18:41:45.309] - stdout: TRUE [18:41:45.310] - signal: TRUE [18:41:45.310] - resignal: FALSE [18:41:45.310] - force: TRUE [18:41:45.310] - relayed: [n=1] TRUE [18:41:45.310] - queued futures: [n=1] TRUE - flush all [18:41:45.311] - relayed: [n=1] TRUE [18:41:45.311] - queued futures: [n=1] TRUE [18:41:45.311] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.311] resolve() on list ... DONE [18:41:45.311] - Number of value chunks collected: 1 [18:41:45.311] Resolving 1 futures (chunks) ... DONE [18:41:45.312] Reducing values from 1 chunks ... [18:41:45.312] - Number of values collected after concatenation: 4 [18:41:45.312] - Number of values expected: 4 [18:41:45.312] Reducing values from 1 chunks ... DONE [18:41:45.312] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:45.314] future_lapply() ... [18:41:45.315] Number of chunks: 1 [18:41:45.316] getGlobalsAndPackagesXApply() ... [18:41:45.316] - future.globals: TRUE [18:41:45.316] getGlobalsAndPackages() ... [18:41:45.316] Searching for globals... [18:41:45.318] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:45.318] Searching for globals ... DONE [18:41:45.319] Resolving globals: FALSE [18:41:45.320] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:45.320] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:45.321] - globals: [1] 'FUN' [18:41:45.321] [18:41:45.321] getGlobalsAndPackages() ... DONE [18:41:45.321] - globals found/used: [n=1] 'FUN' [18:41:45.322] - needed namespaces: [n=0] [18:41:45.322] Finding globals ... DONE [18:41:45.322] - use_args: TRUE [18:41:45.323] - Getting '...' globals ... [18:41:45.323] resolve() on list ... [18:41:45.324] recursive: 0 [18:41:45.324] length: 1 [18:41:45.324] elements: '...' [18:41:45.324] length: 0 (resolved future 1) [18:41:45.325] resolve() on list ... DONE [18:41:45.325] - '...' content: [n=0] [18:41:45.325] List of 1 [18:41:45.325] $ ...: list() [18:41:45.325] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.325] - attr(*, "where")=List of 1 [18:41:45.325] ..$ ...: [18:41:45.325] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.325] - attr(*, "resolved")= logi TRUE [18:41:45.325] - attr(*, "total_size")= num NA [18:41:45.330] - Getting '...' globals ... DONE [18:41:45.330] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:45.331] List of 2 [18:41:45.331] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:45.331] $ ... : list() [18:41:45.331] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.331] - attr(*, "where")=List of 2 [18:41:45.331] ..$ ...future.FUN: [18:41:45.331] ..$ ... : [18:41:45.331] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.331] - attr(*, "resolved")= logi FALSE [18:41:45.331] - attr(*, "total_size")= int 6632 [18:41:45.336] Packages to be attached in all futures: [n=0] [18:41:45.336] getGlobalsAndPackagesXApply() ... DONE [18:41:45.337] Number of futures (= number of chunks): 1 [18:41:45.337] Launching 1 futures (chunks) ... [18:41:45.337] Chunk #1 of 1 ... [18:41:45.338] - Finding globals in 'X' for chunk #1 ... [18:41:45.338] getGlobalsAndPackages() ... [18:41:45.338] Searching for globals... [18:41:45.339] [18:41:45.339] Searching for globals ... DONE [18:41:45.339] - globals: [0] [18:41:45.340] getGlobalsAndPackages() ... DONE [18:41:45.340] + additional globals found: [n=0] [18:41:45.340] + additional namespaces needed: [n=0] [18:41:45.340] - Finding globals in 'X' for chunk #1 ... DONE [18:41:45.341] - seeds: [18:41:45.341] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.341] getGlobalsAndPackages() ... [18:41:45.342] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.342] Resolving globals: FALSE [18:41:45.342] Tweak future expression to call with '...' arguments ... [18:41:45.342] { [18:41:45.342] do.call(function(...) { [18:41:45.342] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.342] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.342] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.342] on.exit(options(oopts), add = TRUE) [18:41:45.342] } [18:41:45.342] { [18:41:45.342] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.342] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.342] ...future.FUN(...future.X_jj, ...) [18:41:45.342] }) [18:41:45.342] } [18:41:45.342] }, args = future.call.arguments) [18:41:45.342] } [18:41:45.343] Tweak future expression to call with '...' arguments ... DONE [18:41:45.344] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.344] [18:41:45.344] getGlobalsAndPackages() ... DONE [18:41:45.345] run() for 'Future' ... [18:41:45.345] - state: 'created' [18:41:45.346] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:45.346] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.347] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:45.347] - Field: 'label' [18:41:45.347] - Field: 'local' [18:41:45.348] - Field: 'owner' [18:41:45.348] - Field: 'envir' [18:41:45.348] - Field: 'packages' [18:41:45.348] - Field: 'gc' [18:41:45.349] - Field: 'conditions' [18:41:45.349] - Field: 'expr' [18:41:45.349] - Field: 'uuid' [18:41:45.350] - Field: 'seed' [18:41:45.350] - Field: 'version' [18:41:45.350] - Field: 'result' [18:41:45.351] - Field: 'asynchronous' [18:41:45.351] - Field: 'calls' [18:41:45.351] - Field: 'globals' [18:41:45.352] - Field: 'stdout' [18:41:45.352] - Field: 'earlySignal' [18:41:45.352] - Field: 'lazy' [18:41:45.352] - Field: 'state' [18:41:45.353] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.353] - Launch lazy future ... [18:41:45.353] Packages needed by the future expression (n = 0): [18:41:45.354] Packages needed by future strategies (n = 0): [18:41:45.355] { [18:41:45.355] { [18:41:45.355] { [18:41:45.355] ...future.startTime <- base::Sys.time() [18:41:45.355] { [18:41:45.355] { [18:41:45.355] { [18:41:45.355] base::local({ [18:41:45.355] has_future <- base::requireNamespace("future", [18:41:45.355] quietly = TRUE) [18:41:45.355] if (has_future) { [18:41:45.355] ns <- base::getNamespace("future") [18:41:45.355] version <- ns[[".package"]][["version"]] [18:41:45.355] if (is.null(version)) [18:41:45.355] version <- utils::packageVersion("future") [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] version <- NULL [18:41:45.355] } [18:41:45.355] if (!has_future || version < "1.8.0") { [18:41:45.355] info <- base::c(r_version = base::gsub("R version ", [18:41:45.355] "", base::R.version$version.string), [18:41:45.355] platform = base::sprintf("%s (%s-bit)", [18:41:45.355] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.355] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.355] "release", "version")], collapse = " "), [18:41:45.355] hostname = base::Sys.info()[["nodename"]]) [18:41:45.355] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.355] info) [18:41:45.355] info <- base::paste(info, collapse = "; ") [18:41:45.355] if (!has_future) { [18:41:45.355] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.355] info) [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.355] info, version) [18:41:45.355] } [18:41:45.355] base::stop(msg) [18:41:45.355] } [18:41:45.355] }) [18:41:45.355] } [18:41:45.355] ...future.strategy.old <- future::plan("list") [18:41:45.355] options(future.plan = NULL) [18:41:45.355] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.355] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.355] } [18:41:45.355] ...future.workdir <- getwd() [18:41:45.355] } [18:41:45.355] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.355] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.355] } [18:41:45.355] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.355] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.355] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.355] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.355] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.355] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.355] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.355] base::names(...future.oldOptions)) [18:41:45.355] } [18:41:45.355] if (FALSE) { [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] if (TRUE) { [18:41:45.355] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.355] open = "w") [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.355] windows = "NUL", "/dev/null"), open = "w") [18:41:45.355] } [18:41:45.355] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.355] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.355] base::sink(type = "output", split = FALSE) [18:41:45.355] base::close(...future.stdout) [18:41:45.355] }, add = TRUE) [18:41:45.355] } [18:41:45.355] ...future.frame <- base::sys.nframe() [18:41:45.355] ...future.conditions <- base::list() [18:41:45.355] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.355] if (FALSE) { [18:41:45.355] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.355] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.355] } [18:41:45.355] ...future.result <- base::tryCatch({ [18:41:45.355] base::withCallingHandlers({ [18:41:45.355] ...future.value <- base::withVisible(base::local({ [18:41:45.355] do.call(function(...) { [18:41:45.355] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.355] if (!identical(...future.globals.maxSize.org, [18:41:45.355] ...future.globals.maxSize)) { [18:41:45.355] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.355] on.exit(options(oopts), add = TRUE) [18:41:45.355] } [18:41:45.355] { [18:41:45.355] lapply(seq_along(...future.elements_ii), [18:41:45.355] FUN = function(jj) { [18:41:45.355] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.355] ...future.FUN(...future.X_jj, ...) [18:41:45.355] }) [18:41:45.355] } [18:41:45.355] }, args = future.call.arguments) [18:41:45.355] })) [18:41:45.355] future::FutureResult(value = ...future.value$value, [18:41:45.355] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.355] ...future.rng), globalenv = if (FALSE) [18:41:45.355] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.355] ...future.globalenv.names)) [18:41:45.355] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.355] }, condition = base::local({ [18:41:45.355] c <- base::c [18:41:45.355] inherits <- base::inherits [18:41:45.355] invokeRestart <- base::invokeRestart [18:41:45.355] length <- base::length [18:41:45.355] list <- base::list [18:41:45.355] seq.int <- base::seq.int [18:41:45.355] signalCondition <- base::signalCondition [18:41:45.355] sys.calls <- base::sys.calls [18:41:45.355] `[[` <- base::`[[` [18:41:45.355] `+` <- base::`+` [18:41:45.355] `<<-` <- base::`<<-` [18:41:45.355] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.355] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.355] 3L)] [18:41:45.355] } [18:41:45.355] function(cond) { [18:41:45.355] is_error <- inherits(cond, "error") [18:41:45.355] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.355] NULL) [18:41:45.355] if (is_error) { [18:41:45.355] sessionInformation <- function() { [18:41:45.355] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.355] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.355] search = base::search(), system = base::Sys.info()) [18:41:45.355] } [18:41:45.355] ...future.conditions[[length(...future.conditions) + [18:41:45.355] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.355] cond$call), session = sessionInformation(), [18:41:45.355] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.355] signalCondition(cond) [18:41:45.355] } [18:41:45.355] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.355] "immediateCondition"))) { [18:41:45.355] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.355] ...future.conditions[[length(...future.conditions) + [18:41:45.355] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.355] if (TRUE && !signal) { [18:41:45.355] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.355] { [18:41:45.355] inherits <- base::inherits [18:41:45.355] invokeRestart <- base::invokeRestart [18:41:45.355] is.null <- base::is.null [18:41:45.355] muffled <- FALSE [18:41:45.355] if (inherits(cond, "message")) { [18:41:45.355] muffled <- grepl(pattern, "muffleMessage") [18:41:45.355] if (muffled) [18:41:45.355] invokeRestart("muffleMessage") [18:41:45.355] } [18:41:45.355] else if (inherits(cond, "warning")) { [18:41:45.355] muffled <- grepl(pattern, "muffleWarning") [18:41:45.355] if (muffled) [18:41:45.355] invokeRestart("muffleWarning") [18:41:45.355] } [18:41:45.355] else if (inherits(cond, "condition")) { [18:41:45.355] if (!is.null(pattern)) { [18:41:45.355] computeRestarts <- base::computeRestarts [18:41:45.355] grepl <- base::grepl [18:41:45.355] restarts <- computeRestarts(cond) [18:41:45.355] for (restart in restarts) { [18:41:45.355] name <- restart$name [18:41:45.355] if (is.null(name)) [18:41:45.355] next [18:41:45.355] if (!grepl(pattern, name)) [18:41:45.355] next [18:41:45.355] invokeRestart(restart) [18:41:45.355] muffled <- TRUE [18:41:45.355] break [18:41:45.355] } [18:41:45.355] } [18:41:45.355] } [18:41:45.355] invisible(muffled) [18:41:45.355] } [18:41:45.355] muffleCondition(cond, pattern = "^muffle") [18:41:45.355] } [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] if (TRUE) { [18:41:45.355] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.355] { [18:41:45.355] inherits <- base::inherits [18:41:45.355] invokeRestart <- base::invokeRestart [18:41:45.355] is.null <- base::is.null [18:41:45.355] muffled <- FALSE [18:41:45.355] if (inherits(cond, "message")) { [18:41:45.355] muffled <- grepl(pattern, "muffleMessage") [18:41:45.355] if (muffled) [18:41:45.355] invokeRestart("muffleMessage") [18:41:45.355] } [18:41:45.355] else if (inherits(cond, "warning")) { [18:41:45.355] muffled <- grepl(pattern, "muffleWarning") [18:41:45.355] if (muffled) [18:41:45.355] invokeRestart("muffleWarning") [18:41:45.355] } [18:41:45.355] else if (inherits(cond, "condition")) { [18:41:45.355] if (!is.null(pattern)) { [18:41:45.355] computeRestarts <- base::computeRestarts [18:41:45.355] grepl <- base::grepl [18:41:45.355] restarts <- computeRestarts(cond) [18:41:45.355] for (restart in restarts) { [18:41:45.355] name <- restart$name [18:41:45.355] if (is.null(name)) [18:41:45.355] next [18:41:45.355] if (!grepl(pattern, name)) [18:41:45.355] next [18:41:45.355] invokeRestart(restart) [18:41:45.355] muffled <- TRUE [18:41:45.355] break [18:41:45.355] } [18:41:45.355] } [18:41:45.355] } [18:41:45.355] invisible(muffled) [18:41:45.355] } [18:41:45.355] muffleCondition(cond, pattern = "^muffle") [18:41:45.355] } [18:41:45.355] } [18:41:45.355] } [18:41:45.355] })) [18:41:45.355] }, error = function(ex) { [18:41:45.355] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.355] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.355] ...future.rng), started = ...future.startTime, [18:41:45.355] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.355] version = "1.8"), class = "FutureResult") [18:41:45.355] }, finally = { [18:41:45.355] if (!identical(...future.workdir, getwd())) [18:41:45.355] setwd(...future.workdir) [18:41:45.355] { [18:41:45.355] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.355] ...future.oldOptions$nwarnings <- NULL [18:41:45.355] } [18:41:45.355] base::options(...future.oldOptions) [18:41:45.355] if (.Platform$OS.type == "windows") { [18:41:45.355] old_names <- names(...future.oldEnvVars) [18:41:45.355] envs <- base::Sys.getenv() [18:41:45.355] names <- names(envs) [18:41:45.355] common <- intersect(names, old_names) [18:41:45.355] added <- setdiff(names, old_names) [18:41:45.355] removed <- setdiff(old_names, names) [18:41:45.355] changed <- common[...future.oldEnvVars[common] != [18:41:45.355] envs[common]] [18:41:45.355] NAMES <- toupper(changed) [18:41:45.355] args <- list() [18:41:45.355] for (kk in seq_along(NAMES)) { [18:41:45.355] name <- changed[[kk]] [18:41:45.355] NAME <- NAMES[[kk]] [18:41:45.355] if (name != NAME && is.element(NAME, old_names)) [18:41:45.355] next [18:41:45.355] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.355] } [18:41:45.355] NAMES <- toupper(added) [18:41:45.355] for (kk in seq_along(NAMES)) { [18:41:45.355] name <- added[[kk]] [18:41:45.355] NAME <- NAMES[[kk]] [18:41:45.355] if (name != NAME && is.element(NAME, old_names)) [18:41:45.355] next [18:41:45.355] args[[name]] <- "" [18:41:45.355] } [18:41:45.355] NAMES <- toupper(removed) [18:41:45.355] for (kk in seq_along(NAMES)) { [18:41:45.355] name <- removed[[kk]] [18:41:45.355] NAME <- NAMES[[kk]] [18:41:45.355] if (name != NAME && is.element(NAME, old_names)) [18:41:45.355] next [18:41:45.355] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.355] } [18:41:45.355] if (length(args) > 0) [18:41:45.355] base::do.call(base::Sys.setenv, args = args) [18:41:45.355] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.355] } [18:41:45.355] { [18:41:45.355] if (base::length(...future.futureOptionsAdded) > [18:41:45.355] 0L) { [18:41:45.355] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.355] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.355] base::options(opts) [18:41:45.355] } [18:41:45.355] { [18:41:45.355] { [18:41:45.355] NULL [18:41:45.355] RNGkind("Mersenne-Twister") [18:41:45.355] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.355] inherits = FALSE) [18:41:45.355] } [18:41:45.355] options(future.plan = NULL) [18:41:45.355] if (is.na(NA_character_)) [18:41:45.355] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.355] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.355] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.355] .init = FALSE) [18:41:45.355] } [18:41:45.355] } [18:41:45.355] } [18:41:45.355] }) [18:41:45.355] if (TRUE) { [18:41:45.355] base::sink(type = "output", split = FALSE) [18:41:45.355] if (TRUE) { [18:41:45.355] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.355] } [18:41:45.355] else { [18:41:45.355] ...future.result["stdout"] <- base::list(NULL) [18:41:45.355] } [18:41:45.355] base::close(...future.stdout) [18:41:45.355] ...future.stdout <- NULL [18:41:45.355] } [18:41:45.355] ...future.result$conditions <- ...future.conditions [18:41:45.355] ...future.result$finished <- base::Sys.time() [18:41:45.355] ...future.result [18:41:45.355] } [18:41:45.361] assign_globals() ... [18:41:45.362] List of 5 [18:41:45.362] $ ...future.FUN :function (x, y = 2 * 1:5) [18:41:45.362] $ future.call.arguments : list() [18:41:45.362] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.362] $ ...future.elements_ii :List of 4 [18:41:45.362] ..$ A: num 50 [18:41:45.362] ..$ B: num 60 [18:41:45.362] ..$ C: num 70 [18:41:45.362] ..$ D: num 80 [18:41:45.362] $ ...future.seeds_ii : NULL [18:41:45.362] $ ...future.globals.maxSize: NULL [18:41:45.362] - attr(*, "where")=List of 5 [18:41:45.362] ..$ ...future.FUN : [18:41:45.362] ..$ future.call.arguments : [18:41:45.362] ..$ ...future.elements_ii : [18:41:45.362] ..$ ...future.seeds_ii : [18:41:45.362] ..$ ...future.globals.maxSize: [18:41:45.362] - attr(*, "resolved")= logi FALSE [18:41:45.362] - attr(*, "total_size")= num 6632 [18:41:45.362] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.362] - attr(*, "already-done")= logi TRUE [18:41:45.373] - reassign environment for '...future.FUN' [18:41:45.373] - copied '...future.FUN' to environment [18:41:45.374] - copied 'future.call.arguments' to environment [18:41:45.374] - copied '...future.elements_ii' to environment [18:41:45.374] - copied '...future.seeds_ii' to environment [18:41:45.374] - copied '...future.globals.maxSize' to environment [18:41:45.375] assign_globals() ... done [18:41:45.375] plan(): Setting new future strategy stack: [18:41:45.376] List of future strategies: [18:41:45.376] 1. sequential: [18:41:45.376] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.376] - tweaked: FALSE [18:41:45.376] - call: NULL [18:41:45.377] plan(): nbrOfWorkers() = 1 [18:41:45.379] plan(): Setting new future strategy stack: [18:41:45.379] List of future strategies: [18:41:45.379] 1. sequential: [18:41:45.379] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.379] - tweaked: FALSE [18:41:45.379] - call: plan(strategy) [18:41:45.380] plan(): nbrOfWorkers() = 1 [18:41:45.380] SequentialFuture started (and completed) [18:41:45.381] - Launch lazy future ... done [18:41:45.381] run() for 'SequentialFuture' ... done [18:41:45.381] Created future: [18:41:45.382] SequentialFuture: [18:41:45.382] Label: 'future_sapply-1' [18:41:45.382] Expression: [18:41:45.382] { [18:41:45.382] do.call(function(...) { [18:41:45.382] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.382] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.382] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.382] on.exit(options(oopts), add = TRUE) [18:41:45.382] } [18:41:45.382] { [18:41:45.382] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.382] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.382] ...future.FUN(...future.X_jj, ...) [18:41:45.382] }) [18:41:45.382] } [18:41:45.382] }, args = future.call.arguments) [18:41:45.382] } [18:41:45.382] Lazy evaluation: FALSE [18:41:45.382] Asynchronous evaluation: FALSE [18:41:45.382] Local evaluation: TRUE [18:41:45.382] Environment: R_GlobalEnv [18:41:45.382] Capture standard output: TRUE [18:41:45.382] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.382] Globals: 5 objects totaling 1.07 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 164 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:45.382] Packages: [18:41:45.382] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.382] Resolved: TRUE [18:41:45.382] Value: 666 bytes of class 'list' [18:41:45.382] Early signaling: FALSE [18:41:45.382] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.382] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.383] Chunk #1 of 1 ... DONE [18:41:45.384] Launching 1 futures (chunks) ... DONE [18:41:45.384] Resolving 1 futures (chunks) ... [18:41:45.384] resolve() on list ... [18:41:45.384] recursive: 0 [18:41:45.385] length: 1 [18:41:45.385] [18:41:45.385] resolved() for 'SequentialFuture' ... [18:41:45.385] - state: 'finished' [18:41:45.386] - run: TRUE [18:41:45.386] - result: 'FutureResult' [18:41:45.386] resolved() for 'SequentialFuture' ... done [18:41:45.387] Future #1 [18:41:45.387] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.387] - nx: 1 [18:41:45.388] - relay: TRUE [18:41:45.388] - stdout: TRUE [18:41:45.388] - signal: TRUE [18:41:45.388] - resignal: FALSE [18:41:45.389] - force: TRUE [18:41:45.389] - relayed: [n=1] FALSE [18:41:45.389] - queued futures: [n=1] FALSE [18:41:45.389] - until=1 [18:41:45.390] - relaying element #1 [18:41:45.390] - relayed: [n=1] TRUE [18:41:45.390] - queued futures: [n=1] TRUE [18:41:45.391] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.391] length: 0 (resolved future 1) [18:41:45.391] Relaying remaining futures [18:41:45.391] signalConditionsASAP(NULL, pos=0) ... [18:41:45.392] - nx: 1 [18:41:45.392] - relay: TRUE [18:41:45.392] - stdout: TRUE [18:41:45.392] - signal: TRUE [18:41:45.393] - resignal: FALSE [18:41:45.393] - force: TRUE [18:41:45.393] - relayed: [n=1] TRUE [18:41:45.394] - queued futures: [n=1] TRUE - flush all [18:41:45.394] - relayed: [n=1] TRUE [18:41:45.394] - queued futures: [n=1] TRUE [18:41:45.394] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.395] resolve() on list ... DONE [18:41:45.395] - Number of value chunks collected: 1 [18:41:45.395] Resolving 1 futures (chunks) ... DONE [18:41:45.396] Reducing values from 1 chunks ... [18:41:45.396] - Number of values collected after concatenation: 4 [18:41:45.396] - Number of values expected: 4 [18:41:45.396] Reducing values from 1 chunks ... DONE [18:41:45.397] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:45.403] future_lapply() ... [18:41:45.403] Number of chunks: 1 [18:41:45.403] getGlobalsAndPackagesXApply() ... [18:41:45.404] - future.globals: TRUE [18:41:45.404] getGlobalsAndPackages() ... [18:41:45.404] Searching for globals... [18:41:45.405] - globals found: [1] 'FUN' [18:41:45.406] Searching for globals ... DONE [18:41:45.406] Resolving globals: FALSE [18:41:45.407] The total size of the 1 globals is 35 bytes (35 bytes) [18:41:45.407] The total size of the 1 globals exported for future expression ('FUN()') is 35 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (35 bytes of class 'function') [18:41:45.408] - globals: [1] 'FUN' [18:41:45.408] [18:41:45.408] getGlobalsAndPackages() ... DONE [18:41:45.408] - globals found/used: [n=1] 'FUN' [18:41:45.409] - needed namespaces: [n=0] [18:41:45.409] Finding globals ... DONE [18:41:45.409] - use_args: TRUE [18:41:45.409] - Getting '...' globals ... [18:41:45.410] resolve() on list ... [18:41:45.410] recursive: 0 [18:41:45.411] length: 1 [18:41:45.411] elements: '...' [18:41:45.411] length: 0 (resolved future 1) [18:41:45.412] resolve() on list ... DONE [18:41:45.412] - '...' content: [n=0] [18:41:45.412] List of 1 [18:41:45.412] $ ...: list() [18:41:45.412] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.412] - attr(*, "where")=List of 1 [18:41:45.412] ..$ ...: [18:41:45.412] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.412] - attr(*, "resolved")= logi TRUE [18:41:45.412] - attr(*, "total_size")= num NA [18:41:45.417] - Getting '...' globals ... DONE [18:41:45.417] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:45.418] List of 2 [18:41:45.418] $ ...future.FUN:function (x) [18:41:45.418] $ ... : list() [18:41:45.418] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.418] - attr(*, "where")=List of 2 [18:41:45.418] ..$ ...future.FUN: [18:41:45.418] ..$ ... : [18:41:45.418] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.418] - attr(*, "resolved")= logi FALSE [18:41:45.418] - attr(*, "total_size")= int 4258 [18:41:45.423] Packages to be attached in all futures: [n=0] [18:41:45.423] getGlobalsAndPackagesXApply() ... DONE [18:41:45.424] Number of futures (= number of chunks): 1 [18:41:45.424] Launching 1 futures (chunks) ... [18:41:45.424] Chunk #1 of 1 ... [18:41:45.425] - Finding globals in 'X' for chunk #1 ... [18:41:45.425] getGlobalsAndPackages() ... [18:41:45.425] Searching for globals... [18:41:45.426] [18:41:45.426] Searching for globals ... DONE [18:41:45.426] - globals: [0] [18:41:45.426] getGlobalsAndPackages() ... DONE [18:41:45.427] + additional globals found: [n=0] [18:41:45.427] + additional namespaces needed: [n=0] [18:41:45.427] - Finding globals in 'X' for chunk #1 ... DONE [18:41:45.428] - seeds: [18:41:45.428] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.428] getGlobalsAndPackages() ... [18:41:45.428] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.429] Resolving globals: FALSE [18:41:45.429] Tweak future expression to call with '...' arguments ... [18:41:45.429] { [18:41:45.429] do.call(function(...) { [18:41:45.429] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.429] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.429] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.429] on.exit(options(oopts), add = TRUE) [18:41:45.429] } [18:41:45.429] { [18:41:45.429] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.429] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.429] ...future.FUN(...future.X_jj, ...) [18:41:45.429] }) [18:41:45.429] } [18:41:45.429] }, args = future.call.arguments) [18:41:45.429] } [18:41:45.430] Tweak future expression to call with '...' arguments ... DONE [18:41:45.431] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.431] [18:41:45.431] getGlobalsAndPackages() ... DONE [18:41:45.432] run() for 'Future' ... [18:41:45.432] - state: 'created' [18:41:45.433] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:45.433] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.434] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:45.434] - Field: 'label' [18:41:45.434] - Field: 'local' [18:41:45.435] - Field: 'owner' [18:41:45.435] - Field: 'envir' [18:41:45.435] - Field: 'packages' [18:41:45.435] - Field: 'gc' [18:41:45.439] - Field: 'conditions' [18:41:45.440] - Field: 'expr' [18:41:45.440] - Field: 'uuid' [18:41:45.440] - Field: 'seed' [18:41:45.441] - Field: 'version' [18:41:45.441] - Field: 'result' [18:41:45.441] - Field: 'asynchronous' [18:41:45.442] - Field: 'calls' [18:41:45.442] - Field: 'globals' [18:41:45.442] - Field: 'stdout' [18:41:45.443] - Field: 'earlySignal' [18:41:45.443] - Field: 'lazy' [18:41:45.443] - Field: 'state' [18:41:45.444] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.444] - Launch lazy future ... [18:41:45.444] Packages needed by the future expression (n = 0): [18:41:45.445] Packages needed by future strategies (n = 0): [18:41:45.445] { [18:41:45.445] { [18:41:45.445] { [18:41:45.445] ...future.startTime <- base::Sys.time() [18:41:45.445] { [18:41:45.445] { [18:41:45.445] { [18:41:45.445] base::local({ [18:41:45.445] has_future <- base::requireNamespace("future", [18:41:45.445] quietly = TRUE) [18:41:45.445] if (has_future) { [18:41:45.445] ns <- base::getNamespace("future") [18:41:45.445] version <- ns[[".package"]][["version"]] [18:41:45.445] if (is.null(version)) [18:41:45.445] version <- utils::packageVersion("future") [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] version <- NULL [18:41:45.445] } [18:41:45.445] if (!has_future || version < "1.8.0") { [18:41:45.445] info <- base::c(r_version = base::gsub("R version ", [18:41:45.445] "", base::R.version$version.string), [18:41:45.445] platform = base::sprintf("%s (%s-bit)", [18:41:45.445] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.445] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.445] "release", "version")], collapse = " "), [18:41:45.445] hostname = base::Sys.info()[["nodename"]]) [18:41:45.445] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.445] info) [18:41:45.445] info <- base::paste(info, collapse = "; ") [18:41:45.445] if (!has_future) { [18:41:45.445] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.445] info) [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.445] info, version) [18:41:45.445] } [18:41:45.445] base::stop(msg) [18:41:45.445] } [18:41:45.445] }) [18:41:45.445] } [18:41:45.445] ...future.strategy.old <- future::plan("list") [18:41:45.445] options(future.plan = NULL) [18:41:45.445] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.445] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.445] } [18:41:45.445] ...future.workdir <- getwd() [18:41:45.445] } [18:41:45.445] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.445] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.445] } [18:41:45.445] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.445] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.445] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.445] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.445] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.445] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.445] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.445] base::names(...future.oldOptions)) [18:41:45.445] } [18:41:45.445] if (FALSE) { [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] if (TRUE) { [18:41:45.445] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.445] open = "w") [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.445] windows = "NUL", "/dev/null"), open = "w") [18:41:45.445] } [18:41:45.445] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.445] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.445] base::sink(type = "output", split = FALSE) [18:41:45.445] base::close(...future.stdout) [18:41:45.445] }, add = TRUE) [18:41:45.445] } [18:41:45.445] ...future.frame <- base::sys.nframe() [18:41:45.445] ...future.conditions <- base::list() [18:41:45.445] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.445] if (FALSE) { [18:41:45.445] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.445] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.445] } [18:41:45.445] ...future.result <- base::tryCatch({ [18:41:45.445] base::withCallingHandlers({ [18:41:45.445] ...future.value <- base::withVisible(base::local({ [18:41:45.445] do.call(function(...) { [18:41:45.445] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.445] if (!identical(...future.globals.maxSize.org, [18:41:45.445] ...future.globals.maxSize)) { [18:41:45.445] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.445] on.exit(options(oopts), add = TRUE) [18:41:45.445] } [18:41:45.445] { [18:41:45.445] lapply(seq_along(...future.elements_ii), [18:41:45.445] FUN = function(jj) { [18:41:45.445] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.445] ...future.FUN(...future.X_jj, ...) [18:41:45.445] }) [18:41:45.445] } [18:41:45.445] }, args = future.call.arguments) [18:41:45.445] })) [18:41:45.445] future::FutureResult(value = ...future.value$value, [18:41:45.445] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.445] ...future.rng), globalenv = if (FALSE) [18:41:45.445] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.445] ...future.globalenv.names)) [18:41:45.445] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.445] }, condition = base::local({ [18:41:45.445] c <- base::c [18:41:45.445] inherits <- base::inherits [18:41:45.445] invokeRestart <- base::invokeRestart [18:41:45.445] length <- base::length [18:41:45.445] list <- base::list [18:41:45.445] seq.int <- base::seq.int [18:41:45.445] signalCondition <- base::signalCondition [18:41:45.445] sys.calls <- base::sys.calls [18:41:45.445] `[[` <- base::`[[` [18:41:45.445] `+` <- base::`+` [18:41:45.445] `<<-` <- base::`<<-` [18:41:45.445] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.445] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.445] 3L)] [18:41:45.445] } [18:41:45.445] function(cond) { [18:41:45.445] is_error <- inherits(cond, "error") [18:41:45.445] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.445] NULL) [18:41:45.445] if (is_error) { [18:41:45.445] sessionInformation <- function() { [18:41:45.445] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.445] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.445] search = base::search(), system = base::Sys.info()) [18:41:45.445] } [18:41:45.445] ...future.conditions[[length(...future.conditions) + [18:41:45.445] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.445] cond$call), session = sessionInformation(), [18:41:45.445] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.445] signalCondition(cond) [18:41:45.445] } [18:41:45.445] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.445] "immediateCondition"))) { [18:41:45.445] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.445] ...future.conditions[[length(...future.conditions) + [18:41:45.445] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.445] if (TRUE && !signal) { [18:41:45.445] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.445] { [18:41:45.445] inherits <- base::inherits [18:41:45.445] invokeRestart <- base::invokeRestart [18:41:45.445] is.null <- base::is.null [18:41:45.445] muffled <- FALSE [18:41:45.445] if (inherits(cond, "message")) { [18:41:45.445] muffled <- grepl(pattern, "muffleMessage") [18:41:45.445] if (muffled) [18:41:45.445] invokeRestart("muffleMessage") [18:41:45.445] } [18:41:45.445] else if (inherits(cond, "warning")) { [18:41:45.445] muffled <- grepl(pattern, "muffleWarning") [18:41:45.445] if (muffled) [18:41:45.445] invokeRestart("muffleWarning") [18:41:45.445] } [18:41:45.445] else if (inherits(cond, "condition")) { [18:41:45.445] if (!is.null(pattern)) { [18:41:45.445] computeRestarts <- base::computeRestarts [18:41:45.445] grepl <- base::grepl [18:41:45.445] restarts <- computeRestarts(cond) [18:41:45.445] for (restart in restarts) { [18:41:45.445] name <- restart$name [18:41:45.445] if (is.null(name)) [18:41:45.445] next [18:41:45.445] if (!grepl(pattern, name)) [18:41:45.445] next [18:41:45.445] invokeRestart(restart) [18:41:45.445] muffled <- TRUE [18:41:45.445] break [18:41:45.445] } [18:41:45.445] } [18:41:45.445] } [18:41:45.445] invisible(muffled) [18:41:45.445] } [18:41:45.445] muffleCondition(cond, pattern = "^muffle") [18:41:45.445] } [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] if (TRUE) { [18:41:45.445] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.445] { [18:41:45.445] inherits <- base::inherits [18:41:45.445] invokeRestart <- base::invokeRestart [18:41:45.445] is.null <- base::is.null [18:41:45.445] muffled <- FALSE [18:41:45.445] if (inherits(cond, "message")) { [18:41:45.445] muffled <- grepl(pattern, "muffleMessage") [18:41:45.445] if (muffled) [18:41:45.445] invokeRestart("muffleMessage") [18:41:45.445] } [18:41:45.445] else if (inherits(cond, "warning")) { [18:41:45.445] muffled <- grepl(pattern, "muffleWarning") [18:41:45.445] if (muffled) [18:41:45.445] invokeRestart("muffleWarning") [18:41:45.445] } [18:41:45.445] else if (inherits(cond, "condition")) { [18:41:45.445] if (!is.null(pattern)) { [18:41:45.445] computeRestarts <- base::computeRestarts [18:41:45.445] grepl <- base::grepl [18:41:45.445] restarts <- computeRestarts(cond) [18:41:45.445] for (restart in restarts) { [18:41:45.445] name <- restart$name [18:41:45.445] if (is.null(name)) [18:41:45.445] next [18:41:45.445] if (!grepl(pattern, name)) [18:41:45.445] next [18:41:45.445] invokeRestart(restart) [18:41:45.445] muffled <- TRUE [18:41:45.445] break [18:41:45.445] } [18:41:45.445] } [18:41:45.445] } [18:41:45.445] invisible(muffled) [18:41:45.445] } [18:41:45.445] muffleCondition(cond, pattern = "^muffle") [18:41:45.445] } [18:41:45.445] } [18:41:45.445] } [18:41:45.445] })) [18:41:45.445] }, error = function(ex) { [18:41:45.445] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.445] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.445] ...future.rng), started = ...future.startTime, [18:41:45.445] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.445] version = "1.8"), class = "FutureResult") [18:41:45.445] }, finally = { [18:41:45.445] if (!identical(...future.workdir, getwd())) [18:41:45.445] setwd(...future.workdir) [18:41:45.445] { [18:41:45.445] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.445] ...future.oldOptions$nwarnings <- NULL [18:41:45.445] } [18:41:45.445] base::options(...future.oldOptions) [18:41:45.445] if (.Platform$OS.type == "windows") { [18:41:45.445] old_names <- names(...future.oldEnvVars) [18:41:45.445] envs <- base::Sys.getenv() [18:41:45.445] names <- names(envs) [18:41:45.445] common <- intersect(names, old_names) [18:41:45.445] added <- setdiff(names, old_names) [18:41:45.445] removed <- setdiff(old_names, names) [18:41:45.445] changed <- common[...future.oldEnvVars[common] != [18:41:45.445] envs[common]] [18:41:45.445] NAMES <- toupper(changed) [18:41:45.445] args <- list() [18:41:45.445] for (kk in seq_along(NAMES)) { [18:41:45.445] name <- changed[[kk]] [18:41:45.445] NAME <- NAMES[[kk]] [18:41:45.445] if (name != NAME && is.element(NAME, old_names)) [18:41:45.445] next [18:41:45.445] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.445] } [18:41:45.445] NAMES <- toupper(added) [18:41:45.445] for (kk in seq_along(NAMES)) { [18:41:45.445] name <- added[[kk]] [18:41:45.445] NAME <- NAMES[[kk]] [18:41:45.445] if (name != NAME && is.element(NAME, old_names)) [18:41:45.445] next [18:41:45.445] args[[name]] <- "" [18:41:45.445] } [18:41:45.445] NAMES <- toupper(removed) [18:41:45.445] for (kk in seq_along(NAMES)) { [18:41:45.445] name <- removed[[kk]] [18:41:45.445] NAME <- NAMES[[kk]] [18:41:45.445] if (name != NAME && is.element(NAME, old_names)) [18:41:45.445] next [18:41:45.445] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.445] } [18:41:45.445] if (length(args) > 0) [18:41:45.445] base::do.call(base::Sys.setenv, args = args) [18:41:45.445] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.445] } [18:41:45.445] { [18:41:45.445] if (base::length(...future.futureOptionsAdded) > [18:41:45.445] 0L) { [18:41:45.445] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.445] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.445] base::options(opts) [18:41:45.445] } [18:41:45.445] { [18:41:45.445] { [18:41:45.445] NULL [18:41:45.445] RNGkind("Mersenne-Twister") [18:41:45.445] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.445] inherits = FALSE) [18:41:45.445] } [18:41:45.445] options(future.plan = NULL) [18:41:45.445] if (is.na(NA_character_)) [18:41:45.445] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.445] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.445] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.445] .init = FALSE) [18:41:45.445] } [18:41:45.445] } [18:41:45.445] } [18:41:45.445] }) [18:41:45.445] if (TRUE) { [18:41:45.445] base::sink(type = "output", split = FALSE) [18:41:45.445] if (TRUE) { [18:41:45.445] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.445] } [18:41:45.445] else { [18:41:45.445] ...future.result["stdout"] <- base::list(NULL) [18:41:45.445] } [18:41:45.445] base::close(...future.stdout) [18:41:45.445] ...future.stdout <- NULL [18:41:45.445] } [18:41:45.445] ...future.result$conditions <- ...future.conditions [18:41:45.445] ...future.result$finished <- base::Sys.time() [18:41:45.445] ...future.result [18:41:45.445] } [18:41:45.452] assign_globals() ... [18:41:45.452] List of 5 [18:41:45.452] $ ...future.FUN :function (x) [18:41:45.452] $ future.call.arguments : list() [18:41:45.452] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.452] $ ...future.elements_ii :List of 3 [18:41:45.452] ..$ : int 1 [18:41:45.452] ..$ : int 2 [18:41:45.452] ..$ : int 3 [18:41:45.452] $ ...future.seeds_ii : NULL [18:41:45.452] $ ...future.globals.maxSize: NULL [18:41:45.452] - attr(*, "where")=List of 5 [18:41:45.452] ..$ ...future.FUN : [18:41:45.452] ..$ future.call.arguments : [18:41:45.452] ..$ ...future.elements_ii : [18:41:45.452] ..$ ...future.seeds_ii : [18:41:45.452] ..$ ...future.globals.maxSize: [18:41:45.452] - attr(*, "resolved")= logi FALSE [18:41:45.452] - attr(*, "total_size")= num 4258 [18:41:45.452] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.452] - attr(*, "already-done")= logi TRUE [18:41:45.463] - copied '...future.FUN' to environment [18:41:45.463] - copied 'future.call.arguments' to environment [18:41:45.463] - copied '...future.elements_ii' to environment [18:41:45.463] - copied '...future.seeds_ii' to environment [18:41:45.464] - copied '...future.globals.maxSize' to environment [18:41:45.464] assign_globals() ... done [18:41:45.465] plan(): Setting new future strategy stack: [18:41:45.465] List of future strategies: [18:41:45.465] 1. sequential: [18:41:45.465] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.465] - tweaked: FALSE [18:41:45.465] - call: NULL [18:41:45.466] plan(): nbrOfWorkers() = 1 [18:41:45.468] plan(): Setting new future strategy stack: [18:41:45.468] List of future strategies: [18:41:45.468] 1. sequential: [18:41:45.468] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.468] - tweaked: FALSE [18:41:45.468] - call: plan(strategy) [18:41:45.469] plan(): nbrOfWorkers() = 1 [18:41:45.470] SequentialFuture started (and completed) [18:41:45.470] - Launch lazy future ... done [18:41:45.470] run() for 'SequentialFuture' ... done [18:41:45.471] Created future: [18:41:45.471] SequentialFuture: [18:41:45.471] Label: 'future_sapply-1' [18:41:45.471] Expression: [18:41:45.471] { [18:41:45.471] do.call(function(...) { [18:41:45.471] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.471] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.471] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.471] on.exit(options(oopts), add = TRUE) [18:41:45.471] } [18:41:45.471] { [18:41:45.471] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.471] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.471] ...future.FUN(...future.X_jj, ...) [18:41:45.471] }) [18:41:45.471] } [18:41:45.471] }, args = future.call.arguments) [18:41:45.471] } [18:41:45.471] Lazy evaluation: FALSE [18:41:45.471] Asynchronous evaluation: FALSE [18:41:45.471] Local evaluation: TRUE [18:41:45.471] Environment: R_GlobalEnv [18:41:45.471] Capture standard output: TRUE [18:41:45.471] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.471] Globals: 5 objects totaling 253 bytes (function '...future.FUN' of 35 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 67 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:45.471] Packages: [18:41:45.471] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.471] Resolved: TRUE [18:41:45.471] Value: 79 bytes of class 'list' [18:41:45.471] Early signaling: FALSE [18:41:45.471] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.471] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.473] Chunk #1 of 1 ... DONE [18:41:45.473] Launching 1 futures (chunks) ... DONE [18:41:45.473] Resolving 1 futures (chunks) ... [18:41:45.474] resolve() on list ... [18:41:45.474] recursive: 0 [18:41:45.474] length: 1 [18:41:45.474] [18:41:45.475] resolved() for 'SequentialFuture' ... [18:41:45.475] - state: 'finished' [18:41:45.475] - run: TRUE [18:41:45.476] - result: 'FutureResult' [18:41:45.476] resolved() for 'SequentialFuture' ... done [18:41:45.476] Future #1 [18:41:45.477] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.477] - nx: 1 [18:41:45.477] - relay: TRUE [18:41:45.477] - stdout: TRUE [18:41:45.478] - signal: TRUE [18:41:45.478] - resignal: FALSE [18:41:45.478] - force: TRUE [18:41:45.478] - relayed: [n=1] FALSE [18:41:45.479] - queued futures: [n=1] FALSE [18:41:45.479] - until=1 [18:41:45.479] - relaying element #1 [18:41:45.480] - relayed: [n=1] TRUE [18:41:45.480] - queued futures: [n=1] TRUE [18:41:45.480] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.481] length: 0 (resolved future 1) [18:41:45.481] Relaying remaining futures [18:41:45.481] signalConditionsASAP(NULL, pos=0) ... [18:41:45.481] - nx: 1 [18:41:45.482] - relay: TRUE [18:41:45.482] - stdout: TRUE [18:41:45.482] - signal: TRUE [18:41:45.482] - resignal: FALSE [18:41:45.483] - force: TRUE [18:41:45.483] - relayed: [n=1] TRUE [18:41:45.483] - queued futures: [n=1] TRUE - flush all [18:41:45.484] - relayed: [n=1] TRUE [18:41:45.484] - queued futures: [n=1] TRUE [18:41:45.484] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.484] resolve() on list ... DONE [18:41:45.485] - Number of value chunks collected: 1 [18:41:45.485] Resolving 1 futures (chunks) ... DONE [18:41:45.485] Reducing values from 1 chunks ... [18:41:45.485] - Number of values collected after concatenation: 3 [18:41:45.486] - Number of values expected: 3 [18:41:45.486] Reducing values from 1 chunks ... DONE [18:41:45.486] future_lapply() ... DONE [18:41:45.487] future_lapply() ... [18:41:45.489] Number of chunks: 1 [18:41:45.489] getGlobalsAndPackagesXApply() ... [18:41:45.489] - future.globals: TRUE [18:41:45.490] getGlobalsAndPackages() ... [18:41:45.490] Searching for globals... [18:41:45.495] - globals found: [4] 'FUN', 'compute', '...', '+' [18:41:45.495] Searching for globals ... DONE [18:41:45.495] Resolving globals: FALSE [18:41:45.496] Tweak future expression to call with '...' arguments ... [18:41:45.496] { [18:41:45.496] do.call(function(...) FUN(), args = future.call.arguments) [18:41:45.496] } [18:41:45.496] Tweak future expression to call with '...' arguments ... DONE [18:41:45.497] The total size of the 3 globals is 1.51 KiB (1548 bytes) [18:41:45.498] The total size of the 3 globals exported for future expression ('FUN()') is 1.51 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'FUN' (1.10 KiB of class 'function'), 'compute' (315 bytes of class 'function') and 'future.call.arguments' (109 bytes of class 'list') [18:41:45.499] - globals: [3] 'FUN', 'compute', 'future.call.arguments' [18:41:45.499] [18:41:45.499] getGlobalsAndPackages() ... DONE [18:41:45.500] - globals found/used: [n=3] 'FUN', 'compute', 'future.call.arguments' [18:41:45.500] - needed namespaces: [n=0] [18:41:45.500] Finding globals ... DONE [18:41:45.501] - use_args: TRUE [18:41:45.501] - Getting '...' globals ... [18:41:45.502] resolve() on list ... [18:41:45.502] recursive: 0 [18:41:45.502] length: 1 [18:41:45.503] elements: '...' [18:41:45.503] length: 0 (resolved future 1) [18:41:45.503] resolve() on list ... DONE [18:41:45.504] - '...' content: [n=0] [18:41:45.504] List of 1 [18:41:45.504] $ ...: list() [18:41:45.504] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.504] - attr(*, "where")=List of 1 [18:41:45.504] ..$ ...: [18:41:45.504] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.504] - attr(*, "resolved")= logi TRUE [18:41:45.504] - attr(*, "total_size")= num NA [18:41:45.509] - Getting '...' globals ... DONE [18:41:45.510] Globals to be used in all futures (chunks): [n=4] '...future.FUN', 'compute', 'future.call.arguments', '...' [18:41:45.510] List of 4 [18:41:45.510] $ ...future.FUN :function (x) [18:41:45.510] $ compute :function (a, x_vec) [18:41:45.510] $ future.call.arguments:List of 1 [18:41:45.510] ..$ : int 0 [18:41:45.510] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.510] $ ... : list() [18:41:45.510] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.510] - attr(*, "where")=List of 4 [18:41:45.510] ..$ ...future.FUN : [18:41:45.510] ..$ compute : [18:41:45.510] ..$ future.call.arguments: [18:41:45.510] ..$ ... : [18:41:45.510] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.510] - attr(*, "resolved")= logi FALSE [18:41:45.510] - attr(*, "total_size")= int 6977 [18:41:45.520] Packages to be attached in all futures: [n=0] [18:41:45.520] getGlobalsAndPackagesXApply() ... DONE [18:41:45.521] Number of futures (= number of chunks): 1 [18:41:45.521] Launching 1 futures (chunks) ... [18:41:45.522] Chunk #1 of 1 ... [18:41:45.522] - Finding globals in 'X' for chunk #1 ... [18:41:45.522] getGlobalsAndPackages() ... [18:41:45.523] Searching for globals... [18:41:45.523] [18:41:45.523] Searching for globals ... DONE [18:41:45.524] - globals: [0] [18:41:45.524] getGlobalsAndPackages() ... DONE [18:41:45.524] + additional globals found: [n=0] [18:41:45.525] + additional namespaces needed: [n=0] [18:41:45.525] - Finding globals in 'X' for chunk #1 ... DONE [18:41:45.525] - seeds: [18:41:45.525] - All globals exported: [n=7] '...future.FUN', 'compute', 'future.call.arguments', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.526] getGlobalsAndPackages() ... [18:41:45.526] - globals passed as-is: [7] '...future.FUN', 'compute', 'future.call.arguments', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.526] Resolving globals: FALSE [18:41:45.527] Tweak future expression to call with '...' arguments ... [18:41:45.527] - Detected 2 'future.call.arguments' global entries: [18:41:45.527] List of 2 [18:41:45.527] $ future.call.arguments:List of 1 [18:41:45.527] ..$ : int 0 [18:41:45.527] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.527] $ future.call.arguments: list() [18:41:45.527] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.527] - attr(*, "where")=List of 2 [18:41:45.527] ..$ future.call.arguments: [18:41:45.527] ..$ future.call.arguments: [18:41:45.527] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.527] - attr(*, "resolved")= logi FALSE [18:41:45.527] - attr(*, "total_size")= num 6977 [18:41:45.535] future.call.arguments future.call.arguments [18:41:45.535] 1 0 [18:41:45.536] - 'future.call.arguments' global entries: [18:41:45.536] List of 2 [18:41:45.536] $ future.call.arguments:List of 1 [18:41:45.536] ..$ : int 0 [18:41:45.536] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.536] $ ...future.elements_ii:List of 2 [18:41:45.536] ..$ : int 1 [18:41:45.536] ..$ : int 2 [18:41:45.536] - attr(*, "where")=List of 2 [18:41:45.536] ..$ future.call.arguments: [18:41:45.536] ..$ ...future.elements_ii: [18:41:45.536] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.536] - attr(*, "resolved")= logi FALSE [18:41:45.536] - attr(*, "total_size")= num 6977 [18:41:45.545] { [18:41:45.545] do.call(function(...) { [18:41:45.545] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.545] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.545] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.545] on.exit(options(oopts), add = TRUE) [18:41:45.545] } [18:41:45.545] { [18:41:45.545] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.545] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.545] ...future.FUN(...future.X_jj) [18:41:45.545] }) [18:41:45.545] } [18:41:45.545] }, args = future.call.arguments) [18:41:45.545] } [18:41:45.545] Tweak future expression to call with '...' arguments ... DONE [18:41:45.546] - globals: [6] '...future.FUN', 'compute', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:45.547] [18:41:45.547] getGlobalsAndPackages() ... DONE [18:41:45.548] run() for 'Future' ... [18:41:45.548] - state: 'created' [18:41:45.548] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:45.549] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.549] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:45.550] - Field: 'label' [18:41:45.550] - Field: 'local' [18:41:45.550] - Field: 'owner' [18:41:45.551] - Field: 'envir' [18:41:45.551] - Field: 'packages' [18:41:45.551] - Field: 'gc' [18:41:45.552] - Field: 'conditions' [18:41:45.552] - Field: 'expr' [18:41:45.552] - Field: 'uuid' [18:41:45.553] - Field: 'seed' [18:41:45.553] - Field: 'version' [18:41:45.553] - Field: 'result' [18:41:45.554] - Field: 'asynchronous' [18:41:45.554] - Field: 'calls' [18:41:45.554] - Field: 'globals' [18:41:45.555] - Field: 'stdout' [18:41:45.555] - Field: 'earlySignal' [18:41:45.555] - Field: 'lazy' [18:41:45.556] - Field: 'state' [18:41:45.556] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:45.556] - Launch lazy future ... [18:41:45.557] Packages needed by the future expression (n = 0): [18:41:45.557] Packages needed by future strategies (n = 0): [18:41:45.558] { [18:41:45.558] { [18:41:45.558] { [18:41:45.558] ...future.startTime <- base::Sys.time() [18:41:45.558] { [18:41:45.558] { [18:41:45.558] { [18:41:45.558] base::local({ [18:41:45.558] has_future <- base::requireNamespace("future", [18:41:45.558] quietly = TRUE) [18:41:45.558] if (has_future) { [18:41:45.558] ns <- base::getNamespace("future") [18:41:45.558] version <- ns[[".package"]][["version"]] [18:41:45.558] if (is.null(version)) [18:41:45.558] version <- utils::packageVersion("future") [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] version <- NULL [18:41:45.558] } [18:41:45.558] if (!has_future || version < "1.8.0") { [18:41:45.558] info <- base::c(r_version = base::gsub("R version ", [18:41:45.558] "", base::R.version$version.string), [18:41:45.558] platform = base::sprintf("%s (%s-bit)", [18:41:45.558] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:45.558] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:45.558] "release", "version")], collapse = " "), [18:41:45.558] hostname = base::Sys.info()[["nodename"]]) [18:41:45.558] info <- base::sprintf("%s: %s", base::names(info), [18:41:45.558] info) [18:41:45.558] info <- base::paste(info, collapse = "; ") [18:41:45.558] if (!has_future) { [18:41:45.558] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:45.558] info) [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:45.558] info, version) [18:41:45.558] } [18:41:45.558] base::stop(msg) [18:41:45.558] } [18:41:45.558] }) [18:41:45.558] } [18:41:45.558] ...future.strategy.old <- future::plan("list") [18:41:45.558] options(future.plan = NULL) [18:41:45.558] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.558] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:45.558] } [18:41:45.558] ...future.workdir <- getwd() [18:41:45.558] } [18:41:45.558] ...future.oldOptions <- base::as.list(base::.Options) [18:41:45.558] ...future.oldEnvVars <- base::Sys.getenv() [18:41:45.558] } [18:41:45.558] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:45.558] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:45.558] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:45.558] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:45.558] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:45.558] future.stdout.windows.reencode = NULL, width = 80L) [18:41:45.558] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:45.558] base::names(...future.oldOptions)) [18:41:45.558] } [18:41:45.558] if (FALSE) { [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] if (TRUE) { [18:41:45.558] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:45.558] open = "w") [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:45.558] windows = "NUL", "/dev/null"), open = "w") [18:41:45.558] } [18:41:45.558] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:45.558] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:45.558] base::sink(type = "output", split = FALSE) [18:41:45.558] base::close(...future.stdout) [18:41:45.558] }, add = TRUE) [18:41:45.558] } [18:41:45.558] ...future.frame <- base::sys.nframe() [18:41:45.558] ...future.conditions <- base::list() [18:41:45.558] ...future.rng <- base::globalenv()$.Random.seed [18:41:45.558] if (FALSE) { [18:41:45.558] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:45.558] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:45.558] } [18:41:45.558] ...future.result <- base::tryCatch({ [18:41:45.558] base::withCallingHandlers({ [18:41:45.558] ...future.value <- base::withVisible(base::local({ [18:41:45.558] do.call(function(...) { [18:41:45.558] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.558] if (!identical(...future.globals.maxSize.org, [18:41:45.558] ...future.globals.maxSize)) { [18:41:45.558] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.558] on.exit(options(oopts), add = TRUE) [18:41:45.558] } [18:41:45.558] { [18:41:45.558] lapply(seq_along(...future.elements_ii), [18:41:45.558] FUN = function(jj) { [18:41:45.558] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.558] ...future.FUN(...future.X_jj) [18:41:45.558] }) [18:41:45.558] } [18:41:45.558] }, args = future.call.arguments) [18:41:45.558] })) [18:41:45.558] future::FutureResult(value = ...future.value$value, [18:41:45.558] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.558] ...future.rng), globalenv = if (FALSE) [18:41:45.558] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:45.558] ...future.globalenv.names)) [18:41:45.558] else NULL, started = ...future.startTime, version = "1.8") [18:41:45.558] }, condition = base::local({ [18:41:45.558] c <- base::c [18:41:45.558] inherits <- base::inherits [18:41:45.558] invokeRestart <- base::invokeRestart [18:41:45.558] length <- base::length [18:41:45.558] list <- base::list [18:41:45.558] seq.int <- base::seq.int [18:41:45.558] signalCondition <- base::signalCondition [18:41:45.558] sys.calls <- base::sys.calls [18:41:45.558] `[[` <- base::`[[` [18:41:45.558] `+` <- base::`+` [18:41:45.558] `<<-` <- base::`<<-` [18:41:45.558] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:45.558] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:45.558] 3L)] [18:41:45.558] } [18:41:45.558] function(cond) { [18:41:45.558] is_error <- inherits(cond, "error") [18:41:45.558] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:45.558] NULL) [18:41:45.558] if (is_error) { [18:41:45.558] sessionInformation <- function() { [18:41:45.558] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:45.558] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:45.558] search = base::search(), system = base::Sys.info()) [18:41:45.558] } [18:41:45.558] ...future.conditions[[length(...future.conditions) + [18:41:45.558] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:45.558] cond$call), session = sessionInformation(), [18:41:45.558] timestamp = base::Sys.time(), signaled = 0L) [18:41:45.558] signalCondition(cond) [18:41:45.558] } [18:41:45.558] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:45.558] "immediateCondition"))) { [18:41:45.558] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:45.558] ...future.conditions[[length(...future.conditions) + [18:41:45.558] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:45.558] if (TRUE && !signal) { [18:41:45.558] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.558] { [18:41:45.558] inherits <- base::inherits [18:41:45.558] invokeRestart <- base::invokeRestart [18:41:45.558] is.null <- base::is.null [18:41:45.558] muffled <- FALSE [18:41:45.558] if (inherits(cond, "message")) { [18:41:45.558] muffled <- grepl(pattern, "muffleMessage") [18:41:45.558] if (muffled) [18:41:45.558] invokeRestart("muffleMessage") [18:41:45.558] } [18:41:45.558] else if (inherits(cond, "warning")) { [18:41:45.558] muffled <- grepl(pattern, "muffleWarning") [18:41:45.558] if (muffled) [18:41:45.558] invokeRestart("muffleWarning") [18:41:45.558] } [18:41:45.558] else if (inherits(cond, "condition")) { [18:41:45.558] if (!is.null(pattern)) { [18:41:45.558] computeRestarts <- base::computeRestarts [18:41:45.558] grepl <- base::grepl [18:41:45.558] restarts <- computeRestarts(cond) [18:41:45.558] for (restart in restarts) { [18:41:45.558] name <- restart$name [18:41:45.558] if (is.null(name)) [18:41:45.558] next [18:41:45.558] if (!grepl(pattern, name)) [18:41:45.558] next [18:41:45.558] invokeRestart(restart) [18:41:45.558] muffled <- TRUE [18:41:45.558] break [18:41:45.558] } [18:41:45.558] } [18:41:45.558] } [18:41:45.558] invisible(muffled) [18:41:45.558] } [18:41:45.558] muffleCondition(cond, pattern = "^muffle") [18:41:45.558] } [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] if (TRUE) { [18:41:45.558] muffleCondition <- function (cond, pattern = "^muffle") [18:41:45.558] { [18:41:45.558] inherits <- base::inherits [18:41:45.558] invokeRestart <- base::invokeRestart [18:41:45.558] is.null <- base::is.null [18:41:45.558] muffled <- FALSE [18:41:45.558] if (inherits(cond, "message")) { [18:41:45.558] muffled <- grepl(pattern, "muffleMessage") [18:41:45.558] if (muffled) [18:41:45.558] invokeRestart("muffleMessage") [18:41:45.558] } [18:41:45.558] else if (inherits(cond, "warning")) { [18:41:45.558] muffled <- grepl(pattern, "muffleWarning") [18:41:45.558] if (muffled) [18:41:45.558] invokeRestart("muffleWarning") [18:41:45.558] } [18:41:45.558] else if (inherits(cond, "condition")) { [18:41:45.558] if (!is.null(pattern)) { [18:41:45.558] computeRestarts <- base::computeRestarts [18:41:45.558] grepl <- base::grepl [18:41:45.558] restarts <- computeRestarts(cond) [18:41:45.558] for (restart in restarts) { [18:41:45.558] name <- restart$name [18:41:45.558] if (is.null(name)) [18:41:45.558] next [18:41:45.558] if (!grepl(pattern, name)) [18:41:45.558] next [18:41:45.558] invokeRestart(restart) [18:41:45.558] muffled <- TRUE [18:41:45.558] break [18:41:45.558] } [18:41:45.558] } [18:41:45.558] } [18:41:45.558] invisible(muffled) [18:41:45.558] } [18:41:45.558] muffleCondition(cond, pattern = "^muffle") [18:41:45.558] } [18:41:45.558] } [18:41:45.558] } [18:41:45.558] })) [18:41:45.558] }, error = function(ex) { [18:41:45.558] base::structure(base::list(value = NULL, visible = NULL, [18:41:45.558] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:45.558] ...future.rng), started = ...future.startTime, [18:41:45.558] finished = Sys.time(), session_uuid = NA_character_, [18:41:45.558] version = "1.8"), class = "FutureResult") [18:41:45.558] }, finally = { [18:41:45.558] if (!identical(...future.workdir, getwd())) [18:41:45.558] setwd(...future.workdir) [18:41:45.558] { [18:41:45.558] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:45.558] ...future.oldOptions$nwarnings <- NULL [18:41:45.558] } [18:41:45.558] base::options(...future.oldOptions) [18:41:45.558] if (.Platform$OS.type == "windows") { [18:41:45.558] old_names <- names(...future.oldEnvVars) [18:41:45.558] envs <- base::Sys.getenv() [18:41:45.558] names <- names(envs) [18:41:45.558] common <- intersect(names, old_names) [18:41:45.558] added <- setdiff(names, old_names) [18:41:45.558] removed <- setdiff(old_names, names) [18:41:45.558] changed <- common[...future.oldEnvVars[common] != [18:41:45.558] envs[common]] [18:41:45.558] NAMES <- toupper(changed) [18:41:45.558] args <- list() [18:41:45.558] for (kk in seq_along(NAMES)) { [18:41:45.558] name <- changed[[kk]] [18:41:45.558] NAME <- NAMES[[kk]] [18:41:45.558] if (name != NAME && is.element(NAME, old_names)) [18:41:45.558] next [18:41:45.558] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.558] } [18:41:45.558] NAMES <- toupper(added) [18:41:45.558] for (kk in seq_along(NAMES)) { [18:41:45.558] name <- added[[kk]] [18:41:45.558] NAME <- NAMES[[kk]] [18:41:45.558] if (name != NAME && is.element(NAME, old_names)) [18:41:45.558] next [18:41:45.558] args[[name]] <- "" [18:41:45.558] } [18:41:45.558] NAMES <- toupper(removed) [18:41:45.558] for (kk in seq_along(NAMES)) { [18:41:45.558] name <- removed[[kk]] [18:41:45.558] NAME <- NAMES[[kk]] [18:41:45.558] if (name != NAME && is.element(NAME, old_names)) [18:41:45.558] next [18:41:45.558] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:45.558] } [18:41:45.558] if (length(args) > 0) [18:41:45.558] base::do.call(base::Sys.setenv, args = args) [18:41:45.558] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:45.558] } [18:41:45.558] { [18:41:45.558] if (base::length(...future.futureOptionsAdded) > [18:41:45.558] 0L) { [18:41:45.558] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:45.558] base::names(opts) <- ...future.futureOptionsAdded [18:41:45.558] base::options(opts) [18:41:45.558] } [18:41:45.558] { [18:41:45.558] { [18:41:45.558] NULL [18:41:45.558] RNGkind("Mersenne-Twister") [18:41:45.558] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:45.558] inherits = FALSE) [18:41:45.558] } [18:41:45.558] options(future.plan = NULL) [18:41:45.558] if (is.na(NA_character_)) [18:41:45.558] Sys.unsetenv("R_FUTURE_PLAN") [18:41:45.558] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:45.558] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:45.558] .init = FALSE) [18:41:45.558] } [18:41:45.558] } [18:41:45.558] } [18:41:45.558] }) [18:41:45.558] if (TRUE) { [18:41:45.558] base::sink(type = "output", split = FALSE) [18:41:45.558] if (TRUE) { [18:41:45.558] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:45.558] } [18:41:45.558] else { [18:41:45.558] ...future.result["stdout"] <- base::list(NULL) [18:41:45.558] } [18:41:45.558] base::close(...future.stdout) [18:41:45.558] ...future.stdout <- NULL [18:41:45.558] } [18:41:45.558] ...future.result$conditions <- ...future.conditions [18:41:45.558] ...future.result$finished <- base::Sys.time() [18:41:45.558] ...future.result [18:41:45.558] } [18:41:45.565] assign_globals() ... [18:41:45.565] List of 6 [18:41:45.565] $ ...future.FUN :function (x) [18:41:45.565] $ compute :function (a, x_vec) [18:41:45.565] $ future.call.arguments :List of 1 [18:41:45.565] ..$ : int 0 [18:41:45.565] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:45.565] $ ...future.elements_ii :List of 2 [18:41:45.565] ..$ : int 1 [18:41:45.565] ..$ : int 2 [18:41:45.565] $ ...future.seeds_ii : NULL [18:41:45.565] $ ...future.globals.maxSize: NULL [18:41:45.565] - attr(*, "where")=List of 6 [18:41:45.565] ..$ ...future.FUN : [18:41:45.565] ..$ compute : [18:41:45.565] ..$ future.call.arguments : [18:41:45.565] ..$ ...future.elements_ii : [18:41:45.565] ..$ ...future.seeds_ii : [18:41:45.565] ..$ ...future.globals.maxSize: [18:41:45.565] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:45.565] - attr(*, "resolved")= logi FALSE [18:41:45.565] - attr(*, "total_size")= num 6977 [18:41:45.565] - attr(*, "already-done")= logi TRUE [18:41:45.578] - reassign environment for '...future.FUN' [18:41:45.579] - copied '...future.FUN' to environment [18:41:45.579] - reassign environment for 'compute' [18:41:45.579] - copied 'compute' to environment [18:41:45.580] - copied 'future.call.arguments' to environment [18:41:45.580] - copied '...future.elements_ii' to environment [18:41:45.580] - copied '...future.seeds_ii' to environment [18:41:45.581] - copied '...future.globals.maxSize' to environment [18:41:45.581] assign_globals() ... done [18:41:45.582] plan(): Setting new future strategy stack: [18:41:45.582] List of future strategies: [18:41:45.582] 1. sequential: [18:41:45.582] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.582] - tweaked: FALSE [18:41:45.582] - call: NULL [18:41:45.583] plan(): nbrOfWorkers() = 1 [18:41:45.585] plan(): Setting new future strategy stack: [18:41:45.586] List of future strategies: [18:41:45.586] 1. sequential: [18:41:45.586] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.586] - tweaked: FALSE [18:41:45.586] - call: plan(strategy) [18:41:45.587] plan(): nbrOfWorkers() = 1 [18:41:45.587] SequentialFuture started (and completed) [18:41:45.588] - Launch lazy future ... done [18:41:45.588] run() for 'SequentialFuture' ... done [18:41:45.588] Created future: [18:41:45.589] SequentialFuture: [18:41:45.589] Label: 'future_sapply-1' [18:41:45.589] Expression: [18:41:45.589] { [18:41:45.589] do.call(function(...) { [18:41:45.589] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:45.589] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:45.589] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:45.589] on.exit(options(oopts), add = TRUE) [18:41:45.589] } [18:41:45.589] { [18:41:45.589] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:45.589] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:45.589] ...future.FUN(...future.X_jj) [18:41:45.589] }) [18:41:45.589] } [18:41:45.589] }, args = future.call.arguments) [18:41:45.589] } [18:41:45.589] Lazy evaluation: FALSE [18:41:45.589] Asynchronous evaluation: FALSE [18:41:45.589] Local evaluation: TRUE [18:41:45.589] Environment: 0x000001c2e59bd308 [18:41:45.589] Capture standard output: TRUE [18:41:45.589] Capture condition classes: 'condition' (excluding 'nothing') [18:41:45.589] Globals: 6 objects totaling 1.62 KiB (function '...future.FUN' of 1.10 KiB, function 'compute' of 315 bytes, DotDotDotList 'future.call.arguments' of 109 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:45.589] Packages: [18:41:45.589] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:45.589] Resolved: TRUE [18:41:45.589] Value: 55 bytes of class 'list' [18:41:45.589] Early signaling: FALSE [18:41:45.589] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:45.589] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:45.591] Chunk #1 of 1 ... DONE [18:41:45.591] Launching 1 futures (chunks) ... DONE [18:41:45.591] Resolving 1 futures (chunks) ... [18:41:45.592] resolve() on list ... [18:41:45.592] recursive: 0 [18:41:45.592] length: 1 [18:41:45.593] [18:41:45.593] resolved() for 'SequentialFuture' ... [18:41:45.593] - state: 'finished' [18:41:45.594] - run: TRUE [18:41:45.594] - result: 'FutureResult' [18:41:45.594] resolved() for 'SequentialFuture' ... done [18:41:45.595] Future #1 [18:41:45.595] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:45.595] - nx: 1 [18:41:45.596] - relay: TRUE [18:41:45.596] - stdout: TRUE [18:41:45.596] - signal: TRUE [18:41:45.597] - resignal: FALSE [18:41:45.597] - force: TRUE [18:41:45.597] - relayed: [n=1] FALSE [18:41:45.597] - queued futures: [n=1] FALSE [18:41:45.598] - until=1 [18:41:45.598] - relaying element #1 [18:41:45.599] - relayed: [n=1] TRUE [18:41:45.599] - queued futures: [n=1] TRUE [18:41:45.599] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:45.600] length: 0 (resolved future 1) [18:41:45.600] Relaying remaining futures [18:41:45.600] signalConditionsASAP(NULL, pos=0) ... [18:41:45.600] - nx: 1 [18:41:45.601] - relay: TRUE [18:41:45.601] - stdout: TRUE [18:41:45.601] - signal: TRUE [18:41:45.601] - resignal: FALSE [18:41:45.602] - force: TRUE [18:41:45.602] - relayed: [n=1] TRUE [18:41:45.602] - queued futures: [n=1] TRUE - flush all [18:41:45.603] - relayed: [n=1] TRUE [18:41:45.603] - queued futures: [n=1] TRUE [18:41:45.603] signalConditionsASAP(NULL, pos=0) ... done [18:41:45.604] resolve() on list ... DONE [18:41:45.604] - Number of value chunks collected: 1 [18:41:45.604] Resolving 1 futures (chunks) ... DONE [18:41:45.605] Reducing values from 1 chunks ... [18:41:45.605] - Number of values collected after concatenation: 2 [18:41:45.605] - Number of values expected: 2 [18:41:45.605] Reducing values from 1 chunks ... DONE [18:41:45.606] future_lapply() ... DONE [1] 1 2 [18:41:45.606] plan(): Setting new future strategy stack: [18:41:45.606] List of future strategies: [18:41:45.606] 1. sequential: [18:41:45.606] - args: function (..., envir = parent.frame(), workers = "") [18:41:45.606] - tweaked: FALSE [18:41:45.606] - call: plan(sequential) [18:41:45.607] plan(): nbrOfWorkers() = 1 *** strategy = 'sequential' ... done *** strategy = 'multisession' ... [18:41:45.608] plan(): Setting new future strategy stack: [18:41:45.609] List of future strategies: [18:41:45.609] 1. multisession: [18:41:45.609] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:45.609] - tweaked: FALSE [18:41:45.609] - call: plan(strategy) [18:41:45.609] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:41:45.610] multisession: [18:41:45.610] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:45.610] - tweaked: FALSE [18:41:45.610] - call: plan(strategy) [18:41:45.617] getGlobalsAndPackages() ... [18:41:45.617] Not searching for globals [18:41:45.618] - globals: [0] [18:41:45.618] getGlobalsAndPackages() ... DONE [18:41:45.619] [local output] makeClusterPSOCK() ... [18:41:45.686] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:41:45.694] [local output] Base port: 31402 [18:41:45.694] [local output] Getting setup options for 2 cluster nodes ... [18:41:45.694] [local output] - Node #1 of 2 ... [18:41:45.695] [local output] localMachine=TRUE => revtunnel=FALSE [18:41:45.696] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmp4gZoUE/worker.rank=1.parallelly.parent=173736.2a6a82c20db3.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/Rtmp4gZoUE/worker.rank=1.parallelly.parent=173736.2a6a82c20db3.pid\")"' [18:41:46.145] - Possible to infer worker's PID: TRUE [18:41:46.147] [local output] Rscript port: 31402 [18:41:46.147] [local output] - Node #2 of 2 ... [18:41:46.148] [local output] localMachine=TRUE => revtunnel=FALSE [18:41:46.150] [local output] Rscript port: 31402 [18:41:46.151] [local output] Getting setup options for 2 cluster nodes ... done [18:41:46.151] [local output] - Parallel setup requested for some PSOCK nodes [18:41:46.152] [local output] Setting up PSOCK nodes in parallel [18:41:46.153] List of 36 [18:41:46.153] $ worker : chr "localhost" [18:41:46.153] ..- attr(*, "localhost")= logi TRUE [18:41:46.153] $ master : chr "localhost" [18:41:46.153] $ port : int 31402 [18:41:46.153] $ connectTimeout : num 120 [18:41:46.153] $ timeout : num 120 [18:41:46.153] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:41:46.153] $ homogeneous : logi TRUE [18:41:46.153] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_sapply.R:173736:CRANWIN3:"| __truncated__ [18:41:46.153] $ rscript_envs : NULL [18:41:46.153] $ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:41:46.153] $ rscript_startup : NULL [18:41:46.153] $ rscript_sh : chr [1:2] "cmd" "cmd" [18:41:46.153] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:41:46.153] $ methods : logi TRUE [18:41:46.153] $ socketOptions : chr "no-delay" [18:41:46.153] $ useXDR : logi FALSE [18:41:46.153] $ outfile : chr "/dev/null" [18:41:46.153] $ renice : int NA [18:41:46.153] $ rshcmd : NULL [18:41:46.153] $ user : chr(0) [18:41:46.153] $ revtunnel : logi FALSE [18:41:46.153] $ rshlogfile : NULL [18:41:46.153] $ rshopts : chr(0) [18:41:46.153] $ rank : int 1 [18:41:46.153] $ manual : logi FALSE [18:41:46.153] $ dryrun : logi FALSE [18:41:46.153] $ quiet : logi FALSE [18:41:46.153] $ setup_strategy : chr "parallel" [18:41:46.153] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:41:46.153] $ pidfile : chr "D:/temp/Rtmp4gZoUE/worker.rank=1.parallelly.parent=173736.2a6a82c20db3.pid" [18:41:46.153] $ rshcmd_label : NULL [18:41:46.153] $ rsh_call : NULL [18:41:46.153] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:41:46.153] $ localMachine : logi TRUE [18:41:46.153] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:41:46.153] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:41:46.153] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:41:46.153] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:41:46.153] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:41:46.153] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [18:41:46.153] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [18:41:46.153] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:41:46.153] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:41:46.153] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:41:46.153] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:41:46.153] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:41:46.153] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:41:46.153] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:41:46.153] $ arguments :List of 28 [18:41:46.153] ..$ worker : chr "localhost" [18:41:46.153] ..$ master : NULL [18:41:46.153] ..$ port : int 31402 [18:41:46.153] ..$ connectTimeout : num 120 [18:41:46.153] ..$ timeout : num 120 [18:41:46.153] ..$ rscript : NULL [18:41:46.153] ..$ homogeneous : NULL [18:41:46.153] ..$ rscript_args : NULL [18:41:46.153] ..$ rscript_envs : NULL [18:41:46.153] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:41:46.153] ..$ rscript_startup : NULL [18:41:46.153] ..$ rscript_sh : chr "auto" [18:41:46.153] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:41:46.153] ..$ methods : logi TRUE [18:41:46.153] ..$ socketOptions : chr "no-delay" [18:41:46.153] ..$ useXDR : logi FALSE [18:41:46.153] ..$ outfile : chr "/dev/null" [18:41:46.153] ..$ renice : int NA [18:41:46.153] ..$ rshcmd : NULL [18:41:46.153] ..$ user : NULL [18:41:46.153] ..$ revtunnel : logi NA [18:41:46.153] ..$ rshlogfile : NULL [18:41:46.153] ..$ rshopts : NULL [18:41:46.153] ..$ rank : int 1 [18:41:46.153] ..$ manual : logi FALSE [18:41:46.153] ..$ dryrun : logi FALSE [18:41:46.153] ..$ quiet : logi FALSE [18:41:46.153] ..$ setup_strategy : chr "parallel" [18:41:46.153] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:41:46.187] [local output] System call to launch all workers: [18:41:46.187] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_sapply.R:173736:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmp4gZoUE/worker.rank=1.parallelly.parent=173736.2a6a82c20db3.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=31402 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:41:46.187] [local output] Starting PSOCK main server [18:41:46.196] [local output] Workers launched [18:41:46.197] [local output] Waiting for workers to connect back [18:41:46.197] - [local output] 0 workers out of 2 ready [18:41:46.378] - [local output] 0 workers out of 2 ready [18:41:46.378] - [local output] 1 workers out of 2 ready [18:41:46.486] - [local output] 1 workers out of 2 ready [18:41:46.486] - [local output] 2 workers out of 2 ready [18:41:46.487] [local output] Launching of 2 workers completed [18:41:46.487] [local output] Number of nodes in cluster: 2 [18:41:46.488] [local output] Collecting session information from 2 workers [18:41:46.489] [local output] - Worker #1 of 2 [18:41:46.491] [local output] - Worker #2 of 2 [18:41:46.491] [local output] makeClusterPSOCK() ... done [18:41:46.516] Packages needed by the future expression (n = 0): [18:41:46.516] Packages needed by future strategies (n = 0): [18:41:46.517] { [18:41:46.517] { [18:41:46.517] { [18:41:46.517] ...future.startTime <- base::Sys.time() [18:41:46.517] { [18:41:46.517] { [18:41:46.517] { [18:41:46.517] { [18:41:46.517] base::local({ [18:41:46.517] has_future <- base::requireNamespace("future", [18:41:46.517] quietly = TRUE) [18:41:46.517] if (has_future) { [18:41:46.517] ns <- base::getNamespace("future") [18:41:46.517] version <- ns[[".package"]][["version"]] [18:41:46.517] if (is.null(version)) [18:41:46.517] version <- utils::packageVersion("future") [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] version <- NULL [18:41:46.517] } [18:41:46.517] if (!has_future || version < "1.8.0") { [18:41:46.517] info <- base::c(r_version = base::gsub("R version ", [18:41:46.517] "", base::R.version$version.string), [18:41:46.517] platform = base::sprintf("%s (%s-bit)", [18:41:46.517] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:46.517] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:46.517] "release", "version")], collapse = " "), [18:41:46.517] hostname = base::Sys.info()[["nodename"]]) [18:41:46.517] info <- base::sprintf("%s: %s", base::names(info), [18:41:46.517] info) [18:41:46.517] info <- base::paste(info, collapse = "; ") [18:41:46.517] if (!has_future) { [18:41:46.517] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:46.517] info) [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:46.517] info, version) [18:41:46.517] } [18:41:46.517] base::stop(msg) [18:41:46.517] } [18:41:46.517] }) [18:41:46.517] } [18:41:46.517] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:46.517] base::options(mc.cores = 1L) [18:41:46.517] } [18:41:46.517] ...future.strategy.old <- future::plan("list") [18:41:46.517] options(future.plan = NULL) [18:41:46.517] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.517] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:46.517] } [18:41:46.517] ...future.workdir <- getwd() [18:41:46.517] } [18:41:46.517] ...future.oldOptions <- base::as.list(base::.Options) [18:41:46.517] ...future.oldEnvVars <- base::Sys.getenv() [18:41:46.517] } [18:41:46.517] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:46.517] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:46.517] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:46.517] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:46.517] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:46.517] future.stdout.windows.reencode = NULL, width = 80L) [18:41:46.517] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:46.517] base::names(...future.oldOptions)) [18:41:46.517] } [18:41:46.517] if (FALSE) { [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] if (TRUE) { [18:41:46.517] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:46.517] open = "w") [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:46.517] windows = "NUL", "/dev/null"), open = "w") [18:41:46.517] } [18:41:46.517] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:46.517] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:46.517] base::sink(type = "output", split = FALSE) [18:41:46.517] base::close(...future.stdout) [18:41:46.517] }, add = TRUE) [18:41:46.517] } [18:41:46.517] ...future.frame <- base::sys.nframe() [18:41:46.517] ...future.conditions <- base::list() [18:41:46.517] ...future.rng <- base::globalenv()$.Random.seed [18:41:46.517] if (FALSE) { [18:41:46.517] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:46.517] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:46.517] } [18:41:46.517] ...future.result <- base::tryCatch({ [18:41:46.517] base::withCallingHandlers({ [18:41:46.517] ...future.value <- base::withVisible(base::local({ [18:41:46.517] ...future.makeSendCondition <- base::local({ [18:41:46.517] sendCondition <- NULL [18:41:46.517] function(frame = 1L) { [18:41:46.517] if (is.function(sendCondition)) [18:41:46.517] return(sendCondition) [18:41:46.517] ns <- getNamespace("parallel") [18:41:46.517] if (exists("sendData", mode = "function", [18:41:46.517] envir = ns)) { [18:41:46.517] parallel_sendData <- get("sendData", mode = "function", [18:41:46.517] envir = ns) [18:41:46.517] envir <- sys.frame(frame) [18:41:46.517] master <- NULL [18:41:46.517] while (!identical(envir, .GlobalEnv) && [18:41:46.517] !identical(envir, emptyenv())) { [18:41:46.517] if (exists("master", mode = "list", envir = envir, [18:41:46.517] inherits = FALSE)) { [18:41:46.517] master <- get("master", mode = "list", [18:41:46.517] envir = envir, inherits = FALSE) [18:41:46.517] if (inherits(master, c("SOCKnode", [18:41:46.517] "SOCK0node"))) { [18:41:46.517] sendCondition <<- function(cond) { [18:41:46.517] data <- list(type = "VALUE", value = cond, [18:41:46.517] success = TRUE) [18:41:46.517] parallel_sendData(master, data) [18:41:46.517] } [18:41:46.517] return(sendCondition) [18:41:46.517] } [18:41:46.517] } [18:41:46.517] frame <- frame + 1L [18:41:46.517] envir <- sys.frame(frame) [18:41:46.517] } [18:41:46.517] } [18:41:46.517] sendCondition <<- function(cond) NULL [18:41:46.517] } [18:41:46.517] }) [18:41:46.517] withCallingHandlers({ [18:41:46.517] NA [18:41:46.517] }, immediateCondition = function(cond) { [18:41:46.517] sendCondition <- ...future.makeSendCondition() [18:41:46.517] sendCondition(cond) [18:41:46.517] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.517] { [18:41:46.517] inherits <- base::inherits [18:41:46.517] invokeRestart <- base::invokeRestart [18:41:46.517] is.null <- base::is.null [18:41:46.517] muffled <- FALSE [18:41:46.517] if (inherits(cond, "message")) { [18:41:46.517] muffled <- grepl(pattern, "muffleMessage") [18:41:46.517] if (muffled) [18:41:46.517] invokeRestart("muffleMessage") [18:41:46.517] } [18:41:46.517] else if (inherits(cond, "warning")) { [18:41:46.517] muffled <- grepl(pattern, "muffleWarning") [18:41:46.517] if (muffled) [18:41:46.517] invokeRestart("muffleWarning") [18:41:46.517] } [18:41:46.517] else if (inherits(cond, "condition")) { [18:41:46.517] if (!is.null(pattern)) { [18:41:46.517] computeRestarts <- base::computeRestarts [18:41:46.517] grepl <- base::grepl [18:41:46.517] restarts <- computeRestarts(cond) [18:41:46.517] for (restart in restarts) { [18:41:46.517] name <- restart$name [18:41:46.517] if (is.null(name)) [18:41:46.517] next [18:41:46.517] if (!grepl(pattern, name)) [18:41:46.517] next [18:41:46.517] invokeRestart(restart) [18:41:46.517] muffled <- TRUE [18:41:46.517] break [18:41:46.517] } [18:41:46.517] } [18:41:46.517] } [18:41:46.517] invisible(muffled) [18:41:46.517] } [18:41:46.517] muffleCondition(cond) [18:41:46.517] }) [18:41:46.517] })) [18:41:46.517] future::FutureResult(value = ...future.value$value, [18:41:46.517] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.517] ...future.rng), globalenv = if (FALSE) [18:41:46.517] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:46.517] ...future.globalenv.names)) [18:41:46.517] else NULL, started = ...future.startTime, version = "1.8") [18:41:46.517] }, condition = base::local({ [18:41:46.517] c <- base::c [18:41:46.517] inherits <- base::inherits [18:41:46.517] invokeRestart <- base::invokeRestart [18:41:46.517] length <- base::length [18:41:46.517] list <- base::list [18:41:46.517] seq.int <- base::seq.int [18:41:46.517] signalCondition <- base::signalCondition [18:41:46.517] sys.calls <- base::sys.calls [18:41:46.517] `[[` <- base::`[[` [18:41:46.517] `+` <- base::`+` [18:41:46.517] `<<-` <- base::`<<-` [18:41:46.517] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:46.517] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:46.517] 3L)] [18:41:46.517] } [18:41:46.517] function(cond) { [18:41:46.517] is_error <- inherits(cond, "error") [18:41:46.517] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:46.517] NULL) [18:41:46.517] if (is_error) { [18:41:46.517] sessionInformation <- function() { [18:41:46.517] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:46.517] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:46.517] search = base::search(), system = base::Sys.info()) [18:41:46.517] } [18:41:46.517] ...future.conditions[[length(...future.conditions) + [18:41:46.517] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:46.517] cond$call), session = sessionInformation(), [18:41:46.517] timestamp = base::Sys.time(), signaled = 0L) [18:41:46.517] signalCondition(cond) [18:41:46.517] } [18:41:46.517] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:46.517] "immediateCondition"))) { [18:41:46.517] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:46.517] ...future.conditions[[length(...future.conditions) + [18:41:46.517] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:46.517] if (TRUE && !signal) { [18:41:46.517] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.517] { [18:41:46.517] inherits <- base::inherits [18:41:46.517] invokeRestart <- base::invokeRestart [18:41:46.517] is.null <- base::is.null [18:41:46.517] muffled <- FALSE [18:41:46.517] if (inherits(cond, "message")) { [18:41:46.517] muffled <- grepl(pattern, "muffleMessage") [18:41:46.517] if (muffled) [18:41:46.517] invokeRestart("muffleMessage") [18:41:46.517] } [18:41:46.517] else if (inherits(cond, "warning")) { [18:41:46.517] muffled <- grepl(pattern, "muffleWarning") [18:41:46.517] if (muffled) [18:41:46.517] invokeRestart("muffleWarning") [18:41:46.517] } [18:41:46.517] else if (inherits(cond, "condition")) { [18:41:46.517] if (!is.null(pattern)) { [18:41:46.517] computeRestarts <- base::computeRestarts [18:41:46.517] grepl <- base::grepl [18:41:46.517] restarts <- computeRestarts(cond) [18:41:46.517] for (restart in restarts) { [18:41:46.517] name <- restart$name [18:41:46.517] if (is.null(name)) [18:41:46.517] next [18:41:46.517] if (!grepl(pattern, name)) [18:41:46.517] next [18:41:46.517] invokeRestart(restart) [18:41:46.517] muffled <- TRUE [18:41:46.517] break [18:41:46.517] } [18:41:46.517] } [18:41:46.517] } [18:41:46.517] invisible(muffled) [18:41:46.517] } [18:41:46.517] muffleCondition(cond, pattern = "^muffle") [18:41:46.517] } [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] if (TRUE) { [18:41:46.517] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.517] { [18:41:46.517] inherits <- base::inherits [18:41:46.517] invokeRestart <- base::invokeRestart [18:41:46.517] is.null <- base::is.null [18:41:46.517] muffled <- FALSE [18:41:46.517] if (inherits(cond, "message")) { [18:41:46.517] muffled <- grepl(pattern, "muffleMessage") [18:41:46.517] if (muffled) [18:41:46.517] invokeRestart("muffleMessage") [18:41:46.517] } [18:41:46.517] else if (inherits(cond, "warning")) { [18:41:46.517] muffled <- grepl(pattern, "muffleWarning") [18:41:46.517] if (muffled) [18:41:46.517] invokeRestart("muffleWarning") [18:41:46.517] } [18:41:46.517] else if (inherits(cond, "condition")) { [18:41:46.517] if (!is.null(pattern)) { [18:41:46.517] computeRestarts <- base::computeRestarts [18:41:46.517] grepl <- base::grepl [18:41:46.517] restarts <- computeRestarts(cond) [18:41:46.517] for (restart in restarts) { [18:41:46.517] name <- restart$name [18:41:46.517] if (is.null(name)) [18:41:46.517] next [18:41:46.517] if (!grepl(pattern, name)) [18:41:46.517] next [18:41:46.517] invokeRestart(restart) [18:41:46.517] muffled <- TRUE [18:41:46.517] break [18:41:46.517] } [18:41:46.517] } [18:41:46.517] } [18:41:46.517] invisible(muffled) [18:41:46.517] } [18:41:46.517] muffleCondition(cond, pattern = "^muffle") [18:41:46.517] } [18:41:46.517] } [18:41:46.517] } [18:41:46.517] })) [18:41:46.517] }, error = function(ex) { [18:41:46.517] base::structure(base::list(value = NULL, visible = NULL, [18:41:46.517] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.517] ...future.rng), started = ...future.startTime, [18:41:46.517] finished = Sys.time(), session_uuid = NA_character_, [18:41:46.517] version = "1.8"), class = "FutureResult") [18:41:46.517] }, finally = { [18:41:46.517] if (!identical(...future.workdir, getwd())) [18:41:46.517] setwd(...future.workdir) [18:41:46.517] { [18:41:46.517] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:46.517] ...future.oldOptions$nwarnings <- NULL [18:41:46.517] } [18:41:46.517] base::options(...future.oldOptions) [18:41:46.517] if (.Platform$OS.type == "windows") { [18:41:46.517] old_names <- names(...future.oldEnvVars) [18:41:46.517] envs <- base::Sys.getenv() [18:41:46.517] names <- names(envs) [18:41:46.517] common <- intersect(names, old_names) [18:41:46.517] added <- setdiff(names, old_names) [18:41:46.517] removed <- setdiff(old_names, names) [18:41:46.517] changed <- common[...future.oldEnvVars[common] != [18:41:46.517] envs[common]] [18:41:46.517] NAMES <- toupper(changed) [18:41:46.517] args <- list() [18:41:46.517] for (kk in seq_along(NAMES)) { [18:41:46.517] name <- changed[[kk]] [18:41:46.517] NAME <- NAMES[[kk]] [18:41:46.517] if (name != NAME && is.element(NAME, old_names)) [18:41:46.517] next [18:41:46.517] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.517] } [18:41:46.517] NAMES <- toupper(added) [18:41:46.517] for (kk in seq_along(NAMES)) { [18:41:46.517] name <- added[[kk]] [18:41:46.517] NAME <- NAMES[[kk]] [18:41:46.517] if (name != NAME && is.element(NAME, old_names)) [18:41:46.517] next [18:41:46.517] args[[name]] <- "" [18:41:46.517] } [18:41:46.517] NAMES <- toupper(removed) [18:41:46.517] for (kk in seq_along(NAMES)) { [18:41:46.517] name <- removed[[kk]] [18:41:46.517] NAME <- NAMES[[kk]] [18:41:46.517] if (name != NAME && is.element(NAME, old_names)) [18:41:46.517] next [18:41:46.517] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.517] } [18:41:46.517] if (length(args) > 0) [18:41:46.517] base::do.call(base::Sys.setenv, args = args) [18:41:46.517] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:46.517] } [18:41:46.517] { [18:41:46.517] if (base::length(...future.futureOptionsAdded) > [18:41:46.517] 0L) { [18:41:46.517] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:46.517] base::names(opts) <- ...future.futureOptionsAdded [18:41:46.517] base::options(opts) [18:41:46.517] } [18:41:46.517] { [18:41:46.517] { [18:41:46.517] base::options(mc.cores = ...future.mc.cores.old) [18:41:46.517] NULL [18:41:46.517] } [18:41:46.517] options(future.plan = NULL) [18:41:46.517] if (is.na(NA_character_)) [18:41:46.517] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.517] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:46.517] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:46.517] .init = FALSE) [18:41:46.517] } [18:41:46.517] } [18:41:46.517] } [18:41:46.517] }) [18:41:46.517] if (TRUE) { [18:41:46.517] base::sink(type = "output", split = FALSE) [18:41:46.517] if (TRUE) { [18:41:46.517] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:46.517] } [18:41:46.517] else { [18:41:46.517] ...future.result["stdout"] <- base::list(NULL) [18:41:46.517] } [18:41:46.517] base::close(...future.stdout) [18:41:46.517] ...future.stdout <- NULL [18:41:46.517] } [18:41:46.517] ...future.result$conditions <- ...future.conditions [18:41:46.517] ...future.result$finished <- base::Sys.time() [18:41:46.517] ...future.result [18:41:46.517] } [18:41:46.611] MultisessionFuture started [18:41:46.612] result() for ClusterFuture ... [18:41:46.613] receiveMessageFromWorker() for ClusterFuture ... [18:41:46.613] - Validating connection of MultisessionFuture [18:41:46.665] - received message: FutureResult [18:41:46.666] - Received FutureResult [18:41:46.671] - Erased future from FutureRegistry [18:41:46.672] result() for ClusterFuture ... [18:41:46.672] - result already collected: FutureResult [18:41:46.672] result() for ClusterFuture ... done [18:41:46.672] receiveMessageFromWorker() for ClusterFuture ... done [18:41:46.673] result() for ClusterFuture ... done [18:41:46.673] result() for ClusterFuture ... [18:41:46.673] - result already collected: FutureResult [18:41:46.674] result() for ClusterFuture ... done [18:41:46.674] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:41:46.678] plan(): nbrOfWorkers() = 2 [18:41:46.679] future_lapply() ... [18:41:46.686] Number of chunks: 2 [18:41:46.686] getGlobalsAndPackagesXApply() ... [18:41:46.687] - future.globals: TRUE [18:41:46.687] getGlobalsAndPackages() ... [18:41:46.687] Searching for globals... [18:41:46.689] - globals found: [1] 'FUN' [18:41:46.690] Searching for globals ... DONE [18:41:46.690] Resolving globals: FALSE [18:41:46.691] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:46.692] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:46.692] - globals: [1] 'FUN' [18:41:46.692] [18:41:46.693] getGlobalsAndPackages() ... DONE [18:41:46.693] - globals found/used: [n=1] 'FUN' [18:41:46.693] - needed namespaces: [n=0] [18:41:46.694] Finding globals ... DONE [18:41:46.694] - use_args: TRUE [18:41:46.694] - Getting '...' globals ... [18:41:46.695] resolve() on list ... [18:41:46.696] recursive: 0 [18:41:46.696] length: 1 [18:41:46.696] elements: '...' [18:41:46.697] length: 0 (resolved future 1) [18:41:46.697] resolve() on list ... DONE [18:41:46.697] - '...' content: [n=0] [18:41:46.698] List of 1 [18:41:46.698] $ ...: list() [18:41:46.698] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:46.698] - attr(*, "where")=List of 1 [18:41:46.698] ..$ ...: [18:41:46.698] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:46.698] - attr(*, "resolved")= logi TRUE [18:41:46.698] - attr(*, "total_size")= num NA [18:41:46.703] - Getting '...' globals ... DONE [18:41:46.704] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:46.704] List of 2 [18:41:46.704] $ ...future.FUN:function (x) [18:41:46.704] $ ... : list() [18:41:46.704] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:46.704] - attr(*, "where")=List of 2 [18:41:46.704] ..$ ...future.FUN: [18:41:46.704] ..$ ... : [18:41:46.704] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:46.704] - attr(*, "resolved")= logi FALSE [18:41:46.704] - attr(*, "total_size")= int 4876 [18:41:46.711] Packages to be attached in all futures: [n=0] [18:41:46.711] getGlobalsAndPackagesXApply() ... DONE [18:41:46.712] Number of futures (= number of chunks): 2 [18:41:46.712] Launching 2 futures (chunks) ... [18:41:46.712] Chunk #1 of 2 ... [18:41:46.713] - Finding globals in 'X' for chunk #1 ... [18:41:46.713] getGlobalsAndPackages() ... [18:41:46.713] Searching for globals... [18:41:46.714] [18:41:46.714] Searching for globals ... DONE [18:41:46.715] - globals: [0] [18:41:46.715] getGlobalsAndPackages() ... DONE [18:41:46.715] + additional globals found: [n=0] [18:41:46.716] + additional namespaces needed: [n=0] [18:41:46.716] - Finding globals in 'X' for chunk #1 ... DONE [18:41:46.716] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:46.716] - seeds: [18:41:46.717] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.717] getGlobalsAndPackages() ... [18:41:46.717] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.718] Resolving globals: FALSE [18:41:46.718] Tweak future expression to call with '...' arguments ... [18:41:46.718] { [18:41:46.718] do.call(function(...) { [18:41:46.718] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.718] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.718] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.718] on.exit(options(oopts), add = TRUE) [18:41:46.718] } [18:41:46.718] { [18:41:46.718] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.718] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.718] ...future.FUN(...future.X_jj, ...) [18:41:46.718] }) [18:41:46.718] } [18:41:46.718] }, args = future.call.arguments) [18:41:46.718] } [18:41:46.719] Tweak future expression to call with '...' arguments ... DONE [18:41:46.720] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.721] [18:41:46.721] getGlobalsAndPackages() ... DONE [18:41:46.722] run() for 'Future' ... [18:41:46.722] - state: 'created' [18:41:46.722] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:46.750] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:46.750] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:46.751] - Field: 'node' [18:41:46.751] - Field: 'label' [18:41:46.751] - Field: 'local' [18:41:46.752] - Field: 'owner' [18:41:46.752] - Field: 'envir' [18:41:46.752] - Field: 'workers' [18:41:46.753] - Field: 'packages' [18:41:46.753] - Field: 'gc' [18:41:46.753] - Field: 'conditions' [18:41:46.754] - Field: 'persistent' [18:41:46.754] - Field: 'expr' [18:41:46.754] - Field: 'uuid' [18:41:46.755] - Field: 'seed' [18:41:46.755] - Field: 'version' [18:41:46.755] - Field: 'result' [18:41:46.756] - Field: 'asynchronous' [18:41:46.756] - Field: 'calls' [18:41:46.756] - Field: 'globals' [18:41:46.756] - Field: 'stdout' [18:41:46.757] - Field: 'earlySignal' [18:41:46.757] - Field: 'lazy' [18:41:46.757] - Field: 'state' [18:41:46.758] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:46.758] - Launch lazy future ... [18:41:46.759] Packages needed by the future expression (n = 0): [18:41:46.759] Packages needed by future strategies (n = 0): [18:41:46.760] { [18:41:46.760] { [18:41:46.760] { [18:41:46.760] ...future.startTime <- base::Sys.time() [18:41:46.760] { [18:41:46.760] { [18:41:46.760] { [18:41:46.760] { [18:41:46.760] base::local({ [18:41:46.760] has_future <- base::requireNamespace("future", [18:41:46.760] quietly = TRUE) [18:41:46.760] if (has_future) { [18:41:46.760] ns <- base::getNamespace("future") [18:41:46.760] version <- ns[[".package"]][["version"]] [18:41:46.760] if (is.null(version)) [18:41:46.760] version <- utils::packageVersion("future") [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] version <- NULL [18:41:46.760] } [18:41:46.760] if (!has_future || version < "1.8.0") { [18:41:46.760] info <- base::c(r_version = base::gsub("R version ", [18:41:46.760] "", base::R.version$version.string), [18:41:46.760] platform = base::sprintf("%s (%s-bit)", [18:41:46.760] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:46.760] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:46.760] "release", "version")], collapse = " "), [18:41:46.760] hostname = base::Sys.info()[["nodename"]]) [18:41:46.760] info <- base::sprintf("%s: %s", base::names(info), [18:41:46.760] info) [18:41:46.760] info <- base::paste(info, collapse = "; ") [18:41:46.760] if (!has_future) { [18:41:46.760] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:46.760] info) [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:46.760] info, version) [18:41:46.760] } [18:41:46.760] base::stop(msg) [18:41:46.760] } [18:41:46.760] }) [18:41:46.760] } [18:41:46.760] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:46.760] base::options(mc.cores = 1L) [18:41:46.760] } [18:41:46.760] ...future.strategy.old <- future::plan("list") [18:41:46.760] options(future.plan = NULL) [18:41:46.760] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.760] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:46.760] } [18:41:46.760] ...future.workdir <- getwd() [18:41:46.760] } [18:41:46.760] ...future.oldOptions <- base::as.list(base::.Options) [18:41:46.760] ...future.oldEnvVars <- base::Sys.getenv() [18:41:46.760] } [18:41:46.760] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:46.760] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:46.760] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:46.760] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:46.760] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:46.760] future.stdout.windows.reencode = NULL, width = 80L) [18:41:46.760] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:46.760] base::names(...future.oldOptions)) [18:41:46.760] } [18:41:46.760] if (FALSE) { [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] if (TRUE) { [18:41:46.760] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:46.760] open = "w") [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:46.760] windows = "NUL", "/dev/null"), open = "w") [18:41:46.760] } [18:41:46.760] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:46.760] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:46.760] base::sink(type = "output", split = FALSE) [18:41:46.760] base::close(...future.stdout) [18:41:46.760] }, add = TRUE) [18:41:46.760] } [18:41:46.760] ...future.frame <- base::sys.nframe() [18:41:46.760] ...future.conditions <- base::list() [18:41:46.760] ...future.rng <- base::globalenv()$.Random.seed [18:41:46.760] if (FALSE) { [18:41:46.760] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:46.760] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:46.760] } [18:41:46.760] ...future.result <- base::tryCatch({ [18:41:46.760] base::withCallingHandlers({ [18:41:46.760] ...future.value <- base::withVisible(base::local({ [18:41:46.760] ...future.makeSendCondition <- base::local({ [18:41:46.760] sendCondition <- NULL [18:41:46.760] function(frame = 1L) { [18:41:46.760] if (is.function(sendCondition)) [18:41:46.760] return(sendCondition) [18:41:46.760] ns <- getNamespace("parallel") [18:41:46.760] if (exists("sendData", mode = "function", [18:41:46.760] envir = ns)) { [18:41:46.760] parallel_sendData <- get("sendData", mode = "function", [18:41:46.760] envir = ns) [18:41:46.760] envir <- sys.frame(frame) [18:41:46.760] master <- NULL [18:41:46.760] while (!identical(envir, .GlobalEnv) && [18:41:46.760] !identical(envir, emptyenv())) { [18:41:46.760] if (exists("master", mode = "list", envir = envir, [18:41:46.760] inherits = FALSE)) { [18:41:46.760] master <- get("master", mode = "list", [18:41:46.760] envir = envir, inherits = FALSE) [18:41:46.760] if (inherits(master, c("SOCKnode", [18:41:46.760] "SOCK0node"))) { [18:41:46.760] sendCondition <<- function(cond) { [18:41:46.760] data <- list(type = "VALUE", value = cond, [18:41:46.760] success = TRUE) [18:41:46.760] parallel_sendData(master, data) [18:41:46.760] } [18:41:46.760] return(sendCondition) [18:41:46.760] } [18:41:46.760] } [18:41:46.760] frame <- frame + 1L [18:41:46.760] envir <- sys.frame(frame) [18:41:46.760] } [18:41:46.760] } [18:41:46.760] sendCondition <<- function(cond) NULL [18:41:46.760] } [18:41:46.760] }) [18:41:46.760] withCallingHandlers({ [18:41:46.760] { [18:41:46.760] do.call(function(...) { [18:41:46.760] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.760] if (!identical(...future.globals.maxSize.org, [18:41:46.760] ...future.globals.maxSize)) { [18:41:46.760] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.760] on.exit(options(oopts), add = TRUE) [18:41:46.760] } [18:41:46.760] { [18:41:46.760] lapply(seq_along(...future.elements_ii), [18:41:46.760] FUN = function(jj) { [18:41:46.760] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.760] ...future.FUN(...future.X_jj, ...) [18:41:46.760] }) [18:41:46.760] } [18:41:46.760] }, args = future.call.arguments) [18:41:46.760] } [18:41:46.760] }, immediateCondition = function(cond) { [18:41:46.760] sendCondition <- ...future.makeSendCondition() [18:41:46.760] sendCondition(cond) [18:41:46.760] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.760] { [18:41:46.760] inherits <- base::inherits [18:41:46.760] invokeRestart <- base::invokeRestart [18:41:46.760] is.null <- base::is.null [18:41:46.760] muffled <- FALSE [18:41:46.760] if (inherits(cond, "message")) { [18:41:46.760] muffled <- grepl(pattern, "muffleMessage") [18:41:46.760] if (muffled) [18:41:46.760] invokeRestart("muffleMessage") [18:41:46.760] } [18:41:46.760] else if (inherits(cond, "warning")) { [18:41:46.760] muffled <- grepl(pattern, "muffleWarning") [18:41:46.760] if (muffled) [18:41:46.760] invokeRestart("muffleWarning") [18:41:46.760] } [18:41:46.760] else if (inherits(cond, "condition")) { [18:41:46.760] if (!is.null(pattern)) { [18:41:46.760] computeRestarts <- base::computeRestarts [18:41:46.760] grepl <- base::grepl [18:41:46.760] restarts <- computeRestarts(cond) [18:41:46.760] for (restart in restarts) { [18:41:46.760] name <- restart$name [18:41:46.760] if (is.null(name)) [18:41:46.760] next [18:41:46.760] if (!grepl(pattern, name)) [18:41:46.760] next [18:41:46.760] invokeRestart(restart) [18:41:46.760] muffled <- TRUE [18:41:46.760] break [18:41:46.760] } [18:41:46.760] } [18:41:46.760] } [18:41:46.760] invisible(muffled) [18:41:46.760] } [18:41:46.760] muffleCondition(cond) [18:41:46.760] }) [18:41:46.760] })) [18:41:46.760] future::FutureResult(value = ...future.value$value, [18:41:46.760] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.760] ...future.rng), globalenv = if (FALSE) [18:41:46.760] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:46.760] ...future.globalenv.names)) [18:41:46.760] else NULL, started = ...future.startTime, version = "1.8") [18:41:46.760] }, condition = base::local({ [18:41:46.760] c <- base::c [18:41:46.760] inherits <- base::inherits [18:41:46.760] invokeRestart <- base::invokeRestart [18:41:46.760] length <- base::length [18:41:46.760] list <- base::list [18:41:46.760] seq.int <- base::seq.int [18:41:46.760] signalCondition <- base::signalCondition [18:41:46.760] sys.calls <- base::sys.calls [18:41:46.760] `[[` <- base::`[[` [18:41:46.760] `+` <- base::`+` [18:41:46.760] `<<-` <- base::`<<-` [18:41:46.760] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:46.760] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:46.760] 3L)] [18:41:46.760] } [18:41:46.760] function(cond) { [18:41:46.760] is_error <- inherits(cond, "error") [18:41:46.760] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:46.760] NULL) [18:41:46.760] if (is_error) { [18:41:46.760] sessionInformation <- function() { [18:41:46.760] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:46.760] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:46.760] search = base::search(), system = base::Sys.info()) [18:41:46.760] } [18:41:46.760] ...future.conditions[[length(...future.conditions) + [18:41:46.760] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:46.760] cond$call), session = sessionInformation(), [18:41:46.760] timestamp = base::Sys.time(), signaled = 0L) [18:41:46.760] signalCondition(cond) [18:41:46.760] } [18:41:46.760] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:46.760] "immediateCondition"))) { [18:41:46.760] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:46.760] ...future.conditions[[length(...future.conditions) + [18:41:46.760] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:46.760] if (TRUE && !signal) { [18:41:46.760] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.760] { [18:41:46.760] inherits <- base::inherits [18:41:46.760] invokeRestart <- base::invokeRestart [18:41:46.760] is.null <- base::is.null [18:41:46.760] muffled <- FALSE [18:41:46.760] if (inherits(cond, "message")) { [18:41:46.760] muffled <- grepl(pattern, "muffleMessage") [18:41:46.760] if (muffled) [18:41:46.760] invokeRestart("muffleMessage") [18:41:46.760] } [18:41:46.760] else if (inherits(cond, "warning")) { [18:41:46.760] muffled <- grepl(pattern, "muffleWarning") [18:41:46.760] if (muffled) [18:41:46.760] invokeRestart("muffleWarning") [18:41:46.760] } [18:41:46.760] else if (inherits(cond, "condition")) { [18:41:46.760] if (!is.null(pattern)) { [18:41:46.760] computeRestarts <- base::computeRestarts [18:41:46.760] grepl <- base::grepl [18:41:46.760] restarts <- computeRestarts(cond) [18:41:46.760] for (restart in restarts) { [18:41:46.760] name <- restart$name [18:41:46.760] if (is.null(name)) [18:41:46.760] next [18:41:46.760] if (!grepl(pattern, name)) [18:41:46.760] next [18:41:46.760] invokeRestart(restart) [18:41:46.760] muffled <- TRUE [18:41:46.760] break [18:41:46.760] } [18:41:46.760] } [18:41:46.760] } [18:41:46.760] invisible(muffled) [18:41:46.760] } [18:41:46.760] muffleCondition(cond, pattern = "^muffle") [18:41:46.760] } [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] if (TRUE) { [18:41:46.760] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.760] { [18:41:46.760] inherits <- base::inherits [18:41:46.760] invokeRestart <- base::invokeRestart [18:41:46.760] is.null <- base::is.null [18:41:46.760] muffled <- FALSE [18:41:46.760] if (inherits(cond, "message")) { [18:41:46.760] muffled <- grepl(pattern, "muffleMessage") [18:41:46.760] if (muffled) [18:41:46.760] invokeRestart("muffleMessage") [18:41:46.760] } [18:41:46.760] else if (inherits(cond, "warning")) { [18:41:46.760] muffled <- grepl(pattern, "muffleWarning") [18:41:46.760] if (muffled) [18:41:46.760] invokeRestart("muffleWarning") [18:41:46.760] } [18:41:46.760] else if (inherits(cond, "condition")) { [18:41:46.760] if (!is.null(pattern)) { [18:41:46.760] computeRestarts <- base::computeRestarts [18:41:46.760] grepl <- base::grepl [18:41:46.760] restarts <- computeRestarts(cond) [18:41:46.760] for (restart in restarts) { [18:41:46.760] name <- restart$name [18:41:46.760] if (is.null(name)) [18:41:46.760] next [18:41:46.760] if (!grepl(pattern, name)) [18:41:46.760] next [18:41:46.760] invokeRestart(restart) [18:41:46.760] muffled <- TRUE [18:41:46.760] break [18:41:46.760] } [18:41:46.760] } [18:41:46.760] } [18:41:46.760] invisible(muffled) [18:41:46.760] } [18:41:46.760] muffleCondition(cond, pattern = "^muffle") [18:41:46.760] } [18:41:46.760] } [18:41:46.760] } [18:41:46.760] })) [18:41:46.760] }, error = function(ex) { [18:41:46.760] base::structure(base::list(value = NULL, visible = NULL, [18:41:46.760] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.760] ...future.rng), started = ...future.startTime, [18:41:46.760] finished = Sys.time(), session_uuid = NA_character_, [18:41:46.760] version = "1.8"), class = "FutureResult") [18:41:46.760] }, finally = { [18:41:46.760] if (!identical(...future.workdir, getwd())) [18:41:46.760] setwd(...future.workdir) [18:41:46.760] { [18:41:46.760] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:46.760] ...future.oldOptions$nwarnings <- NULL [18:41:46.760] } [18:41:46.760] base::options(...future.oldOptions) [18:41:46.760] if (.Platform$OS.type == "windows") { [18:41:46.760] old_names <- names(...future.oldEnvVars) [18:41:46.760] envs <- base::Sys.getenv() [18:41:46.760] names <- names(envs) [18:41:46.760] common <- intersect(names, old_names) [18:41:46.760] added <- setdiff(names, old_names) [18:41:46.760] removed <- setdiff(old_names, names) [18:41:46.760] changed <- common[...future.oldEnvVars[common] != [18:41:46.760] envs[common]] [18:41:46.760] NAMES <- toupper(changed) [18:41:46.760] args <- list() [18:41:46.760] for (kk in seq_along(NAMES)) { [18:41:46.760] name <- changed[[kk]] [18:41:46.760] NAME <- NAMES[[kk]] [18:41:46.760] if (name != NAME && is.element(NAME, old_names)) [18:41:46.760] next [18:41:46.760] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.760] } [18:41:46.760] NAMES <- toupper(added) [18:41:46.760] for (kk in seq_along(NAMES)) { [18:41:46.760] name <- added[[kk]] [18:41:46.760] NAME <- NAMES[[kk]] [18:41:46.760] if (name != NAME && is.element(NAME, old_names)) [18:41:46.760] next [18:41:46.760] args[[name]] <- "" [18:41:46.760] } [18:41:46.760] NAMES <- toupper(removed) [18:41:46.760] for (kk in seq_along(NAMES)) { [18:41:46.760] name <- removed[[kk]] [18:41:46.760] NAME <- NAMES[[kk]] [18:41:46.760] if (name != NAME && is.element(NAME, old_names)) [18:41:46.760] next [18:41:46.760] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.760] } [18:41:46.760] if (length(args) > 0) [18:41:46.760] base::do.call(base::Sys.setenv, args = args) [18:41:46.760] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:46.760] } [18:41:46.760] { [18:41:46.760] if (base::length(...future.futureOptionsAdded) > [18:41:46.760] 0L) { [18:41:46.760] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:46.760] base::names(opts) <- ...future.futureOptionsAdded [18:41:46.760] base::options(opts) [18:41:46.760] } [18:41:46.760] { [18:41:46.760] { [18:41:46.760] base::options(mc.cores = ...future.mc.cores.old) [18:41:46.760] NULL [18:41:46.760] } [18:41:46.760] options(future.plan = NULL) [18:41:46.760] if (is.na(NA_character_)) [18:41:46.760] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.760] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:46.760] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:46.760] .init = FALSE) [18:41:46.760] } [18:41:46.760] } [18:41:46.760] } [18:41:46.760] }) [18:41:46.760] if (TRUE) { [18:41:46.760] base::sink(type = "output", split = FALSE) [18:41:46.760] if (TRUE) { [18:41:46.760] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:46.760] } [18:41:46.760] else { [18:41:46.760] ...future.result["stdout"] <- base::list(NULL) [18:41:46.760] } [18:41:46.760] base::close(...future.stdout) [18:41:46.760] ...future.stdout <- NULL [18:41:46.760] } [18:41:46.760] ...future.result$conditions <- ...future.conditions [18:41:46.760] ...future.result$finished <- base::Sys.time() [18:41:46.760] ...future.result [18:41:46.760] } [18:41:46.770] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:46.770] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:46.771] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:46.772] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:46.772] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:46.773] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:46.773] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:46.774] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:46.774] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:46.775] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:46.775] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:46.775] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:46.776] MultisessionFuture started [18:41:46.776] - Launch lazy future ... done [18:41:46.776] run() for 'MultisessionFuture' ... done [18:41:46.777] Created future: [18:41:46.790] receiveMessageFromWorker() for ClusterFuture ... [18:41:46.790] - Validating connection of MultisessionFuture [18:41:46.791] - received message: FutureResult [18:41:46.791] - Received FutureResult [18:41:46.791] - Erased future from FutureRegistry [18:41:46.791] result() for ClusterFuture ... [18:41:46.791] - result already collected: FutureResult [18:41:46.791] result() for ClusterFuture ... done [18:41:46.792] receiveMessageFromWorker() for ClusterFuture ... done [18:41:46.777] MultisessionFuture: [18:41:46.777] Label: 'future_sapply-1' [18:41:46.777] Expression: [18:41:46.777] { [18:41:46.777] do.call(function(...) { [18:41:46.777] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.777] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.777] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.777] on.exit(options(oopts), add = TRUE) [18:41:46.777] } [18:41:46.777] { [18:41:46.777] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.777] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.777] ...future.FUN(...future.X_jj, ...) [18:41:46.777] }) [18:41:46.777] } [18:41:46.777] }, args = future.call.arguments) [18:41:46.777] } [18:41:46.777] Lazy evaluation: FALSE [18:41:46.777] Asynchronous evaluation: TRUE [18:41:46.777] Local evaluation: TRUE [18:41:46.777] Environment: R_GlobalEnv [18:41:46.777] Capture standard output: TRUE [18:41:46.777] Capture condition classes: 'condition' (excluding 'nothing') [18:41:46.777] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:46.777] Packages: [18:41:46.777] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:46.777] Resolved: TRUE [18:41:46.777] Value: [18:41:46.777] Conditions captured: [18:41:46.777] Early signaling: FALSE [18:41:46.777] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:46.777] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:46.792] Chunk #1 of 2 ... DONE [18:41:46.792] Chunk #2 of 2 ... [18:41:46.792] - Finding globals in 'X' for chunk #2 ... [18:41:46.793] getGlobalsAndPackages() ... [18:41:46.793] Searching for globals... [18:41:46.793] [18:41:46.793] Searching for globals ... DONE [18:41:46.794] - globals: [0] [18:41:46.794] getGlobalsAndPackages() ... DONE [18:41:46.794] + additional globals found: [n=0] [18:41:46.794] + additional namespaces needed: [n=0] [18:41:46.794] - Finding globals in 'X' for chunk #2 ... DONE [18:41:46.794] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:46.794] - seeds: [18:41:46.795] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.795] getGlobalsAndPackages() ... [18:41:46.795] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.795] Resolving globals: FALSE [18:41:46.795] Tweak future expression to call with '...' arguments ... [18:41:46.796] { [18:41:46.796] do.call(function(...) { [18:41:46.796] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.796] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.796] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.796] on.exit(options(oopts), add = TRUE) [18:41:46.796] } [18:41:46.796] { [18:41:46.796] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.796] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.796] ...future.FUN(...future.X_jj, ...) [18:41:46.796] }) [18:41:46.796] } [18:41:46.796] }, args = future.call.arguments) [18:41:46.796] } [18:41:46.796] Tweak future expression to call with '...' arguments ... DONE [18:41:46.797] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.797] [18:41:46.797] getGlobalsAndPackages() ... DONE [18:41:46.797] run() for 'Future' ... [18:41:46.798] - state: 'created' [18:41:46.798] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:46.814] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:46.814] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:46.814] - Field: 'node' [18:41:46.814] - Field: 'label' [18:41:46.815] - Field: 'local' [18:41:46.815] - Field: 'owner' [18:41:46.815] - Field: 'envir' [18:41:46.815] - Field: 'workers' [18:41:46.815] - Field: 'packages' [18:41:46.816] - Field: 'gc' [18:41:46.816] - Field: 'conditions' [18:41:46.816] - Field: 'persistent' [18:41:46.816] - Field: 'expr' [18:41:46.816] - Field: 'uuid' [18:41:46.817] - Field: 'seed' [18:41:46.817] - Field: 'version' [18:41:46.821] - Field: 'result' [18:41:46.821] - Field: 'asynchronous' [18:41:46.821] - Field: 'calls' [18:41:46.822] - Field: 'globals' [18:41:46.822] - Field: 'stdout' [18:41:46.822] - Field: 'earlySignal' [18:41:46.822] - Field: 'lazy' [18:41:46.822] - Field: 'state' [18:41:46.823] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:46.823] - Launch lazy future ... [18:41:46.823] Packages needed by the future expression (n = 0): [18:41:46.823] Packages needed by future strategies (n = 0): [18:41:46.824] { [18:41:46.824] { [18:41:46.824] { [18:41:46.824] ...future.startTime <- base::Sys.time() [18:41:46.824] { [18:41:46.824] { [18:41:46.824] { [18:41:46.824] { [18:41:46.824] base::local({ [18:41:46.824] has_future <- base::requireNamespace("future", [18:41:46.824] quietly = TRUE) [18:41:46.824] if (has_future) { [18:41:46.824] ns <- base::getNamespace("future") [18:41:46.824] version <- ns[[".package"]][["version"]] [18:41:46.824] if (is.null(version)) [18:41:46.824] version <- utils::packageVersion("future") [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] version <- NULL [18:41:46.824] } [18:41:46.824] if (!has_future || version < "1.8.0") { [18:41:46.824] info <- base::c(r_version = base::gsub("R version ", [18:41:46.824] "", base::R.version$version.string), [18:41:46.824] platform = base::sprintf("%s (%s-bit)", [18:41:46.824] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:46.824] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:46.824] "release", "version")], collapse = " "), [18:41:46.824] hostname = base::Sys.info()[["nodename"]]) [18:41:46.824] info <- base::sprintf("%s: %s", base::names(info), [18:41:46.824] info) [18:41:46.824] info <- base::paste(info, collapse = "; ") [18:41:46.824] if (!has_future) { [18:41:46.824] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:46.824] info) [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:46.824] info, version) [18:41:46.824] } [18:41:46.824] base::stop(msg) [18:41:46.824] } [18:41:46.824] }) [18:41:46.824] } [18:41:46.824] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:46.824] base::options(mc.cores = 1L) [18:41:46.824] } [18:41:46.824] ...future.strategy.old <- future::plan("list") [18:41:46.824] options(future.plan = NULL) [18:41:46.824] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.824] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:46.824] } [18:41:46.824] ...future.workdir <- getwd() [18:41:46.824] } [18:41:46.824] ...future.oldOptions <- base::as.list(base::.Options) [18:41:46.824] ...future.oldEnvVars <- base::Sys.getenv() [18:41:46.824] } [18:41:46.824] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:46.824] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:46.824] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:46.824] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:46.824] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:46.824] future.stdout.windows.reencode = NULL, width = 80L) [18:41:46.824] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:46.824] base::names(...future.oldOptions)) [18:41:46.824] } [18:41:46.824] if (FALSE) { [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] if (TRUE) { [18:41:46.824] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:46.824] open = "w") [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:46.824] windows = "NUL", "/dev/null"), open = "w") [18:41:46.824] } [18:41:46.824] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:46.824] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:46.824] base::sink(type = "output", split = FALSE) [18:41:46.824] base::close(...future.stdout) [18:41:46.824] }, add = TRUE) [18:41:46.824] } [18:41:46.824] ...future.frame <- base::sys.nframe() [18:41:46.824] ...future.conditions <- base::list() [18:41:46.824] ...future.rng <- base::globalenv()$.Random.seed [18:41:46.824] if (FALSE) { [18:41:46.824] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:46.824] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:46.824] } [18:41:46.824] ...future.result <- base::tryCatch({ [18:41:46.824] base::withCallingHandlers({ [18:41:46.824] ...future.value <- base::withVisible(base::local({ [18:41:46.824] ...future.makeSendCondition <- base::local({ [18:41:46.824] sendCondition <- NULL [18:41:46.824] function(frame = 1L) { [18:41:46.824] if (is.function(sendCondition)) [18:41:46.824] return(sendCondition) [18:41:46.824] ns <- getNamespace("parallel") [18:41:46.824] if (exists("sendData", mode = "function", [18:41:46.824] envir = ns)) { [18:41:46.824] parallel_sendData <- get("sendData", mode = "function", [18:41:46.824] envir = ns) [18:41:46.824] envir <- sys.frame(frame) [18:41:46.824] master <- NULL [18:41:46.824] while (!identical(envir, .GlobalEnv) && [18:41:46.824] !identical(envir, emptyenv())) { [18:41:46.824] if (exists("master", mode = "list", envir = envir, [18:41:46.824] inherits = FALSE)) { [18:41:46.824] master <- get("master", mode = "list", [18:41:46.824] envir = envir, inherits = FALSE) [18:41:46.824] if (inherits(master, c("SOCKnode", [18:41:46.824] "SOCK0node"))) { [18:41:46.824] sendCondition <<- function(cond) { [18:41:46.824] data <- list(type = "VALUE", value = cond, [18:41:46.824] success = TRUE) [18:41:46.824] parallel_sendData(master, data) [18:41:46.824] } [18:41:46.824] return(sendCondition) [18:41:46.824] } [18:41:46.824] } [18:41:46.824] frame <- frame + 1L [18:41:46.824] envir <- sys.frame(frame) [18:41:46.824] } [18:41:46.824] } [18:41:46.824] sendCondition <<- function(cond) NULL [18:41:46.824] } [18:41:46.824] }) [18:41:46.824] withCallingHandlers({ [18:41:46.824] { [18:41:46.824] do.call(function(...) { [18:41:46.824] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.824] if (!identical(...future.globals.maxSize.org, [18:41:46.824] ...future.globals.maxSize)) { [18:41:46.824] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.824] on.exit(options(oopts), add = TRUE) [18:41:46.824] } [18:41:46.824] { [18:41:46.824] lapply(seq_along(...future.elements_ii), [18:41:46.824] FUN = function(jj) { [18:41:46.824] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.824] ...future.FUN(...future.X_jj, ...) [18:41:46.824] }) [18:41:46.824] } [18:41:46.824] }, args = future.call.arguments) [18:41:46.824] } [18:41:46.824] }, immediateCondition = function(cond) { [18:41:46.824] sendCondition <- ...future.makeSendCondition() [18:41:46.824] sendCondition(cond) [18:41:46.824] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.824] { [18:41:46.824] inherits <- base::inherits [18:41:46.824] invokeRestart <- base::invokeRestart [18:41:46.824] is.null <- base::is.null [18:41:46.824] muffled <- FALSE [18:41:46.824] if (inherits(cond, "message")) { [18:41:46.824] muffled <- grepl(pattern, "muffleMessage") [18:41:46.824] if (muffled) [18:41:46.824] invokeRestart("muffleMessage") [18:41:46.824] } [18:41:46.824] else if (inherits(cond, "warning")) { [18:41:46.824] muffled <- grepl(pattern, "muffleWarning") [18:41:46.824] if (muffled) [18:41:46.824] invokeRestart("muffleWarning") [18:41:46.824] } [18:41:46.824] else if (inherits(cond, "condition")) { [18:41:46.824] if (!is.null(pattern)) { [18:41:46.824] computeRestarts <- base::computeRestarts [18:41:46.824] grepl <- base::grepl [18:41:46.824] restarts <- computeRestarts(cond) [18:41:46.824] for (restart in restarts) { [18:41:46.824] name <- restart$name [18:41:46.824] if (is.null(name)) [18:41:46.824] next [18:41:46.824] if (!grepl(pattern, name)) [18:41:46.824] next [18:41:46.824] invokeRestart(restart) [18:41:46.824] muffled <- TRUE [18:41:46.824] break [18:41:46.824] } [18:41:46.824] } [18:41:46.824] } [18:41:46.824] invisible(muffled) [18:41:46.824] } [18:41:46.824] muffleCondition(cond) [18:41:46.824] }) [18:41:46.824] })) [18:41:46.824] future::FutureResult(value = ...future.value$value, [18:41:46.824] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.824] ...future.rng), globalenv = if (FALSE) [18:41:46.824] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:46.824] ...future.globalenv.names)) [18:41:46.824] else NULL, started = ...future.startTime, version = "1.8") [18:41:46.824] }, condition = base::local({ [18:41:46.824] c <- base::c [18:41:46.824] inherits <- base::inherits [18:41:46.824] invokeRestart <- base::invokeRestart [18:41:46.824] length <- base::length [18:41:46.824] list <- base::list [18:41:46.824] seq.int <- base::seq.int [18:41:46.824] signalCondition <- base::signalCondition [18:41:46.824] sys.calls <- base::sys.calls [18:41:46.824] `[[` <- base::`[[` [18:41:46.824] `+` <- base::`+` [18:41:46.824] `<<-` <- base::`<<-` [18:41:46.824] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:46.824] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:46.824] 3L)] [18:41:46.824] } [18:41:46.824] function(cond) { [18:41:46.824] is_error <- inherits(cond, "error") [18:41:46.824] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:46.824] NULL) [18:41:46.824] if (is_error) { [18:41:46.824] sessionInformation <- function() { [18:41:46.824] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:46.824] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:46.824] search = base::search(), system = base::Sys.info()) [18:41:46.824] } [18:41:46.824] ...future.conditions[[length(...future.conditions) + [18:41:46.824] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:46.824] cond$call), session = sessionInformation(), [18:41:46.824] timestamp = base::Sys.time(), signaled = 0L) [18:41:46.824] signalCondition(cond) [18:41:46.824] } [18:41:46.824] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:46.824] "immediateCondition"))) { [18:41:46.824] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:46.824] ...future.conditions[[length(...future.conditions) + [18:41:46.824] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:46.824] if (TRUE && !signal) { [18:41:46.824] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.824] { [18:41:46.824] inherits <- base::inherits [18:41:46.824] invokeRestart <- base::invokeRestart [18:41:46.824] is.null <- base::is.null [18:41:46.824] muffled <- FALSE [18:41:46.824] if (inherits(cond, "message")) { [18:41:46.824] muffled <- grepl(pattern, "muffleMessage") [18:41:46.824] if (muffled) [18:41:46.824] invokeRestart("muffleMessage") [18:41:46.824] } [18:41:46.824] else if (inherits(cond, "warning")) { [18:41:46.824] muffled <- grepl(pattern, "muffleWarning") [18:41:46.824] if (muffled) [18:41:46.824] invokeRestart("muffleWarning") [18:41:46.824] } [18:41:46.824] else if (inherits(cond, "condition")) { [18:41:46.824] if (!is.null(pattern)) { [18:41:46.824] computeRestarts <- base::computeRestarts [18:41:46.824] grepl <- base::grepl [18:41:46.824] restarts <- computeRestarts(cond) [18:41:46.824] for (restart in restarts) { [18:41:46.824] name <- restart$name [18:41:46.824] if (is.null(name)) [18:41:46.824] next [18:41:46.824] if (!grepl(pattern, name)) [18:41:46.824] next [18:41:46.824] invokeRestart(restart) [18:41:46.824] muffled <- TRUE [18:41:46.824] break [18:41:46.824] } [18:41:46.824] } [18:41:46.824] } [18:41:46.824] invisible(muffled) [18:41:46.824] } [18:41:46.824] muffleCondition(cond, pattern = "^muffle") [18:41:46.824] } [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] if (TRUE) { [18:41:46.824] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.824] { [18:41:46.824] inherits <- base::inherits [18:41:46.824] invokeRestart <- base::invokeRestart [18:41:46.824] is.null <- base::is.null [18:41:46.824] muffled <- FALSE [18:41:46.824] if (inherits(cond, "message")) { [18:41:46.824] muffled <- grepl(pattern, "muffleMessage") [18:41:46.824] if (muffled) [18:41:46.824] invokeRestart("muffleMessage") [18:41:46.824] } [18:41:46.824] else if (inherits(cond, "warning")) { [18:41:46.824] muffled <- grepl(pattern, "muffleWarning") [18:41:46.824] if (muffled) [18:41:46.824] invokeRestart("muffleWarning") [18:41:46.824] } [18:41:46.824] else if (inherits(cond, "condition")) { [18:41:46.824] if (!is.null(pattern)) { [18:41:46.824] computeRestarts <- base::computeRestarts [18:41:46.824] grepl <- base::grepl [18:41:46.824] restarts <- computeRestarts(cond) [18:41:46.824] for (restart in restarts) { [18:41:46.824] name <- restart$name [18:41:46.824] if (is.null(name)) [18:41:46.824] next [18:41:46.824] if (!grepl(pattern, name)) [18:41:46.824] next [18:41:46.824] invokeRestart(restart) [18:41:46.824] muffled <- TRUE [18:41:46.824] break [18:41:46.824] } [18:41:46.824] } [18:41:46.824] } [18:41:46.824] invisible(muffled) [18:41:46.824] } [18:41:46.824] muffleCondition(cond, pattern = "^muffle") [18:41:46.824] } [18:41:46.824] } [18:41:46.824] } [18:41:46.824] })) [18:41:46.824] }, error = function(ex) { [18:41:46.824] base::structure(base::list(value = NULL, visible = NULL, [18:41:46.824] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.824] ...future.rng), started = ...future.startTime, [18:41:46.824] finished = Sys.time(), session_uuid = NA_character_, [18:41:46.824] version = "1.8"), class = "FutureResult") [18:41:46.824] }, finally = { [18:41:46.824] if (!identical(...future.workdir, getwd())) [18:41:46.824] setwd(...future.workdir) [18:41:46.824] { [18:41:46.824] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:46.824] ...future.oldOptions$nwarnings <- NULL [18:41:46.824] } [18:41:46.824] base::options(...future.oldOptions) [18:41:46.824] if (.Platform$OS.type == "windows") { [18:41:46.824] old_names <- names(...future.oldEnvVars) [18:41:46.824] envs <- base::Sys.getenv() [18:41:46.824] names <- names(envs) [18:41:46.824] common <- intersect(names, old_names) [18:41:46.824] added <- setdiff(names, old_names) [18:41:46.824] removed <- setdiff(old_names, names) [18:41:46.824] changed <- common[...future.oldEnvVars[common] != [18:41:46.824] envs[common]] [18:41:46.824] NAMES <- toupper(changed) [18:41:46.824] args <- list() [18:41:46.824] for (kk in seq_along(NAMES)) { [18:41:46.824] name <- changed[[kk]] [18:41:46.824] NAME <- NAMES[[kk]] [18:41:46.824] if (name != NAME && is.element(NAME, old_names)) [18:41:46.824] next [18:41:46.824] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.824] } [18:41:46.824] NAMES <- toupper(added) [18:41:46.824] for (kk in seq_along(NAMES)) { [18:41:46.824] name <- added[[kk]] [18:41:46.824] NAME <- NAMES[[kk]] [18:41:46.824] if (name != NAME && is.element(NAME, old_names)) [18:41:46.824] next [18:41:46.824] args[[name]] <- "" [18:41:46.824] } [18:41:46.824] NAMES <- toupper(removed) [18:41:46.824] for (kk in seq_along(NAMES)) { [18:41:46.824] name <- removed[[kk]] [18:41:46.824] NAME <- NAMES[[kk]] [18:41:46.824] if (name != NAME && is.element(NAME, old_names)) [18:41:46.824] next [18:41:46.824] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.824] } [18:41:46.824] if (length(args) > 0) [18:41:46.824] base::do.call(base::Sys.setenv, args = args) [18:41:46.824] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:46.824] } [18:41:46.824] { [18:41:46.824] if (base::length(...future.futureOptionsAdded) > [18:41:46.824] 0L) { [18:41:46.824] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:46.824] base::names(opts) <- ...future.futureOptionsAdded [18:41:46.824] base::options(opts) [18:41:46.824] } [18:41:46.824] { [18:41:46.824] { [18:41:46.824] base::options(mc.cores = ...future.mc.cores.old) [18:41:46.824] NULL [18:41:46.824] } [18:41:46.824] options(future.plan = NULL) [18:41:46.824] if (is.na(NA_character_)) [18:41:46.824] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.824] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:46.824] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:46.824] .init = FALSE) [18:41:46.824] } [18:41:46.824] } [18:41:46.824] } [18:41:46.824] }) [18:41:46.824] if (TRUE) { [18:41:46.824] base::sink(type = "output", split = FALSE) [18:41:46.824] if (TRUE) { [18:41:46.824] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:46.824] } [18:41:46.824] else { [18:41:46.824] ...future.result["stdout"] <- base::list(NULL) [18:41:46.824] } [18:41:46.824] base::close(...future.stdout) [18:41:46.824] ...future.stdout <- NULL [18:41:46.824] } [18:41:46.824] ...future.result$conditions <- ...future.conditions [18:41:46.824] ...future.result$finished <- base::Sys.time() [18:41:46.824] ...future.result [18:41:46.824] } [18:41:46.829] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:46.829] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:46.830] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:46.830] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:46.830] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:46.831] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:46.831] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:46.831] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:46.832] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:46.832] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:46.832] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:46.832] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:46.833] MultisessionFuture started [18:41:46.833] - Launch lazy future ... done [18:41:46.833] run() for 'MultisessionFuture' ... done [18:41:46.834] Created future: [18:41:46.848] receiveMessageFromWorker() for ClusterFuture ... [18:41:46.848] - Validating connection of MultisessionFuture [18:41:46.849] - received message: FutureResult [18:41:46.849] - Received FutureResult [18:41:46.849] - Erased future from FutureRegistry [18:41:46.850] result() for ClusterFuture ... [18:41:46.850] - result already collected: FutureResult [18:41:46.850] result() for ClusterFuture ... done [18:41:46.850] receiveMessageFromWorker() for ClusterFuture ... done [18:41:46.834] MultisessionFuture: [18:41:46.834] Label: 'future_sapply-2' [18:41:46.834] Expression: [18:41:46.834] { [18:41:46.834] do.call(function(...) { [18:41:46.834] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.834] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.834] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.834] on.exit(options(oopts), add = TRUE) [18:41:46.834] } [18:41:46.834] { [18:41:46.834] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.834] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.834] ...future.FUN(...future.X_jj, ...) [18:41:46.834] }) [18:41:46.834] } [18:41:46.834] }, args = future.call.arguments) [18:41:46.834] } [18:41:46.834] Lazy evaluation: FALSE [18:41:46.834] Asynchronous evaluation: TRUE [18:41:46.834] Local evaluation: TRUE [18:41:46.834] Environment: R_GlobalEnv [18:41:46.834] Capture standard output: TRUE [18:41:46.834] Capture condition classes: 'condition' (excluding 'nothing') [18:41:46.834] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:46.834] Packages: [18:41:46.834] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:46.834] Resolved: TRUE [18:41:46.834] Value: [18:41:46.834] Conditions captured: [18:41:46.834] Early signaling: FALSE [18:41:46.834] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:46.834] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:46.851] Chunk #2 of 2 ... DONE [18:41:46.851] Launching 2 futures (chunks) ... DONE [18:41:46.852] Resolving 2 futures (chunks) ... [18:41:46.852] resolve() on list ... [18:41:46.852] recursive: 0 [18:41:46.853] length: 2 [18:41:46.853] [18:41:46.853] Future #1 [18:41:46.854] result() for ClusterFuture ... [18:41:46.854] - result already collected: FutureResult [18:41:46.854] result() for ClusterFuture ... done [18:41:46.854] result() for ClusterFuture ... [18:41:46.855] - result already collected: FutureResult [18:41:46.855] result() for ClusterFuture ... done [18:41:46.855] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:46.856] - nx: 2 [18:41:46.856] - relay: TRUE [18:41:46.856] - stdout: TRUE [18:41:46.856] - signal: TRUE [18:41:46.857] - resignal: FALSE [18:41:46.857] - force: TRUE [18:41:46.857] - relayed: [n=2] FALSE, FALSE [18:41:46.857] - queued futures: [n=2] FALSE, FALSE [18:41:46.858] - until=1 [18:41:46.858] - relaying element #1 [18:41:46.858] result() for ClusterFuture ... [18:41:46.859] - result already collected: FutureResult [18:41:46.859] result() for ClusterFuture ... done [18:41:46.859] result() for ClusterFuture ... [18:41:46.859] - result already collected: FutureResult [18:41:46.860] result() for ClusterFuture ... done [18:41:46.860] result() for ClusterFuture ... [18:41:46.860] - result already collected: FutureResult [18:41:46.861] result() for ClusterFuture ... done [18:41:46.861] result() for ClusterFuture ... [18:41:46.861] - result already collected: FutureResult [18:41:46.861] result() for ClusterFuture ... done [18:41:46.862] - relayed: [n=2] TRUE, FALSE [18:41:46.862] - queued futures: [n=2] TRUE, FALSE [18:41:46.862] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:46.863] length: 1 (resolved future 1) [18:41:46.863] Future #2 [18:41:46.863] result() for ClusterFuture ... [18:41:46.864] - result already collected: FutureResult [18:41:46.864] result() for ClusterFuture ... done [18:41:46.864] result() for ClusterFuture ... [18:41:46.865] - result already collected: FutureResult [18:41:46.865] result() for ClusterFuture ... done [18:41:46.865] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:46.866] - nx: 2 [18:41:46.866] - relay: TRUE [18:41:46.866] - stdout: TRUE [18:41:46.866] - signal: TRUE [18:41:46.867] - resignal: FALSE [18:41:46.867] - force: TRUE [18:41:46.867] - relayed: [n=2] TRUE, FALSE [18:41:46.867] - queued futures: [n=2] TRUE, FALSE [18:41:46.868] - until=2 [18:41:46.868] - relaying element #2 [18:41:46.868] result() for ClusterFuture ... [18:41:46.869] - result already collected: FutureResult [18:41:46.869] result() for ClusterFuture ... done [18:41:46.869] result() for ClusterFuture ... [18:41:46.869] - result already collected: FutureResult [18:41:46.870] result() for ClusterFuture ... done [18:41:46.870] result() for ClusterFuture ... [18:41:46.870] - result already collected: FutureResult [18:41:46.871] result() for ClusterFuture ... done [18:41:46.871] result() for ClusterFuture ... [18:41:46.871] - result already collected: FutureResult [18:41:46.871] result() for ClusterFuture ... done [18:41:46.872] - relayed: [n=2] TRUE, TRUE [18:41:46.872] - queued futures: [n=2] TRUE, TRUE [18:41:46.872] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:46.873] length: 0 (resolved future 2) [18:41:46.873] Relaying remaining futures [18:41:46.873] signalConditionsASAP(NULL, pos=0) ... [18:41:46.874] - nx: 2 [18:41:46.874] - relay: TRUE [18:41:46.874] - stdout: TRUE [18:41:46.874] - signal: TRUE [18:41:46.875] - resignal: FALSE [18:41:46.875] - force: TRUE [18:41:46.875] - relayed: [n=2] TRUE, TRUE [18:41:46.875] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:46.876] - relayed: [n=2] TRUE, TRUE [18:41:46.876] - queued futures: [n=2] TRUE, TRUE [18:41:46.876] signalConditionsASAP(NULL, pos=0) ... done [18:41:46.877] resolve() on list ... DONE [18:41:46.877] result() for ClusterFuture ... [18:41:46.877] - result already collected: FutureResult [18:41:46.878] result() for ClusterFuture ... done [18:41:46.878] result() for ClusterFuture ... [18:41:46.878] - result already collected: FutureResult [18:41:46.878] result() for ClusterFuture ... done [18:41:46.879] result() for ClusterFuture ... [18:41:46.879] - result already collected: FutureResult [18:41:46.879] result() for ClusterFuture ... done [18:41:46.880] result() for ClusterFuture ... [18:41:46.880] - result already collected: FutureResult [18:41:46.880] result() for ClusterFuture ... done [18:41:46.880] - Number of value chunks collected: 2 [18:41:46.881] Resolving 2 futures (chunks) ... DONE [18:41:46.881] Reducing values from 2 chunks ... [18:41:46.881] - Number of values collected after concatenation: 3 [18:41:46.882] - Number of values expected: 3 [18:41:46.882] Reducing values from 2 chunks ... DONE [18:41:46.882] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y1:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y2:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 [18:41:46.895] future_lapply() ... [18:41:46.900] Number of chunks: 2 [18:41:46.900] getGlobalsAndPackagesXApply() ... [18:41:46.901] - future.globals: TRUE [18:41:46.901] getGlobalsAndPackages() ... [18:41:46.901] Searching for globals... [18:41:46.904] - globals found: [2] 'FUN', 'UseMethod' [18:41:46.904] Searching for globals ... DONE [18:41:46.904] Resolving globals: FALSE [18:41:46.905] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:46.906] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:46.906] - globals: [1] 'FUN' [18:41:46.906] [18:41:46.907] getGlobalsAndPackages() ... DONE [18:41:46.907] - globals found/used: [n=1] 'FUN' [18:41:46.907] - needed namespaces: [n=0] [18:41:46.908] Finding globals ... DONE [18:41:46.908] - use_args: TRUE [18:41:46.908] - Getting '...' globals ... [18:41:46.909] resolve() on list ... [18:41:46.909] recursive: 0 [18:41:46.910] length: 1 [18:41:46.910] elements: '...' [18:41:46.910] length: 0 (resolved future 1) [18:41:46.911] resolve() on list ... DONE [18:41:46.911] - '...' content: [n=0] [18:41:46.911] List of 1 [18:41:46.911] $ ...: list() [18:41:46.911] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:46.911] - attr(*, "where")=List of 1 [18:41:46.911] ..$ ...: [18:41:46.911] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:46.911] - attr(*, "resolved")= logi TRUE [18:41:46.911] - attr(*, "total_size")= num NA [18:41:46.916] - Getting '...' globals ... DONE [18:41:46.917] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:46.917] List of 2 [18:41:46.917] $ ...future.FUN:function (x, ...) [18:41:46.917] $ ... : list() [18:41:46.917] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:46.917] - attr(*, "where")=List of 2 [18:41:46.917] ..$ ...future.FUN: [18:41:46.917] ..$ ... : [18:41:46.917] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:46.917] - attr(*, "resolved")= logi FALSE [18:41:46.917] - attr(*, "total_size")= int 5116 [18:41:46.923] Packages to be attached in all futures: [n=0] [18:41:46.923] getGlobalsAndPackagesXApply() ... DONE [18:41:46.924] Number of futures (= number of chunks): 2 [18:41:46.924] Launching 2 futures (chunks) ... [18:41:46.925] Chunk #1 of 2 ... [18:41:46.925] - Finding globals in 'X' for chunk #1 ... [18:41:46.925] getGlobalsAndPackages() ... [18:41:46.926] Searching for globals... [18:41:46.926] [18:41:46.926] Searching for globals ... DONE [18:41:46.927] - globals: [0] [18:41:46.927] getGlobalsAndPackages() ... DONE [18:41:46.927] + additional globals found: [n=0] [18:41:46.928] + additional namespaces needed: [n=0] [18:41:46.928] - Finding globals in 'X' for chunk #1 ... DONE [18:41:46.928] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:46.928] - seeds: [18:41:46.929] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.929] getGlobalsAndPackages() ... [18:41:46.929] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.930] Resolving globals: FALSE [18:41:46.930] Tweak future expression to call with '...' arguments ... [18:41:46.930] { [18:41:46.930] do.call(function(...) { [18:41:46.930] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.930] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.930] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.930] on.exit(options(oopts), add = TRUE) [18:41:46.930] } [18:41:46.930] { [18:41:46.930] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.930] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.930] ...future.FUN(...future.X_jj, ...) [18:41:46.930] }) [18:41:46.930] } [18:41:46.930] }, args = future.call.arguments) [18:41:46.930] } [18:41:46.931] Tweak future expression to call with '...' arguments ... DONE [18:41:46.932] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.932] [18:41:46.933] getGlobalsAndPackages() ... DONE [18:41:46.933] run() for 'Future' ... [18:41:46.934] - state: 'created' [18:41:46.934] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:46.956] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:46.957] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:46.957] - Field: 'node' [18:41:46.958] - Field: 'label' [18:41:46.958] - Field: 'local' [18:41:46.958] - Field: 'owner' [18:41:46.958] - Field: 'envir' [18:41:46.958] - Field: 'workers' [18:41:46.959] - Field: 'packages' [18:41:46.959] - Field: 'gc' [18:41:46.959] - Field: 'conditions' [18:41:46.959] - Field: 'persistent' [18:41:46.960] - Field: 'expr' [18:41:46.960] - Field: 'uuid' [18:41:46.960] - Field: 'seed' [18:41:46.960] - Field: 'version' [18:41:46.960] - Field: 'result' [18:41:46.960] - Field: 'asynchronous' [18:41:46.961] - Field: 'calls' [18:41:46.961] - Field: 'globals' [18:41:46.961] - Field: 'stdout' [18:41:46.961] - Field: 'earlySignal' [18:41:46.961] - Field: 'lazy' [18:41:46.961] - Field: 'state' [18:41:46.962] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:46.962] - Launch lazy future ... [18:41:46.962] Packages needed by the future expression (n = 0): [18:41:46.963] Packages needed by future strategies (n = 0): [18:41:46.963] { [18:41:46.963] { [18:41:46.963] { [18:41:46.963] ...future.startTime <- base::Sys.time() [18:41:46.963] { [18:41:46.963] { [18:41:46.963] { [18:41:46.963] { [18:41:46.963] base::local({ [18:41:46.963] has_future <- base::requireNamespace("future", [18:41:46.963] quietly = TRUE) [18:41:46.963] if (has_future) { [18:41:46.963] ns <- base::getNamespace("future") [18:41:46.963] version <- ns[[".package"]][["version"]] [18:41:46.963] if (is.null(version)) [18:41:46.963] version <- utils::packageVersion("future") [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] version <- NULL [18:41:46.963] } [18:41:46.963] if (!has_future || version < "1.8.0") { [18:41:46.963] info <- base::c(r_version = base::gsub("R version ", [18:41:46.963] "", base::R.version$version.string), [18:41:46.963] platform = base::sprintf("%s (%s-bit)", [18:41:46.963] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:46.963] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:46.963] "release", "version")], collapse = " "), [18:41:46.963] hostname = base::Sys.info()[["nodename"]]) [18:41:46.963] info <- base::sprintf("%s: %s", base::names(info), [18:41:46.963] info) [18:41:46.963] info <- base::paste(info, collapse = "; ") [18:41:46.963] if (!has_future) { [18:41:46.963] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:46.963] info) [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:46.963] info, version) [18:41:46.963] } [18:41:46.963] base::stop(msg) [18:41:46.963] } [18:41:46.963] }) [18:41:46.963] } [18:41:46.963] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:46.963] base::options(mc.cores = 1L) [18:41:46.963] } [18:41:46.963] ...future.strategy.old <- future::plan("list") [18:41:46.963] options(future.plan = NULL) [18:41:46.963] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.963] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:46.963] } [18:41:46.963] ...future.workdir <- getwd() [18:41:46.963] } [18:41:46.963] ...future.oldOptions <- base::as.list(base::.Options) [18:41:46.963] ...future.oldEnvVars <- base::Sys.getenv() [18:41:46.963] } [18:41:46.963] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:46.963] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:46.963] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:46.963] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:46.963] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:46.963] future.stdout.windows.reencode = NULL, width = 80L) [18:41:46.963] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:46.963] base::names(...future.oldOptions)) [18:41:46.963] } [18:41:46.963] if (FALSE) { [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] if (TRUE) { [18:41:46.963] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:46.963] open = "w") [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:46.963] windows = "NUL", "/dev/null"), open = "w") [18:41:46.963] } [18:41:46.963] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:46.963] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:46.963] base::sink(type = "output", split = FALSE) [18:41:46.963] base::close(...future.stdout) [18:41:46.963] }, add = TRUE) [18:41:46.963] } [18:41:46.963] ...future.frame <- base::sys.nframe() [18:41:46.963] ...future.conditions <- base::list() [18:41:46.963] ...future.rng <- base::globalenv()$.Random.seed [18:41:46.963] if (FALSE) { [18:41:46.963] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:46.963] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:46.963] } [18:41:46.963] ...future.result <- base::tryCatch({ [18:41:46.963] base::withCallingHandlers({ [18:41:46.963] ...future.value <- base::withVisible(base::local({ [18:41:46.963] ...future.makeSendCondition <- base::local({ [18:41:46.963] sendCondition <- NULL [18:41:46.963] function(frame = 1L) { [18:41:46.963] if (is.function(sendCondition)) [18:41:46.963] return(sendCondition) [18:41:46.963] ns <- getNamespace("parallel") [18:41:46.963] if (exists("sendData", mode = "function", [18:41:46.963] envir = ns)) { [18:41:46.963] parallel_sendData <- get("sendData", mode = "function", [18:41:46.963] envir = ns) [18:41:46.963] envir <- sys.frame(frame) [18:41:46.963] master <- NULL [18:41:46.963] while (!identical(envir, .GlobalEnv) && [18:41:46.963] !identical(envir, emptyenv())) { [18:41:46.963] if (exists("master", mode = "list", envir = envir, [18:41:46.963] inherits = FALSE)) { [18:41:46.963] master <- get("master", mode = "list", [18:41:46.963] envir = envir, inherits = FALSE) [18:41:46.963] if (inherits(master, c("SOCKnode", [18:41:46.963] "SOCK0node"))) { [18:41:46.963] sendCondition <<- function(cond) { [18:41:46.963] data <- list(type = "VALUE", value = cond, [18:41:46.963] success = TRUE) [18:41:46.963] parallel_sendData(master, data) [18:41:46.963] } [18:41:46.963] return(sendCondition) [18:41:46.963] } [18:41:46.963] } [18:41:46.963] frame <- frame + 1L [18:41:46.963] envir <- sys.frame(frame) [18:41:46.963] } [18:41:46.963] } [18:41:46.963] sendCondition <<- function(cond) NULL [18:41:46.963] } [18:41:46.963] }) [18:41:46.963] withCallingHandlers({ [18:41:46.963] { [18:41:46.963] do.call(function(...) { [18:41:46.963] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.963] if (!identical(...future.globals.maxSize.org, [18:41:46.963] ...future.globals.maxSize)) { [18:41:46.963] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.963] on.exit(options(oopts), add = TRUE) [18:41:46.963] } [18:41:46.963] { [18:41:46.963] lapply(seq_along(...future.elements_ii), [18:41:46.963] FUN = function(jj) { [18:41:46.963] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.963] ...future.FUN(...future.X_jj, ...) [18:41:46.963] }) [18:41:46.963] } [18:41:46.963] }, args = future.call.arguments) [18:41:46.963] } [18:41:46.963] }, immediateCondition = function(cond) { [18:41:46.963] sendCondition <- ...future.makeSendCondition() [18:41:46.963] sendCondition(cond) [18:41:46.963] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.963] { [18:41:46.963] inherits <- base::inherits [18:41:46.963] invokeRestart <- base::invokeRestart [18:41:46.963] is.null <- base::is.null [18:41:46.963] muffled <- FALSE [18:41:46.963] if (inherits(cond, "message")) { [18:41:46.963] muffled <- grepl(pattern, "muffleMessage") [18:41:46.963] if (muffled) [18:41:46.963] invokeRestart("muffleMessage") [18:41:46.963] } [18:41:46.963] else if (inherits(cond, "warning")) { [18:41:46.963] muffled <- grepl(pattern, "muffleWarning") [18:41:46.963] if (muffled) [18:41:46.963] invokeRestart("muffleWarning") [18:41:46.963] } [18:41:46.963] else if (inherits(cond, "condition")) { [18:41:46.963] if (!is.null(pattern)) { [18:41:46.963] computeRestarts <- base::computeRestarts [18:41:46.963] grepl <- base::grepl [18:41:46.963] restarts <- computeRestarts(cond) [18:41:46.963] for (restart in restarts) { [18:41:46.963] name <- restart$name [18:41:46.963] if (is.null(name)) [18:41:46.963] next [18:41:46.963] if (!grepl(pattern, name)) [18:41:46.963] next [18:41:46.963] invokeRestart(restart) [18:41:46.963] muffled <- TRUE [18:41:46.963] break [18:41:46.963] } [18:41:46.963] } [18:41:46.963] } [18:41:46.963] invisible(muffled) [18:41:46.963] } [18:41:46.963] muffleCondition(cond) [18:41:46.963] }) [18:41:46.963] })) [18:41:46.963] future::FutureResult(value = ...future.value$value, [18:41:46.963] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.963] ...future.rng), globalenv = if (FALSE) [18:41:46.963] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:46.963] ...future.globalenv.names)) [18:41:46.963] else NULL, started = ...future.startTime, version = "1.8") [18:41:46.963] }, condition = base::local({ [18:41:46.963] c <- base::c [18:41:46.963] inherits <- base::inherits [18:41:46.963] invokeRestart <- base::invokeRestart [18:41:46.963] length <- base::length [18:41:46.963] list <- base::list [18:41:46.963] seq.int <- base::seq.int [18:41:46.963] signalCondition <- base::signalCondition [18:41:46.963] sys.calls <- base::sys.calls [18:41:46.963] `[[` <- base::`[[` [18:41:46.963] `+` <- base::`+` [18:41:46.963] `<<-` <- base::`<<-` [18:41:46.963] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:46.963] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:46.963] 3L)] [18:41:46.963] } [18:41:46.963] function(cond) { [18:41:46.963] is_error <- inherits(cond, "error") [18:41:46.963] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:46.963] NULL) [18:41:46.963] if (is_error) { [18:41:46.963] sessionInformation <- function() { [18:41:46.963] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:46.963] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:46.963] search = base::search(), system = base::Sys.info()) [18:41:46.963] } [18:41:46.963] ...future.conditions[[length(...future.conditions) + [18:41:46.963] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:46.963] cond$call), session = sessionInformation(), [18:41:46.963] timestamp = base::Sys.time(), signaled = 0L) [18:41:46.963] signalCondition(cond) [18:41:46.963] } [18:41:46.963] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:46.963] "immediateCondition"))) { [18:41:46.963] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:46.963] ...future.conditions[[length(...future.conditions) + [18:41:46.963] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:46.963] if (TRUE && !signal) { [18:41:46.963] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.963] { [18:41:46.963] inherits <- base::inherits [18:41:46.963] invokeRestart <- base::invokeRestart [18:41:46.963] is.null <- base::is.null [18:41:46.963] muffled <- FALSE [18:41:46.963] if (inherits(cond, "message")) { [18:41:46.963] muffled <- grepl(pattern, "muffleMessage") [18:41:46.963] if (muffled) [18:41:46.963] invokeRestart("muffleMessage") [18:41:46.963] } [18:41:46.963] else if (inherits(cond, "warning")) { [18:41:46.963] muffled <- grepl(pattern, "muffleWarning") [18:41:46.963] if (muffled) [18:41:46.963] invokeRestart("muffleWarning") [18:41:46.963] } [18:41:46.963] else if (inherits(cond, "condition")) { [18:41:46.963] if (!is.null(pattern)) { [18:41:46.963] computeRestarts <- base::computeRestarts [18:41:46.963] grepl <- base::grepl [18:41:46.963] restarts <- computeRestarts(cond) [18:41:46.963] for (restart in restarts) { [18:41:46.963] name <- restart$name [18:41:46.963] if (is.null(name)) [18:41:46.963] next [18:41:46.963] if (!grepl(pattern, name)) [18:41:46.963] next [18:41:46.963] invokeRestart(restart) [18:41:46.963] muffled <- TRUE [18:41:46.963] break [18:41:46.963] } [18:41:46.963] } [18:41:46.963] } [18:41:46.963] invisible(muffled) [18:41:46.963] } [18:41:46.963] muffleCondition(cond, pattern = "^muffle") [18:41:46.963] } [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] if (TRUE) { [18:41:46.963] muffleCondition <- function (cond, pattern = "^muffle") [18:41:46.963] { [18:41:46.963] inherits <- base::inherits [18:41:46.963] invokeRestart <- base::invokeRestart [18:41:46.963] is.null <- base::is.null [18:41:46.963] muffled <- FALSE [18:41:46.963] if (inherits(cond, "message")) { [18:41:46.963] muffled <- grepl(pattern, "muffleMessage") [18:41:46.963] if (muffled) [18:41:46.963] invokeRestart("muffleMessage") [18:41:46.963] } [18:41:46.963] else if (inherits(cond, "warning")) { [18:41:46.963] muffled <- grepl(pattern, "muffleWarning") [18:41:46.963] if (muffled) [18:41:46.963] invokeRestart("muffleWarning") [18:41:46.963] } [18:41:46.963] else if (inherits(cond, "condition")) { [18:41:46.963] if (!is.null(pattern)) { [18:41:46.963] computeRestarts <- base::computeRestarts [18:41:46.963] grepl <- base::grepl [18:41:46.963] restarts <- computeRestarts(cond) [18:41:46.963] for (restart in restarts) { [18:41:46.963] name <- restart$name [18:41:46.963] if (is.null(name)) [18:41:46.963] next [18:41:46.963] if (!grepl(pattern, name)) [18:41:46.963] next [18:41:46.963] invokeRestart(restart) [18:41:46.963] muffled <- TRUE [18:41:46.963] break [18:41:46.963] } [18:41:46.963] } [18:41:46.963] } [18:41:46.963] invisible(muffled) [18:41:46.963] } [18:41:46.963] muffleCondition(cond, pattern = "^muffle") [18:41:46.963] } [18:41:46.963] } [18:41:46.963] } [18:41:46.963] })) [18:41:46.963] }, error = function(ex) { [18:41:46.963] base::structure(base::list(value = NULL, visible = NULL, [18:41:46.963] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:46.963] ...future.rng), started = ...future.startTime, [18:41:46.963] finished = Sys.time(), session_uuid = NA_character_, [18:41:46.963] version = "1.8"), class = "FutureResult") [18:41:46.963] }, finally = { [18:41:46.963] if (!identical(...future.workdir, getwd())) [18:41:46.963] setwd(...future.workdir) [18:41:46.963] { [18:41:46.963] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:46.963] ...future.oldOptions$nwarnings <- NULL [18:41:46.963] } [18:41:46.963] base::options(...future.oldOptions) [18:41:46.963] if (.Platform$OS.type == "windows") { [18:41:46.963] old_names <- names(...future.oldEnvVars) [18:41:46.963] envs <- base::Sys.getenv() [18:41:46.963] names <- names(envs) [18:41:46.963] common <- intersect(names, old_names) [18:41:46.963] added <- setdiff(names, old_names) [18:41:46.963] removed <- setdiff(old_names, names) [18:41:46.963] changed <- common[...future.oldEnvVars[common] != [18:41:46.963] envs[common]] [18:41:46.963] NAMES <- toupper(changed) [18:41:46.963] args <- list() [18:41:46.963] for (kk in seq_along(NAMES)) { [18:41:46.963] name <- changed[[kk]] [18:41:46.963] NAME <- NAMES[[kk]] [18:41:46.963] if (name != NAME && is.element(NAME, old_names)) [18:41:46.963] next [18:41:46.963] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.963] } [18:41:46.963] NAMES <- toupper(added) [18:41:46.963] for (kk in seq_along(NAMES)) { [18:41:46.963] name <- added[[kk]] [18:41:46.963] NAME <- NAMES[[kk]] [18:41:46.963] if (name != NAME && is.element(NAME, old_names)) [18:41:46.963] next [18:41:46.963] args[[name]] <- "" [18:41:46.963] } [18:41:46.963] NAMES <- toupper(removed) [18:41:46.963] for (kk in seq_along(NAMES)) { [18:41:46.963] name <- removed[[kk]] [18:41:46.963] NAME <- NAMES[[kk]] [18:41:46.963] if (name != NAME && is.element(NAME, old_names)) [18:41:46.963] next [18:41:46.963] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:46.963] } [18:41:46.963] if (length(args) > 0) [18:41:46.963] base::do.call(base::Sys.setenv, args = args) [18:41:46.963] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:46.963] } [18:41:46.963] { [18:41:46.963] if (base::length(...future.futureOptionsAdded) > [18:41:46.963] 0L) { [18:41:46.963] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:46.963] base::names(opts) <- ...future.futureOptionsAdded [18:41:46.963] base::options(opts) [18:41:46.963] } [18:41:46.963] { [18:41:46.963] { [18:41:46.963] base::options(mc.cores = ...future.mc.cores.old) [18:41:46.963] NULL [18:41:46.963] } [18:41:46.963] options(future.plan = NULL) [18:41:46.963] if (is.na(NA_character_)) [18:41:46.963] Sys.unsetenv("R_FUTURE_PLAN") [18:41:46.963] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:46.963] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:46.963] .init = FALSE) [18:41:46.963] } [18:41:46.963] } [18:41:46.963] } [18:41:46.963] }) [18:41:46.963] if (TRUE) { [18:41:46.963] base::sink(type = "output", split = FALSE) [18:41:46.963] if (TRUE) { [18:41:46.963] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:46.963] } [18:41:46.963] else { [18:41:46.963] ...future.result["stdout"] <- base::list(NULL) [18:41:46.963] } [18:41:46.963] base::close(...future.stdout) [18:41:46.963] ...future.stdout <- NULL [18:41:46.963] } [18:41:46.963] ...future.result$conditions <- ...future.conditions [18:41:46.963] ...future.result$finished <- base::Sys.time() [18:41:46.963] ...future.result [18:41:46.963] } [18:41:46.969] Exporting 5 global objects (968 bytes) to cluster node #1 ... [18:41:46.970] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:46.970] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:46.970] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:46.971] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:46.971] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:46.971] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:46.972] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:46.972] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:46.972] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:46.973] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:46.973] Exporting 5 global objects (968 bytes) to cluster node #1 ... DONE [18:41:46.974] MultisessionFuture started [18:41:46.974] - Launch lazy future ... done [18:41:46.974] run() for 'MultisessionFuture' ... done [18:41:46.974] Created future: [18:41:46.988] receiveMessageFromWorker() for ClusterFuture ... [18:41:46.988] - Validating connection of MultisessionFuture [18:41:46.988] - received message: FutureResult [18:41:46.988] - Received FutureResult [18:41:46.989] - Erased future from FutureRegistry [18:41:46.989] result() for ClusterFuture ... [18:41:46.989] - result already collected: FutureResult [18:41:46.989] result() for ClusterFuture ... done [18:41:46.989] receiveMessageFromWorker() for ClusterFuture ... done [18:41:46.974] MultisessionFuture: [18:41:46.974] Label: 'future_sapply-1' [18:41:46.974] Expression: [18:41:46.974] { [18:41:46.974] do.call(function(...) { [18:41:46.974] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.974] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.974] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.974] on.exit(options(oopts), add = TRUE) [18:41:46.974] } [18:41:46.974] { [18:41:46.974] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.974] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.974] ...future.FUN(...future.X_jj, ...) [18:41:46.974] }) [18:41:46.974] } [18:41:46.974] }, args = future.call.arguments) [18:41:46.974] } [18:41:46.974] Lazy evaluation: FALSE [18:41:46.974] Asynchronous evaluation: TRUE [18:41:46.974] Local evaluation: TRUE [18:41:46.974] Environment: R_GlobalEnv [18:41:46.974] Capture standard output: TRUE [18:41:46.974] Capture condition classes: 'condition' (excluding 'nothing') [18:41:46.974] Globals: 5 objects totaling 518 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:46.974] Packages: [18:41:46.974] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:46.974] Resolved: TRUE [18:41:46.974] Value: [18:41:46.974] Conditions captured: [18:41:46.974] Early signaling: FALSE [18:41:46.974] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:46.974] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:46.990] Chunk #1 of 2 ... DONE [18:41:46.990] Chunk #2 of 2 ... [18:41:46.990] - Finding globals in 'X' for chunk #2 ... [18:41:46.990] getGlobalsAndPackages() ... [18:41:46.991] Searching for globals... [18:41:46.991] [18:41:46.991] Searching for globals ... DONE [18:41:46.991] - globals: [0] [18:41:46.991] getGlobalsAndPackages() ... DONE [18:41:46.992] + additional globals found: [n=0] [18:41:46.992] + additional namespaces needed: [n=0] [18:41:46.992] - Finding globals in 'X' for chunk #2 ... DONE [18:41:46.992] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:46.992] - seeds: [18:41:46.992] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.993] getGlobalsAndPackages() ... [18:41:46.993] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.993] Resolving globals: FALSE [18:41:46.993] Tweak future expression to call with '...' arguments ... [18:41:46.993] { [18:41:46.993] do.call(function(...) { [18:41:46.993] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:46.993] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:46.993] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:46.993] on.exit(options(oopts), add = TRUE) [18:41:46.993] } [18:41:46.993] { [18:41:46.993] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:46.993] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:46.993] ...future.FUN(...future.X_jj, ...) [18:41:46.993] }) [18:41:46.993] } [18:41:46.993] }, args = future.call.arguments) [18:41:46.993] } [18:41:46.994] Tweak future expression to call with '...' arguments ... DONE [18:41:46.994] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:46.995] [18:41:46.995] getGlobalsAndPackages() ... DONE [18:41:46.995] run() for 'Future' ... [18:41:46.995] - state: 'created' [18:41:46.996] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.011] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.012] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.012] - Field: 'node' [18:41:47.012] - Field: 'label' [18:41:47.012] - Field: 'local' [18:41:47.012] - Field: 'owner' [18:41:47.013] - Field: 'envir' [18:41:47.013] - Field: 'workers' [18:41:47.013] - Field: 'packages' [18:41:47.013] - Field: 'gc' [18:41:47.013] - Field: 'conditions' [18:41:47.013] - Field: 'persistent' [18:41:47.014] - Field: 'expr' [18:41:47.014] - Field: 'uuid' [18:41:47.014] - Field: 'seed' [18:41:47.014] - Field: 'version' [18:41:47.014] - Field: 'result' [18:41:47.014] - Field: 'asynchronous' [18:41:47.015] - Field: 'calls' [18:41:47.015] - Field: 'globals' [18:41:47.015] - Field: 'stdout' [18:41:47.015] - Field: 'earlySignal' [18:41:47.015] - Field: 'lazy' [18:41:47.016] - Field: 'state' [18:41:47.016] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.016] - Launch lazy future ... [18:41:47.016] Packages needed by the future expression (n = 0): [18:41:47.016] Packages needed by future strategies (n = 0): [18:41:47.017] { [18:41:47.017] { [18:41:47.017] { [18:41:47.017] ...future.startTime <- base::Sys.time() [18:41:47.017] { [18:41:47.017] { [18:41:47.017] { [18:41:47.017] { [18:41:47.017] base::local({ [18:41:47.017] has_future <- base::requireNamespace("future", [18:41:47.017] quietly = TRUE) [18:41:47.017] if (has_future) { [18:41:47.017] ns <- base::getNamespace("future") [18:41:47.017] version <- ns[[".package"]][["version"]] [18:41:47.017] if (is.null(version)) [18:41:47.017] version <- utils::packageVersion("future") [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] version <- NULL [18:41:47.017] } [18:41:47.017] if (!has_future || version < "1.8.0") { [18:41:47.017] info <- base::c(r_version = base::gsub("R version ", [18:41:47.017] "", base::R.version$version.string), [18:41:47.017] platform = base::sprintf("%s (%s-bit)", [18:41:47.017] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.017] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.017] "release", "version")], collapse = " "), [18:41:47.017] hostname = base::Sys.info()[["nodename"]]) [18:41:47.017] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.017] info) [18:41:47.017] info <- base::paste(info, collapse = "; ") [18:41:47.017] if (!has_future) { [18:41:47.017] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.017] info) [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.017] info, version) [18:41:47.017] } [18:41:47.017] base::stop(msg) [18:41:47.017] } [18:41:47.017] }) [18:41:47.017] } [18:41:47.017] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.017] base::options(mc.cores = 1L) [18:41:47.017] } [18:41:47.017] ...future.strategy.old <- future::plan("list") [18:41:47.017] options(future.plan = NULL) [18:41:47.017] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.017] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.017] } [18:41:47.017] ...future.workdir <- getwd() [18:41:47.017] } [18:41:47.017] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.017] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.017] } [18:41:47.017] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.017] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.017] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.017] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.017] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.017] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.017] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.017] base::names(...future.oldOptions)) [18:41:47.017] } [18:41:47.017] if (FALSE) { [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] if (TRUE) { [18:41:47.017] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.017] open = "w") [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.017] windows = "NUL", "/dev/null"), open = "w") [18:41:47.017] } [18:41:47.017] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.017] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.017] base::sink(type = "output", split = FALSE) [18:41:47.017] base::close(...future.stdout) [18:41:47.017] }, add = TRUE) [18:41:47.017] } [18:41:47.017] ...future.frame <- base::sys.nframe() [18:41:47.017] ...future.conditions <- base::list() [18:41:47.017] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.017] if (FALSE) { [18:41:47.017] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.017] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.017] } [18:41:47.017] ...future.result <- base::tryCatch({ [18:41:47.017] base::withCallingHandlers({ [18:41:47.017] ...future.value <- base::withVisible(base::local({ [18:41:47.017] ...future.makeSendCondition <- base::local({ [18:41:47.017] sendCondition <- NULL [18:41:47.017] function(frame = 1L) { [18:41:47.017] if (is.function(sendCondition)) [18:41:47.017] return(sendCondition) [18:41:47.017] ns <- getNamespace("parallel") [18:41:47.017] if (exists("sendData", mode = "function", [18:41:47.017] envir = ns)) { [18:41:47.017] parallel_sendData <- get("sendData", mode = "function", [18:41:47.017] envir = ns) [18:41:47.017] envir <- sys.frame(frame) [18:41:47.017] master <- NULL [18:41:47.017] while (!identical(envir, .GlobalEnv) && [18:41:47.017] !identical(envir, emptyenv())) { [18:41:47.017] if (exists("master", mode = "list", envir = envir, [18:41:47.017] inherits = FALSE)) { [18:41:47.017] master <- get("master", mode = "list", [18:41:47.017] envir = envir, inherits = FALSE) [18:41:47.017] if (inherits(master, c("SOCKnode", [18:41:47.017] "SOCK0node"))) { [18:41:47.017] sendCondition <<- function(cond) { [18:41:47.017] data <- list(type = "VALUE", value = cond, [18:41:47.017] success = TRUE) [18:41:47.017] parallel_sendData(master, data) [18:41:47.017] } [18:41:47.017] return(sendCondition) [18:41:47.017] } [18:41:47.017] } [18:41:47.017] frame <- frame + 1L [18:41:47.017] envir <- sys.frame(frame) [18:41:47.017] } [18:41:47.017] } [18:41:47.017] sendCondition <<- function(cond) NULL [18:41:47.017] } [18:41:47.017] }) [18:41:47.017] withCallingHandlers({ [18:41:47.017] { [18:41:47.017] do.call(function(...) { [18:41:47.017] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.017] if (!identical(...future.globals.maxSize.org, [18:41:47.017] ...future.globals.maxSize)) { [18:41:47.017] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.017] on.exit(options(oopts), add = TRUE) [18:41:47.017] } [18:41:47.017] { [18:41:47.017] lapply(seq_along(...future.elements_ii), [18:41:47.017] FUN = function(jj) { [18:41:47.017] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.017] ...future.FUN(...future.X_jj, ...) [18:41:47.017] }) [18:41:47.017] } [18:41:47.017] }, args = future.call.arguments) [18:41:47.017] } [18:41:47.017] }, immediateCondition = function(cond) { [18:41:47.017] sendCondition <- ...future.makeSendCondition() [18:41:47.017] sendCondition(cond) [18:41:47.017] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.017] { [18:41:47.017] inherits <- base::inherits [18:41:47.017] invokeRestart <- base::invokeRestart [18:41:47.017] is.null <- base::is.null [18:41:47.017] muffled <- FALSE [18:41:47.017] if (inherits(cond, "message")) { [18:41:47.017] muffled <- grepl(pattern, "muffleMessage") [18:41:47.017] if (muffled) [18:41:47.017] invokeRestart("muffleMessage") [18:41:47.017] } [18:41:47.017] else if (inherits(cond, "warning")) { [18:41:47.017] muffled <- grepl(pattern, "muffleWarning") [18:41:47.017] if (muffled) [18:41:47.017] invokeRestart("muffleWarning") [18:41:47.017] } [18:41:47.017] else if (inherits(cond, "condition")) { [18:41:47.017] if (!is.null(pattern)) { [18:41:47.017] computeRestarts <- base::computeRestarts [18:41:47.017] grepl <- base::grepl [18:41:47.017] restarts <- computeRestarts(cond) [18:41:47.017] for (restart in restarts) { [18:41:47.017] name <- restart$name [18:41:47.017] if (is.null(name)) [18:41:47.017] next [18:41:47.017] if (!grepl(pattern, name)) [18:41:47.017] next [18:41:47.017] invokeRestart(restart) [18:41:47.017] muffled <- TRUE [18:41:47.017] break [18:41:47.017] } [18:41:47.017] } [18:41:47.017] } [18:41:47.017] invisible(muffled) [18:41:47.017] } [18:41:47.017] muffleCondition(cond) [18:41:47.017] }) [18:41:47.017] })) [18:41:47.017] future::FutureResult(value = ...future.value$value, [18:41:47.017] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.017] ...future.rng), globalenv = if (FALSE) [18:41:47.017] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.017] ...future.globalenv.names)) [18:41:47.017] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.017] }, condition = base::local({ [18:41:47.017] c <- base::c [18:41:47.017] inherits <- base::inherits [18:41:47.017] invokeRestart <- base::invokeRestart [18:41:47.017] length <- base::length [18:41:47.017] list <- base::list [18:41:47.017] seq.int <- base::seq.int [18:41:47.017] signalCondition <- base::signalCondition [18:41:47.017] sys.calls <- base::sys.calls [18:41:47.017] `[[` <- base::`[[` [18:41:47.017] `+` <- base::`+` [18:41:47.017] `<<-` <- base::`<<-` [18:41:47.017] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.017] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.017] 3L)] [18:41:47.017] } [18:41:47.017] function(cond) { [18:41:47.017] is_error <- inherits(cond, "error") [18:41:47.017] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.017] NULL) [18:41:47.017] if (is_error) { [18:41:47.017] sessionInformation <- function() { [18:41:47.017] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.017] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.017] search = base::search(), system = base::Sys.info()) [18:41:47.017] } [18:41:47.017] ...future.conditions[[length(...future.conditions) + [18:41:47.017] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.017] cond$call), session = sessionInformation(), [18:41:47.017] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.017] signalCondition(cond) [18:41:47.017] } [18:41:47.017] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.017] "immediateCondition"))) { [18:41:47.017] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.017] ...future.conditions[[length(...future.conditions) + [18:41:47.017] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.017] if (TRUE && !signal) { [18:41:47.017] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.017] { [18:41:47.017] inherits <- base::inherits [18:41:47.017] invokeRestart <- base::invokeRestart [18:41:47.017] is.null <- base::is.null [18:41:47.017] muffled <- FALSE [18:41:47.017] if (inherits(cond, "message")) { [18:41:47.017] muffled <- grepl(pattern, "muffleMessage") [18:41:47.017] if (muffled) [18:41:47.017] invokeRestart("muffleMessage") [18:41:47.017] } [18:41:47.017] else if (inherits(cond, "warning")) { [18:41:47.017] muffled <- grepl(pattern, "muffleWarning") [18:41:47.017] if (muffled) [18:41:47.017] invokeRestart("muffleWarning") [18:41:47.017] } [18:41:47.017] else if (inherits(cond, "condition")) { [18:41:47.017] if (!is.null(pattern)) { [18:41:47.017] computeRestarts <- base::computeRestarts [18:41:47.017] grepl <- base::grepl [18:41:47.017] restarts <- computeRestarts(cond) [18:41:47.017] for (restart in restarts) { [18:41:47.017] name <- restart$name [18:41:47.017] if (is.null(name)) [18:41:47.017] next [18:41:47.017] if (!grepl(pattern, name)) [18:41:47.017] next [18:41:47.017] invokeRestart(restart) [18:41:47.017] muffled <- TRUE [18:41:47.017] break [18:41:47.017] } [18:41:47.017] } [18:41:47.017] } [18:41:47.017] invisible(muffled) [18:41:47.017] } [18:41:47.017] muffleCondition(cond, pattern = "^muffle") [18:41:47.017] } [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] if (TRUE) { [18:41:47.017] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.017] { [18:41:47.017] inherits <- base::inherits [18:41:47.017] invokeRestart <- base::invokeRestart [18:41:47.017] is.null <- base::is.null [18:41:47.017] muffled <- FALSE [18:41:47.017] if (inherits(cond, "message")) { [18:41:47.017] muffled <- grepl(pattern, "muffleMessage") [18:41:47.017] if (muffled) [18:41:47.017] invokeRestart("muffleMessage") [18:41:47.017] } [18:41:47.017] else if (inherits(cond, "warning")) { [18:41:47.017] muffled <- grepl(pattern, "muffleWarning") [18:41:47.017] if (muffled) [18:41:47.017] invokeRestart("muffleWarning") [18:41:47.017] } [18:41:47.017] else if (inherits(cond, "condition")) { [18:41:47.017] if (!is.null(pattern)) { [18:41:47.017] computeRestarts <- base::computeRestarts [18:41:47.017] grepl <- base::grepl [18:41:47.017] restarts <- computeRestarts(cond) [18:41:47.017] for (restart in restarts) { [18:41:47.017] name <- restart$name [18:41:47.017] if (is.null(name)) [18:41:47.017] next [18:41:47.017] if (!grepl(pattern, name)) [18:41:47.017] next [18:41:47.017] invokeRestart(restart) [18:41:47.017] muffled <- TRUE [18:41:47.017] break [18:41:47.017] } [18:41:47.017] } [18:41:47.017] } [18:41:47.017] invisible(muffled) [18:41:47.017] } [18:41:47.017] muffleCondition(cond, pattern = "^muffle") [18:41:47.017] } [18:41:47.017] } [18:41:47.017] } [18:41:47.017] })) [18:41:47.017] }, error = function(ex) { [18:41:47.017] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.017] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.017] ...future.rng), started = ...future.startTime, [18:41:47.017] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.017] version = "1.8"), class = "FutureResult") [18:41:47.017] }, finally = { [18:41:47.017] if (!identical(...future.workdir, getwd())) [18:41:47.017] setwd(...future.workdir) [18:41:47.017] { [18:41:47.017] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.017] ...future.oldOptions$nwarnings <- NULL [18:41:47.017] } [18:41:47.017] base::options(...future.oldOptions) [18:41:47.017] if (.Platform$OS.type == "windows") { [18:41:47.017] old_names <- names(...future.oldEnvVars) [18:41:47.017] envs <- base::Sys.getenv() [18:41:47.017] names <- names(envs) [18:41:47.017] common <- intersect(names, old_names) [18:41:47.017] added <- setdiff(names, old_names) [18:41:47.017] removed <- setdiff(old_names, names) [18:41:47.017] changed <- common[...future.oldEnvVars[common] != [18:41:47.017] envs[common]] [18:41:47.017] NAMES <- toupper(changed) [18:41:47.017] args <- list() [18:41:47.017] for (kk in seq_along(NAMES)) { [18:41:47.017] name <- changed[[kk]] [18:41:47.017] NAME <- NAMES[[kk]] [18:41:47.017] if (name != NAME && is.element(NAME, old_names)) [18:41:47.017] next [18:41:47.017] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.017] } [18:41:47.017] NAMES <- toupper(added) [18:41:47.017] for (kk in seq_along(NAMES)) { [18:41:47.017] name <- added[[kk]] [18:41:47.017] NAME <- NAMES[[kk]] [18:41:47.017] if (name != NAME && is.element(NAME, old_names)) [18:41:47.017] next [18:41:47.017] args[[name]] <- "" [18:41:47.017] } [18:41:47.017] NAMES <- toupper(removed) [18:41:47.017] for (kk in seq_along(NAMES)) { [18:41:47.017] name <- removed[[kk]] [18:41:47.017] NAME <- NAMES[[kk]] [18:41:47.017] if (name != NAME && is.element(NAME, old_names)) [18:41:47.017] next [18:41:47.017] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.017] } [18:41:47.017] if (length(args) > 0) [18:41:47.017] base::do.call(base::Sys.setenv, args = args) [18:41:47.017] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.017] } [18:41:47.017] { [18:41:47.017] if (base::length(...future.futureOptionsAdded) > [18:41:47.017] 0L) { [18:41:47.017] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.017] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.017] base::options(opts) [18:41:47.017] } [18:41:47.017] { [18:41:47.017] { [18:41:47.017] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.017] NULL [18:41:47.017] } [18:41:47.017] options(future.plan = NULL) [18:41:47.017] if (is.na(NA_character_)) [18:41:47.017] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.017] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.017] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.017] .init = FALSE) [18:41:47.017] } [18:41:47.017] } [18:41:47.017] } [18:41:47.017] }) [18:41:47.017] if (TRUE) { [18:41:47.017] base::sink(type = "output", split = FALSE) [18:41:47.017] if (TRUE) { [18:41:47.017] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.017] } [18:41:47.017] else { [18:41:47.017] ...future.result["stdout"] <- base::list(NULL) [18:41:47.017] } [18:41:47.017] base::close(...future.stdout) [18:41:47.017] ...future.stdout <- NULL [18:41:47.017] } [18:41:47.017] ...future.result$conditions <- ...future.conditions [18:41:47.017] ...future.result$finished <- base::Sys.time() [18:41:47.017] ...future.result [18:41:47.017] } [18:41:47.023] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:47.023] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:47.023] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:47.024] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.024] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.024] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.025] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.025] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.025] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.025] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.026] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.026] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:47.027] MultisessionFuture started [18:41:47.027] - Launch lazy future ... done [18:41:47.027] run() for 'MultisessionFuture' ... done [18:41:47.027] Created future: [18:41:47.041] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.042] - Validating connection of MultisessionFuture [18:41:47.042] - received message: FutureResult [18:41:47.042] - Received FutureResult [18:41:47.042] - Erased future from FutureRegistry [18:41:47.043] result() for ClusterFuture ... [18:41:47.043] - result already collected: FutureResult [18:41:47.043] result() for ClusterFuture ... done [18:41:47.043] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.027] MultisessionFuture: [18:41:47.027] Label: 'future_sapply-2' [18:41:47.027] Expression: [18:41:47.027] { [18:41:47.027] do.call(function(...) { [18:41:47.027] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.027] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.027] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.027] on.exit(options(oopts), add = TRUE) [18:41:47.027] } [18:41:47.027] { [18:41:47.027] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.027] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.027] ...future.FUN(...future.X_jj, ...) [18:41:47.027] }) [18:41:47.027] } [18:41:47.027] }, args = future.call.arguments) [18:41:47.027] } [18:41:47.027] Lazy evaluation: FALSE [18:41:47.027] Asynchronous evaluation: TRUE [18:41:47.027] Local evaluation: TRUE [18:41:47.027] Environment: R_GlobalEnv [18:41:47.027] Capture standard output: TRUE [18:41:47.027] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.027] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.027] Packages: [18:41:47.027] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.027] Resolved: TRUE [18:41:47.027] Value: [18:41:47.027] Conditions captured: [18:41:47.027] Early signaling: FALSE [18:41:47.027] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.027] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.043] Chunk #2 of 2 ... DONE [18:41:47.044] Launching 2 futures (chunks) ... DONE [18:41:47.044] Resolving 2 futures (chunks) ... [18:41:47.044] resolve() on list ... [18:41:47.044] recursive: 0 [18:41:47.044] length: 2 [18:41:47.044] [18:41:47.045] Future #1 [18:41:47.045] result() for ClusterFuture ... [18:41:47.045] - result already collected: FutureResult [18:41:47.045] result() for ClusterFuture ... done [18:41:47.045] result() for ClusterFuture ... [18:41:47.045] - result already collected: FutureResult [18:41:47.046] result() for ClusterFuture ... done [18:41:47.046] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:47.046] - nx: 2 [18:41:47.046] - relay: TRUE [18:41:47.046] - stdout: TRUE [18:41:47.046] - signal: TRUE [18:41:47.046] - resignal: FALSE [18:41:47.047] - force: TRUE [18:41:47.047] - relayed: [n=2] FALSE, FALSE [18:41:47.047] - queued futures: [n=2] FALSE, FALSE [18:41:47.047] - until=1 [18:41:47.047] - relaying element #1 [18:41:47.047] result() for ClusterFuture ... [18:41:47.048] - result already collected: FutureResult [18:41:47.048] result() for ClusterFuture ... done [18:41:47.048] result() for ClusterFuture ... [18:41:47.048] - result already collected: FutureResult [18:41:47.048] result() for ClusterFuture ... done [18:41:47.048] result() for ClusterFuture ... [18:41:47.049] - result already collected: FutureResult [18:41:47.049] result() for ClusterFuture ... done [18:41:47.049] result() for ClusterFuture ... [18:41:47.049] - result already collected: FutureResult [18:41:47.049] result() for ClusterFuture ... done [18:41:47.049] - relayed: [n=2] TRUE, FALSE [18:41:47.050] - queued futures: [n=2] TRUE, FALSE [18:41:47.050] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:47.050] length: 1 (resolved future 1) [18:41:47.050] Future #2 [18:41:47.050] result() for ClusterFuture ... [18:41:47.050] - result already collected: FutureResult [18:41:47.051] result() for ClusterFuture ... done [18:41:47.051] result() for ClusterFuture ... [18:41:47.051] - result already collected: FutureResult [18:41:47.051] result() for ClusterFuture ... done [18:41:47.052] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:47.052] - nx: 2 [18:41:47.052] - relay: TRUE [18:41:47.053] - stdout: TRUE [18:41:47.053] - signal: TRUE [18:41:47.053] - resignal: FALSE [18:41:47.053] - force: TRUE [18:41:47.054] - relayed: [n=2] TRUE, FALSE [18:41:47.054] - queued futures: [n=2] TRUE, FALSE [18:41:47.054] - until=2 [18:41:47.055] - relaying element #2 [18:41:47.055] result() for ClusterFuture ... [18:41:47.055] - result already collected: FutureResult [18:41:47.056] result() for ClusterFuture ... done [18:41:47.056] result() for ClusterFuture ... [18:41:47.056] - result already collected: FutureResult [18:41:47.056] result() for ClusterFuture ... done [18:41:47.056] result() for ClusterFuture ... [18:41:47.057] - result already collected: FutureResult [18:41:47.057] result() for ClusterFuture ... done [18:41:47.057] result() for ClusterFuture ... [18:41:47.057] - result already collected: FutureResult [18:41:47.057] result() for ClusterFuture ... done [18:41:47.057] - relayed: [n=2] TRUE, TRUE [18:41:47.058] - queued futures: [n=2] TRUE, TRUE [18:41:47.058] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:47.058] length: 0 (resolved future 2) [18:41:47.058] Relaying remaining futures [18:41:47.058] signalConditionsASAP(NULL, pos=0) ... [18:41:47.058] - nx: 2 [18:41:47.059] - relay: TRUE [18:41:47.059] - stdout: TRUE [18:41:47.059] - signal: TRUE [18:41:47.063] - resignal: FALSE [18:41:47.063] - force: TRUE [18:41:47.063] - relayed: [n=2] TRUE, TRUE [18:41:47.063] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:47.064] - relayed: [n=2] TRUE, TRUE [18:41:47.064] - queued futures: [n=2] TRUE, TRUE [18:41:47.064] signalConditionsASAP(NULL, pos=0) ... done [18:41:47.064] resolve() on list ... DONE [18:41:47.064] result() for ClusterFuture ... [18:41:47.064] - result already collected: FutureResult [18:41:47.065] result() for ClusterFuture ... done [18:41:47.065] result() for ClusterFuture ... [18:41:47.065] - result already collected: FutureResult [18:41:47.065] result() for ClusterFuture ... done [18:41:47.065] result() for ClusterFuture ... [18:41:47.066] - result already collected: FutureResult [18:41:47.066] result() for ClusterFuture ... done [18:41:47.066] result() for ClusterFuture ... [18:41:47.066] - result already collected: FutureResult [18:41:47.066] result() for ClusterFuture ... done [18:41:47.066] - Number of value chunks collected: 2 [18:41:47.067] Resolving 2 futures (chunks) ... DONE [18:41:47.067] Reducing values from 2 chunks ... [18:41:47.067] - Number of values collected after concatenation: 3 [18:41:47.067] - Number of values expected: 3 [18:41:47.067] Reducing values from 2 chunks ... DONE [18:41:47.067] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y1:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y2:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 [18:41:47.075] future_lapply() ... [18:41:47.078] Number of chunks: 2 [18:41:47.078] getGlobalsAndPackagesXApply() ... [18:41:47.079] - future.globals: TRUE [18:41:47.079] getGlobalsAndPackages() ... [18:41:47.079] Searching for globals... [18:41:47.081] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:47.081] Searching for globals ... DONE [18:41:47.081] Resolving globals: FALSE [18:41:47.082] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:47.082] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:47.082] - globals: [1] 'FUN' [18:41:47.083] [18:41:47.083] getGlobalsAndPackages() ... DONE [18:41:47.083] - globals found/used: [n=1] 'FUN' [18:41:47.083] - needed namespaces: [n=0] [18:41:47.083] Finding globals ... DONE [18:41:47.083] - use_args: TRUE [18:41:47.084] - Getting '...' globals ... [18:41:47.084] resolve() on list ... [18:41:47.084] recursive: 0 [18:41:47.084] length: 1 [18:41:47.085] elements: '...' [18:41:47.085] length: 0 (resolved future 1) [18:41:47.085] resolve() on list ... DONE [18:41:47.085] - '...' content: [n=0] [18:41:47.085] List of 1 [18:41:47.085] $ ...: list() [18:41:47.085] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.085] - attr(*, "where")=List of 1 [18:41:47.085] ..$ ...: [18:41:47.085] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.085] - attr(*, "resolved")= logi TRUE [18:41:47.085] - attr(*, "total_size")= num NA [18:41:47.088] - Getting '...' globals ... DONE [18:41:47.089] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:47.089] List of 2 [18:41:47.089] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:47.089] $ ... : list() [18:41:47.089] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.089] - attr(*, "where")=List of 2 [18:41:47.089] ..$ ...future.FUN: [18:41:47.089] ..$ ... : [18:41:47.089] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.089] - attr(*, "resolved")= logi FALSE [18:41:47.089] - attr(*, "total_size")= int 6598 [18:41:47.092] Packages to be attached in all futures: [n=0] [18:41:47.092] getGlobalsAndPackagesXApply() ... DONE [18:41:47.092] Number of futures (= number of chunks): 2 [18:41:47.093] Launching 2 futures (chunks) ... [18:41:47.093] Chunk #1 of 2 ... [18:41:47.093] - Finding globals in 'X' for chunk #1 ... [18:41:47.093] getGlobalsAndPackages() ... [18:41:47.093] Searching for globals... [18:41:47.094] [18:41:47.094] Searching for globals ... DONE [18:41:47.094] - globals: [0] [18:41:47.094] getGlobalsAndPackages() ... DONE [18:41:47.094] + additional globals found: [n=0] [18:41:47.095] + additional namespaces needed: [n=0] [18:41:47.095] - Finding globals in 'X' for chunk #1 ... DONE [18:41:47.095] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.095] - seeds: [18:41:47.095] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.095] getGlobalsAndPackages() ... [18:41:47.096] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.096] Resolving globals: FALSE [18:41:47.096] Tweak future expression to call with '...' arguments ... [18:41:47.096] { [18:41:47.096] do.call(function(...) { [18:41:47.096] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.096] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.096] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.096] on.exit(options(oopts), add = TRUE) [18:41:47.096] } [18:41:47.096] { [18:41:47.096] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.096] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.096] ...future.FUN(...future.X_jj, ...) [18:41:47.096] }) [18:41:47.096] } [18:41:47.096] }, args = future.call.arguments) [18:41:47.096] } [18:41:47.097] Tweak future expression to call with '...' arguments ... DONE [18:41:47.097] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.098] [18:41:47.098] getGlobalsAndPackages() ... DONE [18:41:47.098] run() for 'Future' ... [18:41:47.098] - state: 'created' [18:41:47.099] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.115] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.115] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.115] - Field: 'node' [18:41:47.115] - Field: 'label' [18:41:47.116] - Field: 'local' [18:41:47.116] - Field: 'owner' [18:41:47.116] - Field: 'envir' [18:41:47.116] - Field: 'workers' [18:41:47.116] - Field: 'packages' [18:41:47.117] - Field: 'gc' [18:41:47.117] - Field: 'conditions' [18:41:47.117] - Field: 'persistent' [18:41:47.117] - Field: 'expr' [18:41:47.117] - Field: 'uuid' [18:41:47.117] - Field: 'seed' [18:41:47.118] - Field: 'version' [18:41:47.118] - Field: 'result' [18:41:47.118] - Field: 'asynchronous' [18:41:47.118] - Field: 'calls' [18:41:47.118] - Field: 'globals' [18:41:47.118] - Field: 'stdout' [18:41:47.119] - Field: 'earlySignal' [18:41:47.119] - Field: 'lazy' [18:41:47.119] - Field: 'state' [18:41:47.119] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.119] - Launch lazy future ... [18:41:47.120] Packages needed by the future expression (n = 0): [18:41:47.120] Packages needed by future strategies (n = 0): [18:41:47.121] { [18:41:47.121] { [18:41:47.121] { [18:41:47.121] ...future.startTime <- base::Sys.time() [18:41:47.121] { [18:41:47.121] { [18:41:47.121] { [18:41:47.121] { [18:41:47.121] base::local({ [18:41:47.121] has_future <- base::requireNamespace("future", [18:41:47.121] quietly = TRUE) [18:41:47.121] if (has_future) { [18:41:47.121] ns <- base::getNamespace("future") [18:41:47.121] version <- ns[[".package"]][["version"]] [18:41:47.121] if (is.null(version)) [18:41:47.121] version <- utils::packageVersion("future") [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] version <- NULL [18:41:47.121] } [18:41:47.121] if (!has_future || version < "1.8.0") { [18:41:47.121] info <- base::c(r_version = base::gsub("R version ", [18:41:47.121] "", base::R.version$version.string), [18:41:47.121] platform = base::sprintf("%s (%s-bit)", [18:41:47.121] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.121] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.121] "release", "version")], collapse = " "), [18:41:47.121] hostname = base::Sys.info()[["nodename"]]) [18:41:47.121] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.121] info) [18:41:47.121] info <- base::paste(info, collapse = "; ") [18:41:47.121] if (!has_future) { [18:41:47.121] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.121] info) [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.121] info, version) [18:41:47.121] } [18:41:47.121] base::stop(msg) [18:41:47.121] } [18:41:47.121] }) [18:41:47.121] } [18:41:47.121] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.121] base::options(mc.cores = 1L) [18:41:47.121] } [18:41:47.121] ...future.strategy.old <- future::plan("list") [18:41:47.121] options(future.plan = NULL) [18:41:47.121] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.121] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.121] } [18:41:47.121] ...future.workdir <- getwd() [18:41:47.121] } [18:41:47.121] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.121] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.121] } [18:41:47.121] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.121] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.121] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.121] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.121] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.121] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.121] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.121] base::names(...future.oldOptions)) [18:41:47.121] } [18:41:47.121] if (FALSE) { [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] if (TRUE) { [18:41:47.121] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.121] open = "w") [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.121] windows = "NUL", "/dev/null"), open = "w") [18:41:47.121] } [18:41:47.121] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.121] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.121] base::sink(type = "output", split = FALSE) [18:41:47.121] base::close(...future.stdout) [18:41:47.121] }, add = TRUE) [18:41:47.121] } [18:41:47.121] ...future.frame <- base::sys.nframe() [18:41:47.121] ...future.conditions <- base::list() [18:41:47.121] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.121] if (FALSE) { [18:41:47.121] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.121] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.121] } [18:41:47.121] ...future.result <- base::tryCatch({ [18:41:47.121] base::withCallingHandlers({ [18:41:47.121] ...future.value <- base::withVisible(base::local({ [18:41:47.121] ...future.makeSendCondition <- base::local({ [18:41:47.121] sendCondition <- NULL [18:41:47.121] function(frame = 1L) { [18:41:47.121] if (is.function(sendCondition)) [18:41:47.121] return(sendCondition) [18:41:47.121] ns <- getNamespace("parallel") [18:41:47.121] if (exists("sendData", mode = "function", [18:41:47.121] envir = ns)) { [18:41:47.121] parallel_sendData <- get("sendData", mode = "function", [18:41:47.121] envir = ns) [18:41:47.121] envir <- sys.frame(frame) [18:41:47.121] master <- NULL [18:41:47.121] while (!identical(envir, .GlobalEnv) && [18:41:47.121] !identical(envir, emptyenv())) { [18:41:47.121] if (exists("master", mode = "list", envir = envir, [18:41:47.121] inherits = FALSE)) { [18:41:47.121] master <- get("master", mode = "list", [18:41:47.121] envir = envir, inherits = FALSE) [18:41:47.121] if (inherits(master, c("SOCKnode", [18:41:47.121] "SOCK0node"))) { [18:41:47.121] sendCondition <<- function(cond) { [18:41:47.121] data <- list(type = "VALUE", value = cond, [18:41:47.121] success = TRUE) [18:41:47.121] parallel_sendData(master, data) [18:41:47.121] } [18:41:47.121] return(sendCondition) [18:41:47.121] } [18:41:47.121] } [18:41:47.121] frame <- frame + 1L [18:41:47.121] envir <- sys.frame(frame) [18:41:47.121] } [18:41:47.121] } [18:41:47.121] sendCondition <<- function(cond) NULL [18:41:47.121] } [18:41:47.121] }) [18:41:47.121] withCallingHandlers({ [18:41:47.121] { [18:41:47.121] do.call(function(...) { [18:41:47.121] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.121] if (!identical(...future.globals.maxSize.org, [18:41:47.121] ...future.globals.maxSize)) { [18:41:47.121] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.121] on.exit(options(oopts), add = TRUE) [18:41:47.121] } [18:41:47.121] { [18:41:47.121] lapply(seq_along(...future.elements_ii), [18:41:47.121] FUN = function(jj) { [18:41:47.121] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.121] ...future.FUN(...future.X_jj, ...) [18:41:47.121] }) [18:41:47.121] } [18:41:47.121] }, args = future.call.arguments) [18:41:47.121] } [18:41:47.121] }, immediateCondition = function(cond) { [18:41:47.121] sendCondition <- ...future.makeSendCondition() [18:41:47.121] sendCondition(cond) [18:41:47.121] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.121] { [18:41:47.121] inherits <- base::inherits [18:41:47.121] invokeRestart <- base::invokeRestart [18:41:47.121] is.null <- base::is.null [18:41:47.121] muffled <- FALSE [18:41:47.121] if (inherits(cond, "message")) { [18:41:47.121] muffled <- grepl(pattern, "muffleMessage") [18:41:47.121] if (muffled) [18:41:47.121] invokeRestart("muffleMessage") [18:41:47.121] } [18:41:47.121] else if (inherits(cond, "warning")) { [18:41:47.121] muffled <- grepl(pattern, "muffleWarning") [18:41:47.121] if (muffled) [18:41:47.121] invokeRestart("muffleWarning") [18:41:47.121] } [18:41:47.121] else if (inherits(cond, "condition")) { [18:41:47.121] if (!is.null(pattern)) { [18:41:47.121] computeRestarts <- base::computeRestarts [18:41:47.121] grepl <- base::grepl [18:41:47.121] restarts <- computeRestarts(cond) [18:41:47.121] for (restart in restarts) { [18:41:47.121] name <- restart$name [18:41:47.121] if (is.null(name)) [18:41:47.121] next [18:41:47.121] if (!grepl(pattern, name)) [18:41:47.121] next [18:41:47.121] invokeRestart(restart) [18:41:47.121] muffled <- TRUE [18:41:47.121] break [18:41:47.121] } [18:41:47.121] } [18:41:47.121] } [18:41:47.121] invisible(muffled) [18:41:47.121] } [18:41:47.121] muffleCondition(cond) [18:41:47.121] }) [18:41:47.121] })) [18:41:47.121] future::FutureResult(value = ...future.value$value, [18:41:47.121] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.121] ...future.rng), globalenv = if (FALSE) [18:41:47.121] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.121] ...future.globalenv.names)) [18:41:47.121] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.121] }, condition = base::local({ [18:41:47.121] c <- base::c [18:41:47.121] inherits <- base::inherits [18:41:47.121] invokeRestart <- base::invokeRestart [18:41:47.121] length <- base::length [18:41:47.121] list <- base::list [18:41:47.121] seq.int <- base::seq.int [18:41:47.121] signalCondition <- base::signalCondition [18:41:47.121] sys.calls <- base::sys.calls [18:41:47.121] `[[` <- base::`[[` [18:41:47.121] `+` <- base::`+` [18:41:47.121] `<<-` <- base::`<<-` [18:41:47.121] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.121] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.121] 3L)] [18:41:47.121] } [18:41:47.121] function(cond) { [18:41:47.121] is_error <- inherits(cond, "error") [18:41:47.121] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.121] NULL) [18:41:47.121] if (is_error) { [18:41:47.121] sessionInformation <- function() { [18:41:47.121] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.121] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.121] search = base::search(), system = base::Sys.info()) [18:41:47.121] } [18:41:47.121] ...future.conditions[[length(...future.conditions) + [18:41:47.121] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.121] cond$call), session = sessionInformation(), [18:41:47.121] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.121] signalCondition(cond) [18:41:47.121] } [18:41:47.121] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.121] "immediateCondition"))) { [18:41:47.121] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.121] ...future.conditions[[length(...future.conditions) + [18:41:47.121] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.121] if (TRUE && !signal) { [18:41:47.121] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.121] { [18:41:47.121] inherits <- base::inherits [18:41:47.121] invokeRestart <- base::invokeRestart [18:41:47.121] is.null <- base::is.null [18:41:47.121] muffled <- FALSE [18:41:47.121] if (inherits(cond, "message")) { [18:41:47.121] muffled <- grepl(pattern, "muffleMessage") [18:41:47.121] if (muffled) [18:41:47.121] invokeRestart("muffleMessage") [18:41:47.121] } [18:41:47.121] else if (inherits(cond, "warning")) { [18:41:47.121] muffled <- grepl(pattern, "muffleWarning") [18:41:47.121] if (muffled) [18:41:47.121] invokeRestart("muffleWarning") [18:41:47.121] } [18:41:47.121] else if (inherits(cond, "condition")) { [18:41:47.121] if (!is.null(pattern)) { [18:41:47.121] computeRestarts <- base::computeRestarts [18:41:47.121] grepl <- base::grepl [18:41:47.121] restarts <- computeRestarts(cond) [18:41:47.121] for (restart in restarts) { [18:41:47.121] name <- restart$name [18:41:47.121] if (is.null(name)) [18:41:47.121] next [18:41:47.121] if (!grepl(pattern, name)) [18:41:47.121] next [18:41:47.121] invokeRestart(restart) [18:41:47.121] muffled <- TRUE [18:41:47.121] break [18:41:47.121] } [18:41:47.121] } [18:41:47.121] } [18:41:47.121] invisible(muffled) [18:41:47.121] } [18:41:47.121] muffleCondition(cond, pattern = "^muffle") [18:41:47.121] } [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] if (TRUE) { [18:41:47.121] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.121] { [18:41:47.121] inherits <- base::inherits [18:41:47.121] invokeRestart <- base::invokeRestart [18:41:47.121] is.null <- base::is.null [18:41:47.121] muffled <- FALSE [18:41:47.121] if (inherits(cond, "message")) { [18:41:47.121] muffled <- grepl(pattern, "muffleMessage") [18:41:47.121] if (muffled) [18:41:47.121] invokeRestart("muffleMessage") [18:41:47.121] } [18:41:47.121] else if (inherits(cond, "warning")) { [18:41:47.121] muffled <- grepl(pattern, "muffleWarning") [18:41:47.121] if (muffled) [18:41:47.121] invokeRestart("muffleWarning") [18:41:47.121] } [18:41:47.121] else if (inherits(cond, "condition")) { [18:41:47.121] if (!is.null(pattern)) { [18:41:47.121] computeRestarts <- base::computeRestarts [18:41:47.121] grepl <- base::grepl [18:41:47.121] restarts <- computeRestarts(cond) [18:41:47.121] for (restart in restarts) { [18:41:47.121] name <- restart$name [18:41:47.121] if (is.null(name)) [18:41:47.121] next [18:41:47.121] if (!grepl(pattern, name)) [18:41:47.121] next [18:41:47.121] invokeRestart(restart) [18:41:47.121] muffled <- TRUE [18:41:47.121] break [18:41:47.121] } [18:41:47.121] } [18:41:47.121] } [18:41:47.121] invisible(muffled) [18:41:47.121] } [18:41:47.121] muffleCondition(cond, pattern = "^muffle") [18:41:47.121] } [18:41:47.121] } [18:41:47.121] } [18:41:47.121] })) [18:41:47.121] }, error = function(ex) { [18:41:47.121] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.121] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.121] ...future.rng), started = ...future.startTime, [18:41:47.121] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.121] version = "1.8"), class = "FutureResult") [18:41:47.121] }, finally = { [18:41:47.121] if (!identical(...future.workdir, getwd())) [18:41:47.121] setwd(...future.workdir) [18:41:47.121] { [18:41:47.121] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.121] ...future.oldOptions$nwarnings <- NULL [18:41:47.121] } [18:41:47.121] base::options(...future.oldOptions) [18:41:47.121] if (.Platform$OS.type == "windows") { [18:41:47.121] old_names <- names(...future.oldEnvVars) [18:41:47.121] envs <- base::Sys.getenv() [18:41:47.121] names <- names(envs) [18:41:47.121] common <- intersect(names, old_names) [18:41:47.121] added <- setdiff(names, old_names) [18:41:47.121] removed <- setdiff(old_names, names) [18:41:47.121] changed <- common[...future.oldEnvVars[common] != [18:41:47.121] envs[common]] [18:41:47.121] NAMES <- toupper(changed) [18:41:47.121] args <- list() [18:41:47.121] for (kk in seq_along(NAMES)) { [18:41:47.121] name <- changed[[kk]] [18:41:47.121] NAME <- NAMES[[kk]] [18:41:47.121] if (name != NAME && is.element(NAME, old_names)) [18:41:47.121] next [18:41:47.121] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.121] } [18:41:47.121] NAMES <- toupper(added) [18:41:47.121] for (kk in seq_along(NAMES)) { [18:41:47.121] name <- added[[kk]] [18:41:47.121] NAME <- NAMES[[kk]] [18:41:47.121] if (name != NAME && is.element(NAME, old_names)) [18:41:47.121] next [18:41:47.121] args[[name]] <- "" [18:41:47.121] } [18:41:47.121] NAMES <- toupper(removed) [18:41:47.121] for (kk in seq_along(NAMES)) { [18:41:47.121] name <- removed[[kk]] [18:41:47.121] NAME <- NAMES[[kk]] [18:41:47.121] if (name != NAME && is.element(NAME, old_names)) [18:41:47.121] next [18:41:47.121] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.121] } [18:41:47.121] if (length(args) > 0) [18:41:47.121] base::do.call(base::Sys.setenv, args = args) [18:41:47.121] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.121] } [18:41:47.121] { [18:41:47.121] if (base::length(...future.futureOptionsAdded) > [18:41:47.121] 0L) { [18:41:47.121] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.121] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.121] base::options(opts) [18:41:47.121] } [18:41:47.121] { [18:41:47.121] { [18:41:47.121] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.121] NULL [18:41:47.121] } [18:41:47.121] options(future.plan = NULL) [18:41:47.121] if (is.na(NA_character_)) [18:41:47.121] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.121] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.121] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.121] .init = FALSE) [18:41:47.121] } [18:41:47.121] } [18:41:47.121] } [18:41:47.121] }) [18:41:47.121] if (TRUE) { [18:41:47.121] base::sink(type = "output", split = FALSE) [18:41:47.121] if (TRUE) { [18:41:47.121] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.121] } [18:41:47.121] else { [18:41:47.121] ...future.result["stdout"] <- base::list(NULL) [18:41:47.121] } [18:41:47.121] base::close(...future.stdout) [18:41:47.121] ...future.stdout <- NULL [18:41:47.121] } [18:41:47.121] ...future.result$conditions <- ...future.conditions [18:41:47.121] ...future.result$finished <- base::Sys.time() [18:41:47.121] ...future.result [18:41:47.121] } [18:41:47.126] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... [18:41:47.126] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:47.127] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:47.127] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.127] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.128] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:47.128] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:47.128] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.129] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.129] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.129] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.129] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... DONE [18:41:47.130] MultisessionFuture started [18:41:47.130] - Launch lazy future ... done [18:41:47.130] run() for 'MultisessionFuture' ... done [18:41:47.131] Created future: [18:41:47.145] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.145] - Validating connection of MultisessionFuture [18:41:47.146] - received message: FutureResult [18:41:47.146] - Received FutureResult [18:41:47.146] - Erased future from FutureRegistry [18:41:47.146] result() for ClusterFuture ... [18:41:47.146] - result already collected: FutureResult [18:41:47.147] result() for ClusterFuture ... done [18:41:47.147] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.131] MultisessionFuture: [18:41:47.131] Label: 'future_sapply-1' [18:41:47.131] Expression: [18:41:47.131] { [18:41:47.131] do.call(function(...) { [18:41:47.131] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.131] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.131] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.131] on.exit(options(oopts), add = TRUE) [18:41:47.131] } [18:41:47.131] { [18:41:47.131] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.131] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.131] ...future.FUN(...future.X_jj, ...) [18:41:47.131] }) [18:41:47.131] } [18:41:47.131] }, args = future.call.arguments) [18:41:47.131] } [18:41:47.131] Lazy evaluation: FALSE [18:41:47.131] Asynchronous evaluation: TRUE [18:41:47.131] Local evaluation: TRUE [18:41:47.131] Environment: R_GlobalEnv [18:41:47.131] Capture standard output: TRUE [18:41:47.131] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.131] Globals: 5 objects totaling 1.00 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.131] Packages: [18:41:47.131] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.131] Resolved: TRUE [18:41:47.131] Value: [18:41:47.131] Conditions captured: [18:41:47.131] Early signaling: FALSE [18:41:47.131] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.131] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.147] Chunk #1 of 2 ... DONE [18:41:47.147] Chunk #2 of 2 ... [18:41:47.148] - Finding globals in 'X' for chunk #2 ... [18:41:47.148] getGlobalsAndPackages() ... [18:41:47.148] Searching for globals... [18:41:47.148] [18:41:47.148] Searching for globals ... DONE [18:41:47.149] - globals: [0] [18:41:47.149] getGlobalsAndPackages() ... DONE [18:41:47.149] + additional globals found: [n=0] [18:41:47.149] + additional namespaces needed: [n=0] [18:41:47.149] - Finding globals in 'X' for chunk #2 ... DONE [18:41:47.149] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.150] - seeds: [18:41:47.150] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.150] getGlobalsAndPackages() ... [18:41:47.150] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.150] Resolving globals: FALSE [18:41:47.150] Tweak future expression to call with '...' arguments ... [18:41:47.151] { [18:41:47.151] do.call(function(...) { [18:41:47.151] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.151] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.151] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.151] on.exit(options(oopts), add = TRUE) [18:41:47.151] } [18:41:47.151] { [18:41:47.151] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.151] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.151] ...future.FUN(...future.X_jj, ...) [18:41:47.151] }) [18:41:47.151] } [18:41:47.151] }, args = future.call.arguments) [18:41:47.151] } [18:41:47.151] Tweak future expression to call with '...' arguments ... DONE [18:41:47.152] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.152] [18:41:47.152] getGlobalsAndPackages() ... DONE [18:41:47.152] run() for 'Future' ... [18:41:47.152] - state: 'created' [18:41:47.153] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.169] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.170] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.170] - Field: 'node' [18:41:47.170] - Field: 'label' [18:41:47.170] - Field: 'local' [18:41:47.171] - Field: 'owner' [18:41:47.171] - Field: 'envir' [18:41:47.171] - Field: 'workers' [18:41:47.171] - Field: 'packages' [18:41:47.172] - Field: 'gc' [18:41:47.172] - Field: 'conditions' [18:41:47.172] - Field: 'persistent' [18:41:47.172] - Field: 'expr' [18:41:47.172] - Field: 'uuid' [18:41:47.173] - Field: 'seed' [18:41:47.173] - Field: 'version' [18:41:47.173] - Field: 'result' [18:41:47.173] - Field: 'asynchronous' [18:41:47.174] - Field: 'calls' [18:41:47.174] - Field: 'globals' [18:41:47.174] - Field: 'stdout' [18:41:47.174] - Field: 'earlySignal' [18:41:47.175] - Field: 'lazy' [18:41:47.175] - Field: 'state' [18:41:47.175] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.176] - Launch lazy future ... [18:41:47.176] Packages needed by the future expression (n = 0): [18:41:47.176] Packages needed by future strategies (n = 0): [18:41:47.177] { [18:41:47.177] { [18:41:47.177] { [18:41:47.177] ...future.startTime <- base::Sys.time() [18:41:47.177] { [18:41:47.177] { [18:41:47.177] { [18:41:47.177] { [18:41:47.177] base::local({ [18:41:47.177] has_future <- base::requireNamespace("future", [18:41:47.177] quietly = TRUE) [18:41:47.177] if (has_future) { [18:41:47.177] ns <- base::getNamespace("future") [18:41:47.177] version <- ns[[".package"]][["version"]] [18:41:47.177] if (is.null(version)) [18:41:47.177] version <- utils::packageVersion("future") [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] version <- NULL [18:41:47.177] } [18:41:47.177] if (!has_future || version < "1.8.0") { [18:41:47.177] info <- base::c(r_version = base::gsub("R version ", [18:41:47.177] "", base::R.version$version.string), [18:41:47.177] platform = base::sprintf("%s (%s-bit)", [18:41:47.177] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.177] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.177] "release", "version")], collapse = " "), [18:41:47.177] hostname = base::Sys.info()[["nodename"]]) [18:41:47.177] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.177] info) [18:41:47.177] info <- base::paste(info, collapse = "; ") [18:41:47.177] if (!has_future) { [18:41:47.177] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.177] info) [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.177] info, version) [18:41:47.177] } [18:41:47.177] base::stop(msg) [18:41:47.177] } [18:41:47.177] }) [18:41:47.177] } [18:41:47.177] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.177] base::options(mc.cores = 1L) [18:41:47.177] } [18:41:47.177] ...future.strategy.old <- future::plan("list") [18:41:47.177] options(future.plan = NULL) [18:41:47.177] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.177] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.177] } [18:41:47.177] ...future.workdir <- getwd() [18:41:47.177] } [18:41:47.177] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.177] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.177] } [18:41:47.177] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.177] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.177] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.177] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.177] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.177] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.177] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.177] base::names(...future.oldOptions)) [18:41:47.177] } [18:41:47.177] if (FALSE) { [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] if (TRUE) { [18:41:47.177] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.177] open = "w") [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.177] windows = "NUL", "/dev/null"), open = "w") [18:41:47.177] } [18:41:47.177] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.177] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.177] base::sink(type = "output", split = FALSE) [18:41:47.177] base::close(...future.stdout) [18:41:47.177] }, add = TRUE) [18:41:47.177] } [18:41:47.177] ...future.frame <- base::sys.nframe() [18:41:47.177] ...future.conditions <- base::list() [18:41:47.177] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.177] if (FALSE) { [18:41:47.177] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.177] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.177] } [18:41:47.177] ...future.result <- base::tryCatch({ [18:41:47.177] base::withCallingHandlers({ [18:41:47.177] ...future.value <- base::withVisible(base::local({ [18:41:47.177] ...future.makeSendCondition <- base::local({ [18:41:47.177] sendCondition <- NULL [18:41:47.177] function(frame = 1L) { [18:41:47.177] if (is.function(sendCondition)) [18:41:47.177] return(sendCondition) [18:41:47.177] ns <- getNamespace("parallel") [18:41:47.177] if (exists("sendData", mode = "function", [18:41:47.177] envir = ns)) { [18:41:47.177] parallel_sendData <- get("sendData", mode = "function", [18:41:47.177] envir = ns) [18:41:47.177] envir <- sys.frame(frame) [18:41:47.177] master <- NULL [18:41:47.177] while (!identical(envir, .GlobalEnv) && [18:41:47.177] !identical(envir, emptyenv())) { [18:41:47.177] if (exists("master", mode = "list", envir = envir, [18:41:47.177] inherits = FALSE)) { [18:41:47.177] master <- get("master", mode = "list", [18:41:47.177] envir = envir, inherits = FALSE) [18:41:47.177] if (inherits(master, c("SOCKnode", [18:41:47.177] "SOCK0node"))) { [18:41:47.177] sendCondition <<- function(cond) { [18:41:47.177] data <- list(type = "VALUE", value = cond, [18:41:47.177] success = TRUE) [18:41:47.177] parallel_sendData(master, data) [18:41:47.177] } [18:41:47.177] return(sendCondition) [18:41:47.177] } [18:41:47.177] } [18:41:47.177] frame <- frame + 1L [18:41:47.177] envir <- sys.frame(frame) [18:41:47.177] } [18:41:47.177] } [18:41:47.177] sendCondition <<- function(cond) NULL [18:41:47.177] } [18:41:47.177] }) [18:41:47.177] withCallingHandlers({ [18:41:47.177] { [18:41:47.177] do.call(function(...) { [18:41:47.177] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.177] if (!identical(...future.globals.maxSize.org, [18:41:47.177] ...future.globals.maxSize)) { [18:41:47.177] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.177] on.exit(options(oopts), add = TRUE) [18:41:47.177] } [18:41:47.177] { [18:41:47.177] lapply(seq_along(...future.elements_ii), [18:41:47.177] FUN = function(jj) { [18:41:47.177] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.177] ...future.FUN(...future.X_jj, ...) [18:41:47.177] }) [18:41:47.177] } [18:41:47.177] }, args = future.call.arguments) [18:41:47.177] } [18:41:47.177] }, immediateCondition = function(cond) { [18:41:47.177] sendCondition <- ...future.makeSendCondition() [18:41:47.177] sendCondition(cond) [18:41:47.177] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.177] { [18:41:47.177] inherits <- base::inherits [18:41:47.177] invokeRestart <- base::invokeRestart [18:41:47.177] is.null <- base::is.null [18:41:47.177] muffled <- FALSE [18:41:47.177] if (inherits(cond, "message")) { [18:41:47.177] muffled <- grepl(pattern, "muffleMessage") [18:41:47.177] if (muffled) [18:41:47.177] invokeRestart("muffleMessage") [18:41:47.177] } [18:41:47.177] else if (inherits(cond, "warning")) { [18:41:47.177] muffled <- grepl(pattern, "muffleWarning") [18:41:47.177] if (muffled) [18:41:47.177] invokeRestart("muffleWarning") [18:41:47.177] } [18:41:47.177] else if (inherits(cond, "condition")) { [18:41:47.177] if (!is.null(pattern)) { [18:41:47.177] computeRestarts <- base::computeRestarts [18:41:47.177] grepl <- base::grepl [18:41:47.177] restarts <- computeRestarts(cond) [18:41:47.177] for (restart in restarts) { [18:41:47.177] name <- restart$name [18:41:47.177] if (is.null(name)) [18:41:47.177] next [18:41:47.177] if (!grepl(pattern, name)) [18:41:47.177] next [18:41:47.177] invokeRestart(restart) [18:41:47.177] muffled <- TRUE [18:41:47.177] break [18:41:47.177] } [18:41:47.177] } [18:41:47.177] } [18:41:47.177] invisible(muffled) [18:41:47.177] } [18:41:47.177] muffleCondition(cond) [18:41:47.177] }) [18:41:47.177] })) [18:41:47.177] future::FutureResult(value = ...future.value$value, [18:41:47.177] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.177] ...future.rng), globalenv = if (FALSE) [18:41:47.177] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.177] ...future.globalenv.names)) [18:41:47.177] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.177] }, condition = base::local({ [18:41:47.177] c <- base::c [18:41:47.177] inherits <- base::inherits [18:41:47.177] invokeRestart <- base::invokeRestart [18:41:47.177] length <- base::length [18:41:47.177] list <- base::list [18:41:47.177] seq.int <- base::seq.int [18:41:47.177] signalCondition <- base::signalCondition [18:41:47.177] sys.calls <- base::sys.calls [18:41:47.177] `[[` <- base::`[[` [18:41:47.177] `+` <- base::`+` [18:41:47.177] `<<-` <- base::`<<-` [18:41:47.177] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.177] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.177] 3L)] [18:41:47.177] } [18:41:47.177] function(cond) { [18:41:47.177] is_error <- inherits(cond, "error") [18:41:47.177] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.177] NULL) [18:41:47.177] if (is_error) { [18:41:47.177] sessionInformation <- function() { [18:41:47.177] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.177] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.177] search = base::search(), system = base::Sys.info()) [18:41:47.177] } [18:41:47.177] ...future.conditions[[length(...future.conditions) + [18:41:47.177] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.177] cond$call), session = sessionInformation(), [18:41:47.177] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.177] signalCondition(cond) [18:41:47.177] } [18:41:47.177] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.177] "immediateCondition"))) { [18:41:47.177] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.177] ...future.conditions[[length(...future.conditions) + [18:41:47.177] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.177] if (TRUE && !signal) { [18:41:47.177] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.177] { [18:41:47.177] inherits <- base::inherits [18:41:47.177] invokeRestart <- base::invokeRestart [18:41:47.177] is.null <- base::is.null [18:41:47.177] muffled <- FALSE [18:41:47.177] if (inherits(cond, "message")) { [18:41:47.177] muffled <- grepl(pattern, "muffleMessage") [18:41:47.177] if (muffled) [18:41:47.177] invokeRestart("muffleMessage") [18:41:47.177] } [18:41:47.177] else if (inherits(cond, "warning")) { [18:41:47.177] muffled <- grepl(pattern, "muffleWarning") [18:41:47.177] if (muffled) [18:41:47.177] invokeRestart("muffleWarning") [18:41:47.177] } [18:41:47.177] else if (inherits(cond, "condition")) { [18:41:47.177] if (!is.null(pattern)) { [18:41:47.177] computeRestarts <- base::computeRestarts [18:41:47.177] grepl <- base::grepl [18:41:47.177] restarts <- computeRestarts(cond) [18:41:47.177] for (restart in restarts) { [18:41:47.177] name <- restart$name [18:41:47.177] if (is.null(name)) [18:41:47.177] next [18:41:47.177] if (!grepl(pattern, name)) [18:41:47.177] next [18:41:47.177] invokeRestart(restart) [18:41:47.177] muffled <- TRUE [18:41:47.177] break [18:41:47.177] } [18:41:47.177] } [18:41:47.177] } [18:41:47.177] invisible(muffled) [18:41:47.177] } [18:41:47.177] muffleCondition(cond, pattern = "^muffle") [18:41:47.177] } [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] if (TRUE) { [18:41:47.177] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.177] { [18:41:47.177] inherits <- base::inherits [18:41:47.177] invokeRestart <- base::invokeRestart [18:41:47.177] is.null <- base::is.null [18:41:47.177] muffled <- FALSE [18:41:47.177] if (inherits(cond, "message")) { [18:41:47.177] muffled <- grepl(pattern, "muffleMessage") [18:41:47.177] if (muffled) [18:41:47.177] invokeRestart("muffleMessage") [18:41:47.177] } [18:41:47.177] else if (inherits(cond, "warning")) { [18:41:47.177] muffled <- grepl(pattern, "muffleWarning") [18:41:47.177] if (muffled) [18:41:47.177] invokeRestart("muffleWarning") [18:41:47.177] } [18:41:47.177] else if (inherits(cond, "condition")) { [18:41:47.177] if (!is.null(pattern)) { [18:41:47.177] computeRestarts <- base::computeRestarts [18:41:47.177] grepl <- base::grepl [18:41:47.177] restarts <- computeRestarts(cond) [18:41:47.177] for (restart in restarts) { [18:41:47.177] name <- restart$name [18:41:47.177] if (is.null(name)) [18:41:47.177] next [18:41:47.177] if (!grepl(pattern, name)) [18:41:47.177] next [18:41:47.177] invokeRestart(restart) [18:41:47.177] muffled <- TRUE [18:41:47.177] break [18:41:47.177] } [18:41:47.177] } [18:41:47.177] } [18:41:47.177] invisible(muffled) [18:41:47.177] } [18:41:47.177] muffleCondition(cond, pattern = "^muffle") [18:41:47.177] } [18:41:47.177] } [18:41:47.177] } [18:41:47.177] })) [18:41:47.177] }, error = function(ex) { [18:41:47.177] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.177] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.177] ...future.rng), started = ...future.startTime, [18:41:47.177] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.177] version = "1.8"), class = "FutureResult") [18:41:47.177] }, finally = { [18:41:47.177] if (!identical(...future.workdir, getwd())) [18:41:47.177] setwd(...future.workdir) [18:41:47.177] { [18:41:47.177] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.177] ...future.oldOptions$nwarnings <- NULL [18:41:47.177] } [18:41:47.177] base::options(...future.oldOptions) [18:41:47.177] if (.Platform$OS.type == "windows") { [18:41:47.177] old_names <- names(...future.oldEnvVars) [18:41:47.177] envs <- base::Sys.getenv() [18:41:47.177] names <- names(envs) [18:41:47.177] common <- intersect(names, old_names) [18:41:47.177] added <- setdiff(names, old_names) [18:41:47.177] removed <- setdiff(old_names, names) [18:41:47.177] changed <- common[...future.oldEnvVars[common] != [18:41:47.177] envs[common]] [18:41:47.177] NAMES <- toupper(changed) [18:41:47.177] args <- list() [18:41:47.177] for (kk in seq_along(NAMES)) { [18:41:47.177] name <- changed[[kk]] [18:41:47.177] NAME <- NAMES[[kk]] [18:41:47.177] if (name != NAME && is.element(NAME, old_names)) [18:41:47.177] next [18:41:47.177] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.177] } [18:41:47.177] NAMES <- toupper(added) [18:41:47.177] for (kk in seq_along(NAMES)) { [18:41:47.177] name <- added[[kk]] [18:41:47.177] NAME <- NAMES[[kk]] [18:41:47.177] if (name != NAME && is.element(NAME, old_names)) [18:41:47.177] next [18:41:47.177] args[[name]] <- "" [18:41:47.177] } [18:41:47.177] NAMES <- toupper(removed) [18:41:47.177] for (kk in seq_along(NAMES)) { [18:41:47.177] name <- removed[[kk]] [18:41:47.177] NAME <- NAMES[[kk]] [18:41:47.177] if (name != NAME && is.element(NAME, old_names)) [18:41:47.177] next [18:41:47.177] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.177] } [18:41:47.177] if (length(args) > 0) [18:41:47.177] base::do.call(base::Sys.setenv, args = args) [18:41:47.177] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.177] } [18:41:47.177] { [18:41:47.177] if (base::length(...future.futureOptionsAdded) > [18:41:47.177] 0L) { [18:41:47.177] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.177] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.177] base::options(opts) [18:41:47.177] } [18:41:47.177] { [18:41:47.177] { [18:41:47.177] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.177] NULL [18:41:47.177] } [18:41:47.177] options(future.plan = NULL) [18:41:47.177] if (is.na(NA_character_)) [18:41:47.177] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.177] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.177] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.177] .init = FALSE) [18:41:47.177] } [18:41:47.177] } [18:41:47.177] } [18:41:47.177] }) [18:41:47.177] if (TRUE) { [18:41:47.177] base::sink(type = "output", split = FALSE) [18:41:47.177] if (TRUE) { [18:41:47.177] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.177] } [18:41:47.177] else { [18:41:47.177] ...future.result["stdout"] <- base::list(NULL) [18:41:47.177] } [18:41:47.177] base::close(...future.stdout) [18:41:47.177] ...future.stdout <- NULL [18:41:47.177] } [18:41:47.177] ...future.result$conditions <- ...future.conditions [18:41:47.177] ...future.result$finished <- base::Sys.time() [18:41:47.177] ...future.result [18:41:47.177] } [18:41:47.182] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:47.183] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:47.183] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:47.183] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.184] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.184] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.184] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.184] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.185] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.185] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.185] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.186] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:47.186] MultisessionFuture started [18:41:47.186] - Launch lazy future ... done [18:41:47.187] run() for 'MultisessionFuture' ... done [18:41:47.187] Created future: [18:41:47.200] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.200] - Validating connection of MultisessionFuture [18:41:47.200] - received message: FutureResult [18:41:47.201] - Received FutureResult [18:41:47.201] - Erased future from FutureRegistry [18:41:47.201] result() for ClusterFuture ... [18:41:47.201] - result already collected: FutureResult [18:41:47.202] result() for ClusterFuture ... done [18:41:47.202] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.187] MultisessionFuture: [18:41:47.187] Label: 'future_sapply-2' [18:41:47.187] Expression: [18:41:47.187] { [18:41:47.187] do.call(function(...) { [18:41:47.187] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.187] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.187] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.187] on.exit(options(oopts), add = TRUE) [18:41:47.187] } [18:41:47.187] { [18:41:47.187] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.187] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.187] ...future.FUN(...future.X_jj, ...) [18:41:47.187] }) [18:41:47.187] } [18:41:47.187] }, args = future.call.arguments) [18:41:47.187] } [18:41:47.187] Lazy evaluation: FALSE [18:41:47.187] Asynchronous evaluation: TRUE [18:41:47.187] Local evaluation: TRUE [18:41:47.187] Environment: R_GlobalEnv [18:41:47.187] Capture standard output: TRUE [18:41:47.187] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.187] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.187] Packages: [18:41:47.187] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.187] Resolved: TRUE [18:41:47.187] Value: [18:41:47.187] Conditions captured: [18:41:47.187] Early signaling: FALSE [18:41:47.187] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.187] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.203] Chunk #2 of 2 ... DONE [18:41:47.203] Launching 2 futures (chunks) ... DONE [18:41:47.203] Resolving 2 futures (chunks) ... [18:41:47.203] resolve() on list ... [18:41:47.203] recursive: 0 [18:41:47.204] length: 2 [18:41:47.204] [18:41:47.204] Future #1 [18:41:47.205] result() for ClusterFuture ... [18:41:47.205] - result already collected: FutureResult [18:41:47.205] result() for ClusterFuture ... done [18:41:47.205] result() for ClusterFuture ... [18:41:47.205] - result already collected: FutureResult [18:41:47.205] result() for ClusterFuture ... done [18:41:47.206] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:47.206] - nx: 2 [18:41:47.206] - relay: TRUE [18:41:47.206] - stdout: TRUE [18:41:47.207] - signal: TRUE [18:41:47.207] - resignal: FALSE [18:41:47.207] - force: TRUE [18:41:47.207] - relayed: [n=2] FALSE, FALSE [18:41:47.207] - queued futures: [n=2] FALSE, FALSE [18:41:47.208] - until=1 [18:41:47.208] - relaying element #1 [18:41:47.208] result() for ClusterFuture ... [18:41:47.209] - result already collected: FutureResult [18:41:47.209] result() for ClusterFuture ... done [18:41:47.209] result() for ClusterFuture ... [18:41:47.209] - result already collected: FutureResult [18:41:47.210] result() for ClusterFuture ... done [18:41:47.210] result() for ClusterFuture ... [18:41:47.210] - result already collected: FutureResult [18:41:47.211] result() for ClusterFuture ... done [18:41:47.211] result() for ClusterFuture ... [18:41:47.211] - result already collected: FutureResult [18:41:47.211] result() for ClusterFuture ... done [18:41:47.212] - relayed: [n=2] TRUE, FALSE [18:41:47.212] - queued futures: [n=2] TRUE, FALSE [18:41:47.212] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:47.212] length: 1 (resolved future 1) [18:41:47.213] Future #2 [18:41:47.213] result() for ClusterFuture ... [18:41:47.213] - result already collected: FutureResult [18:41:47.213] result() for ClusterFuture ... done [18:41:47.214] result() for ClusterFuture ... [18:41:47.214] - result already collected: FutureResult [18:41:47.214] result() for ClusterFuture ... done [18:41:47.215] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:47.215] - nx: 2 [18:41:47.215] - relay: TRUE [18:41:47.215] - stdout: TRUE [18:41:47.216] - signal: TRUE [18:41:47.216] - resignal: FALSE [18:41:47.216] - force: TRUE [18:41:47.216] - relayed: [n=2] TRUE, FALSE [18:41:47.216] - queued futures: [n=2] TRUE, FALSE [18:41:47.217] - until=2 [18:41:47.217] - relaying element #2 [18:41:47.217] result() for ClusterFuture ... [18:41:47.218] - result already collected: FutureResult [18:41:47.218] result() for ClusterFuture ... done [18:41:47.218] result() for ClusterFuture ... [18:41:47.218] - result already collected: FutureResult [18:41:47.219] result() for ClusterFuture ... done [18:41:47.219] result() for ClusterFuture ... [18:41:47.219] - result already collected: FutureResult [18:41:47.219] result() for ClusterFuture ... done [18:41:47.220] result() for ClusterFuture ... [18:41:47.220] - result already collected: FutureResult [18:41:47.220] result() for ClusterFuture ... done [18:41:47.220] - relayed: [n=2] TRUE, TRUE [18:41:47.221] - queued futures: [n=2] TRUE, TRUE [18:41:47.221] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:47.221] length: 0 (resolved future 2) [18:41:47.221] Relaying remaining futures [18:41:47.222] signalConditionsASAP(NULL, pos=0) ... [18:41:47.222] - nx: 2 [18:41:47.222] - relay: TRUE [18:41:47.222] - stdout: TRUE [18:41:47.223] - signal: TRUE [18:41:47.223] - resignal: FALSE [18:41:47.223] - force: TRUE [18:41:47.223] - relayed: [n=2] TRUE, TRUE [18:41:47.224] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:47.224] - relayed: [n=2] TRUE, TRUE [18:41:47.224] - queued futures: [n=2] TRUE, TRUE [18:41:47.224] signalConditionsASAP(NULL, pos=0) ... done [18:41:47.225] resolve() on list ... DONE [18:41:47.225] result() for ClusterFuture ... [18:41:47.225] - result already collected: FutureResult [18:41:47.225] result() for ClusterFuture ... done [18:41:47.226] result() for ClusterFuture ... [18:41:47.226] - result already collected: FutureResult [18:41:47.226] result() for ClusterFuture ... done [18:41:47.227] result() for ClusterFuture ... [18:41:47.227] - result already collected: FutureResult [18:41:47.227] result() for ClusterFuture ... done [18:41:47.227] result() for ClusterFuture ... [18:41:47.228] - result already collected: FutureResult [18:41:47.228] result() for ClusterFuture ... done [18:41:47.228] - Number of value chunks collected: 2 [18:41:47.228] Resolving 2 futures (chunks) ... DONE [18:41:47.229] Reducing values from 2 chunks ... [18:41:47.229] - Number of values collected after concatenation: 3 [18:41:47.229] - Number of values expected: 3 [18:41:47.229] Reducing values from 2 chunks ... DONE [18:41:47.230] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y1:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y2:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... [18:41:47.242] future_lapply() ... [18:41:47.248] Number of chunks: 2 [18:41:47.248] getGlobalsAndPackagesXApply() ... [18:41:47.248] - future.globals: TRUE [18:41:47.248] getGlobalsAndPackages() ... [18:41:47.249] Searching for globals... [18:41:47.251] - globals found: [1] 'FUN' [18:41:47.251] Searching for globals ... DONE [18:41:47.251] Resolving globals: FALSE [18:41:47.256] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:47.256] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:47.257] - globals: [1] 'FUN' [18:41:47.257] [18:41:47.257] getGlobalsAndPackages() ... DONE [18:41:47.258] - globals found/used: [n=1] 'FUN' [18:41:47.258] - needed namespaces: [n=0] [18:41:47.258] Finding globals ... DONE [18:41:47.258] - use_args: TRUE [18:41:47.259] - Getting '...' globals ... [18:41:47.259] resolve() on list ... [18:41:47.260] recursive: 0 [18:41:47.260] length: 1 [18:41:47.260] elements: '...' [18:41:47.260] length: 0 (resolved future 1) [18:41:47.261] resolve() on list ... DONE [18:41:47.261] - '...' content: [n=0] [18:41:47.261] List of 1 [18:41:47.261] $ ...: list() [18:41:47.261] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.261] - attr(*, "where")=List of 1 [18:41:47.261] ..$ ...: [18:41:47.261] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.261] - attr(*, "resolved")= logi TRUE [18:41:47.261] - attr(*, "total_size")= num NA [18:41:47.266] - Getting '...' globals ... DONE [18:41:47.266] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:47.266] List of 2 [18:41:47.266] $ ...future.FUN:function (x) [18:41:47.266] $ ... : list() [18:41:47.266] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.266] - attr(*, "where")=List of 2 [18:41:47.266] ..$ ...future.FUN: [18:41:47.266] ..$ ... : [18:41:47.266] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.266] - attr(*, "resolved")= logi FALSE [18:41:47.266] - attr(*, "total_size")= int 4876 [18:41:47.271] Packages to be attached in all futures: [n=0] [18:41:47.272] getGlobalsAndPackagesXApply() ... DONE [18:41:47.272] Number of futures (= number of chunks): 2 [18:41:47.272] Launching 2 futures (chunks) ... [18:41:47.273] Chunk #1 of 2 ... [18:41:47.273] - Finding globals in 'X' for chunk #1 ... [18:41:47.273] getGlobalsAndPackages() ... [18:41:47.273] Searching for globals... [18:41:47.274] [18:41:47.274] Searching for globals ... DONE [18:41:47.274] - globals: [0] [18:41:47.275] getGlobalsAndPackages() ... DONE [18:41:47.275] + additional globals found: [n=0] [18:41:47.275] + additional namespaces needed: [n=0] [18:41:47.275] - Finding globals in 'X' for chunk #1 ... DONE [18:41:47.276] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.276] - seeds: [18:41:47.276] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.276] getGlobalsAndPackages() ... [18:41:47.277] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.277] Resolving globals: FALSE [18:41:47.277] Tweak future expression to call with '...' arguments ... [18:41:47.277] { [18:41:47.277] do.call(function(...) { [18:41:47.277] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.277] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.277] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.277] on.exit(options(oopts), add = TRUE) [18:41:47.277] } [18:41:47.277] { [18:41:47.277] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.277] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.277] ...future.FUN(...future.X_jj, ...) [18:41:47.277] }) [18:41:47.277] } [18:41:47.277] }, args = future.call.arguments) [18:41:47.277] } [18:41:47.278] Tweak future expression to call with '...' arguments ... DONE [18:41:47.279] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.279] [18:41:47.279] getGlobalsAndPackages() ... DONE [18:41:47.280] run() for 'Future' ... [18:41:47.280] - state: 'created' [18:41:47.281] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.301] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.301] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.302] - Field: 'node' [18:41:47.302] - Field: 'label' [18:41:47.302] - Field: 'local' [18:41:47.303] - Field: 'owner' [18:41:47.303] - Field: 'envir' [18:41:47.303] - Field: 'workers' [18:41:47.303] - Field: 'packages' [18:41:47.303] - Field: 'gc' [18:41:47.304] - Field: 'conditions' [18:41:47.304] - Field: 'persistent' [18:41:47.304] - Field: 'expr' [18:41:47.304] - Field: 'uuid' [18:41:47.304] - Field: 'seed' [18:41:47.305] - Field: 'version' [18:41:47.305] - Field: 'result' [18:41:47.305] - Field: 'asynchronous' [18:41:47.305] - Field: 'calls' [18:41:47.305] - Field: 'globals' [18:41:47.306] - Field: 'stdout' [18:41:47.306] - Field: 'earlySignal' [18:41:47.306] - Field: 'lazy' [18:41:47.306] - Field: 'state' [18:41:47.306] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.306] - Launch lazy future ... [18:41:47.307] Packages needed by the future expression (n = 0): [18:41:47.307] Packages needed by future strategies (n = 0): [18:41:47.308] { [18:41:47.308] { [18:41:47.308] { [18:41:47.308] ...future.startTime <- base::Sys.time() [18:41:47.308] { [18:41:47.308] { [18:41:47.308] { [18:41:47.308] { [18:41:47.308] base::local({ [18:41:47.308] has_future <- base::requireNamespace("future", [18:41:47.308] quietly = TRUE) [18:41:47.308] if (has_future) { [18:41:47.308] ns <- base::getNamespace("future") [18:41:47.308] version <- ns[[".package"]][["version"]] [18:41:47.308] if (is.null(version)) [18:41:47.308] version <- utils::packageVersion("future") [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] version <- NULL [18:41:47.308] } [18:41:47.308] if (!has_future || version < "1.8.0") { [18:41:47.308] info <- base::c(r_version = base::gsub("R version ", [18:41:47.308] "", base::R.version$version.string), [18:41:47.308] platform = base::sprintf("%s (%s-bit)", [18:41:47.308] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.308] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.308] "release", "version")], collapse = " "), [18:41:47.308] hostname = base::Sys.info()[["nodename"]]) [18:41:47.308] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.308] info) [18:41:47.308] info <- base::paste(info, collapse = "; ") [18:41:47.308] if (!has_future) { [18:41:47.308] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.308] info) [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.308] info, version) [18:41:47.308] } [18:41:47.308] base::stop(msg) [18:41:47.308] } [18:41:47.308] }) [18:41:47.308] } [18:41:47.308] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.308] base::options(mc.cores = 1L) [18:41:47.308] } [18:41:47.308] ...future.strategy.old <- future::plan("list") [18:41:47.308] options(future.plan = NULL) [18:41:47.308] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.308] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.308] } [18:41:47.308] ...future.workdir <- getwd() [18:41:47.308] } [18:41:47.308] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.308] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.308] } [18:41:47.308] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.308] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.308] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.308] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.308] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.308] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.308] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.308] base::names(...future.oldOptions)) [18:41:47.308] } [18:41:47.308] if (FALSE) { [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] if (TRUE) { [18:41:47.308] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.308] open = "w") [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.308] windows = "NUL", "/dev/null"), open = "w") [18:41:47.308] } [18:41:47.308] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.308] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.308] base::sink(type = "output", split = FALSE) [18:41:47.308] base::close(...future.stdout) [18:41:47.308] }, add = TRUE) [18:41:47.308] } [18:41:47.308] ...future.frame <- base::sys.nframe() [18:41:47.308] ...future.conditions <- base::list() [18:41:47.308] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.308] if (FALSE) { [18:41:47.308] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.308] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.308] } [18:41:47.308] ...future.result <- base::tryCatch({ [18:41:47.308] base::withCallingHandlers({ [18:41:47.308] ...future.value <- base::withVisible(base::local({ [18:41:47.308] ...future.makeSendCondition <- base::local({ [18:41:47.308] sendCondition <- NULL [18:41:47.308] function(frame = 1L) { [18:41:47.308] if (is.function(sendCondition)) [18:41:47.308] return(sendCondition) [18:41:47.308] ns <- getNamespace("parallel") [18:41:47.308] if (exists("sendData", mode = "function", [18:41:47.308] envir = ns)) { [18:41:47.308] parallel_sendData <- get("sendData", mode = "function", [18:41:47.308] envir = ns) [18:41:47.308] envir <- sys.frame(frame) [18:41:47.308] master <- NULL [18:41:47.308] while (!identical(envir, .GlobalEnv) && [18:41:47.308] !identical(envir, emptyenv())) { [18:41:47.308] if (exists("master", mode = "list", envir = envir, [18:41:47.308] inherits = FALSE)) { [18:41:47.308] master <- get("master", mode = "list", [18:41:47.308] envir = envir, inherits = FALSE) [18:41:47.308] if (inherits(master, c("SOCKnode", [18:41:47.308] "SOCK0node"))) { [18:41:47.308] sendCondition <<- function(cond) { [18:41:47.308] data <- list(type = "VALUE", value = cond, [18:41:47.308] success = TRUE) [18:41:47.308] parallel_sendData(master, data) [18:41:47.308] } [18:41:47.308] return(sendCondition) [18:41:47.308] } [18:41:47.308] } [18:41:47.308] frame <- frame + 1L [18:41:47.308] envir <- sys.frame(frame) [18:41:47.308] } [18:41:47.308] } [18:41:47.308] sendCondition <<- function(cond) NULL [18:41:47.308] } [18:41:47.308] }) [18:41:47.308] withCallingHandlers({ [18:41:47.308] { [18:41:47.308] do.call(function(...) { [18:41:47.308] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.308] if (!identical(...future.globals.maxSize.org, [18:41:47.308] ...future.globals.maxSize)) { [18:41:47.308] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.308] on.exit(options(oopts), add = TRUE) [18:41:47.308] } [18:41:47.308] { [18:41:47.308] lapply(seq_along(...future.elements_ii), [18:41:47.308] FUN = function(jj) { [18:41:47.308] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.308] ...future.FUN(...future.X_jj, ...) [18:41:47.308] }) [18:41:47.308] } [18:41:47.308] }, args = future.call.arguments) [18:41:47.308] } [18:41:47.308] }, immediateCondition = function(cond) { [18:41:47.308] sendCondition <- ...future.makeSendCondition() [18:41:47.308] sendCondition(cond) [18:41:47.308] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.308] { [18:41:47.308] inherits <- base::inherits [18:41:47.308] invokeRestart <- base::invokeRestart [18:41:47.308] is.null <- base::is.null [18:41:47.308] muffled <- FALSE [18:41:47.308] if (inherits(cond, "message")) { [18:41:47.308] muffled <- grepl(pattern, "muffleMessage") [18:41:47.308] if (muffled) [18:41:47.308] invokeRestart("muffleMessage") [18:41:47.308] } [18:41:47.308] else if (inherits(cond, "warning")) { [18:41:47.308] muffled <- grepl(pattern, "muffleWarning") [18:41:47.308] if (muffled) [18:41:47.308] invokeRestart("muffleWarning") [18:41:47.308] } [18:41:47.308] else if (inherits(cond, "condition")) { [18:41:47.308] if (!is.null(pattern)) { [18:41:47.308] computeRestarts <- base::computeRestarts [18:41:47.308] grepl <- base::grepl [18:41:47.308] restarts <- computeRestarts(cond) [18:41:47.308] for (restart in restarts) { [18:41:47.308] name <- restart$name [18:41:47.308] if (is.null(name)) [18:41:47.308] next [18:41:47.308] if (!grepl(pattern, name)) [18:41:47.308] next [18:41:47.308] invokeRestart(restart) [18:41:47.308] muffled <- TRUE [18:41:47.308] break [18:41:47.308] } [18:41:47.308] } [18:41:47.308] } [18:41:47.308] invisible(muffled) [18:41:47.308] } [18:41:47.308] muffleCondition(cond) [18:41:47.308] }) [18:41:47.308] })) [18:41:47.308] future::FutureResult(value = ...future.value$value, [18:41:47.308] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.308] ...future.rng), globalenv = if (FALSE) [18:41:47.308] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.308] ...future.globalenv.names)) [18:41:47.308] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.308] }, condition = base::local({ [18:41:47.308] c <- base::c [18:41:47.308] inherits <- base::inherits [18:41:47.308] invokeRestart <- base::invokeRestart [18:41:47.308] length <- base::length [18:41:47.308] list <- base::list [18:41:47.308] seq.int <- base::seq.int [18:41:47.308] signalCondition <- base::signalCondition [18:41:47.308] sys.calls <- base::sys.calls [18:41:47.308] `[[` <- base::`[[` [18:41:47.308] `+` <- base::`+` [18:41:47.308] `<<-` <- base::`<<-` [18:41:47.308] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.308] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.308] 3L)] [18:41:47.308] } [18:41:47.308] function(cond) { [18:41:47.308] is_error <- inherits(cond, "error") [18:41:47.308] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.308] NULL) [18:41:47.308] if (is_error) { [18:41:47.308] sessionInformation <- function() { [18:41:47.308] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.308] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.308] search = base::search(), system = base::Sys.info()) [18:41:47.308] } [18:41:47.308] ...future.conditions[[length(...future.conditions) + [18:41:47.308] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.308] cond$call), session = sessionInformation(), [18:41:47.308] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.308] signalCondition(cond) [18:41:47.308] } [18:41:47.308] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.308] "immediateCondition"))) { [18:41:47.308] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.308] ...future.conditions[[length(...future.conditions) + [18:41:47.308] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.308] if (TRUE && !signal) { [18:41:47.308] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.308] { [18:41:47.308] inherits <- base::inherits [18:41:47.308] invokeRestart <- base::invokeRestart [18:41:47.308] is.null <- base::is.null [18:41:47.308] muffled <- FALSE [18:41:47.308] if (inherits(cond, "message")) { [18:41:47.308] muffled <- grepl(pattern, "muffleMessage") [18:41:47.308] if (muffled) [18:41:47.308] invokeRestart("muffleMessage") [18:41:47.308] } [18:41:47.308] else if (inherits(cond, "warning")) { [18:41:47.308] muffled <- grepl(pattern, "muffleWarning") [18:41:47.308] if (muffled) [18:41:47.308] invokeRestart("muffleWarning") [18:41:47.308] } [18:41:47.308] else if (inherits(cond, "condition")) { [18:41:47.308] if (!is.null(pattern)) { [18:41:47.308] computeRestarts <- base::computeRestarts [18:41:47.308] grepl <- base::grepl [18:41:47.308] restarts <- computeRestarts(cond) [18:41:47.308] for (restart in restarts) { [18:41:47.308] name <- restart$name [18:41:47.308] if (is.null(name)) [18:41:47.308] next [18:41:47.308] if (!grepl(pattern, name)) [18:41:47.308] next [18:41:47.308] invokeRestart(restart) [18:41:47.308] muffled <- TRUE [18:41:47.308] break [18:41:47.308] } [18:41:47.308] } [18:41:47.308] } [18:41:47.308] invisible(muffled) [18:41:47.308] } [18:41:47.308] muffleCondition(cond, pattern = "^muffle") [18:41:47.308] } [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] if (TRUE) { [18:41:47.308] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.308] { [18:41:47.308] inherits <- base::inherits [18:41:47.308] invokeRestart <- base::invokeRestart [18:41:47.308] is.null <- base::is.null [18:41:47.308] muffled <- FALSE [18:41:47.308] if (inherits(cond, "message")) { [18:41:47.308] muffled <- grepl(pattern, "muffleMessage") [18:41:47.308] if (muffled) [18:41:47.308] invokeRestart("muffleMessage") [18:41:47.308] } [18:41:47.308] else if (inherits(cond, "warning")) { [18:41:47.308] muffled <- grepl(pattern, "muffleWarning") [18:41:47.308] if (muffled) [18:41:47.308] invokeRestart("muffleWarning") [18:41:47.308] } [18:41:47.308] else if (inherits(cond, "condition")) { [18:41:47.308] if (!is.null(pattern)) { [18:41:47.308] computeRestarts <- base::computeRestarts [18:41:47.308] grepl <- base::grepl [18:41:47.308] restarts <- computeRestarts(cond) [18:41:47.308] for (restart in restarts) { [18:41:47.308] name <- restart$name [18:41:47.308] if (is.null(name)) [18:41:47.308] next [18:41:47.308] if (!grepl(pattern, name)) [18:41:47.308] next [18:41:47.308] invokeRestart(restart) [18:41:47.308] muffled <- TRUE [18:41:47.308] break [18:41:47.308] } [18:41:47.308] } [18:41:47.308] } [18:41:47.308] invisible(muffled) [18:41:47.308] } [18:41:47.308] muffleCondition(cond, pattern = "^muffle") [18:41:47.308] } [18:41:47.308] } [18:41:47.308] } [18:41:47.308] })) [18:41:47.308] }, error = function(ex) { [18:41:47.308] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.308] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.308] ...future.rng), started = ...future.startTime, [18:41:47.308] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.308] version = "1.8"), class = "FutureResult") [18:41:47.308] }, finally = { [18:41:47.308] if (!identical(...future.workdir, getwd())) [18:41:47.308] setwd(...future.workdir) [18:41:47.308] { [18:41:47.308] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.308] ...future.oldOptions$nwarnings <- NULL [18:41:47.308] } [18:41:47.308] base::options(...future.oldOptions) [18:41:47.308] if (.Platform$OS.type == "windows") { [18:41:47.308] old_names <- names(...future.oldEnvVars) [18:41:47.308] envs <- base::Sys.getenv() [18:41:47.308] names <- names(envs) [18:41:47.308] common <- intersect(names, old_names) [18:41:47.308] added <- setdiff(names, old_names) [18:41:47.308] removed <- setdiff(old_names, names) [18:41:47.308] changed <- common[...future.oldEnvVars[common] != [18:41:47.308] envs[common]] [18:41:47.308] NAMES <- toupper(changed) [18:41:47.308] args <- list() [18:41:47.308] for (kk in seq_along(NAMES)) { [18:41:47.308] name <- changed[[kk]] [18:41:47.308] NAME <- NAMES[[kk]] [18:41:47.308] if (name != NAME && is.element(NAME, old_names)) [18:41:47.308] next [18:41:47.308] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.308] } [18:41:47.308] NAMES <- toupper(added) [18:41:47.308] for (kk in seq_along(NAMES)) { [18:41:47.308] name <- added[[kk]] [18:41:47.308] NAME <- NAMES[[kk]] [18:41:47.308] if (name != NAME && is.element(NAME, old_names)) [18:41:47.308] next [18:41:47.308] args[[name]] <- "" [18:41:47.308] } [18:41:47.308] NAMES <- toupper(removed) [18:41:47.308] for (kk in seq_along(NAMES)) { [18:41:47.308] name <- removed[[kk]] [18:41:47.308] NAME <- NAMES[[kk]] [18:41:47.308] if (name != NAME && is.element(NAME, old_names)) [18:41:47.308] next [18:41:47.308] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.308] } [18:41:47.308] if (length(args) > 0) [18:41:47.308] base::do.call(base::Sys.setenv, args = args) [18:41:47.308] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.308] } [18:41:47.308] { [18:41:47.308] if (base::length(...future.futureOptionsAdded) > [18:41:47.308] 0L) { [18:41:47.308] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.308] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.308] base::options(opts) [18:41:47.308] } [18:41:47.308] { [18:41:47.308] { [18:41:47.308] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.308] NULL [18:41:47.308] } [18:41:47.308] options(future.plan = NULL) [18:41:47.308] if (is.na(NA_character_)) [18:41:47.308] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.308] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.308] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.308] .init = FALSE) [18:41:47.308] } [18:41:47.308] } [18:41:47.308] } [18:41:47.308] }) [18:41:47.308] if (TRUE) { [18:41:47.308] base::sink(type = "output", split = FALSE) [18:41:47.308] if (TRUE) { [18:41:47.308] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.308] } [18:41:47.308] else { [18:41:47.308] ...future.result["stdout"] <- base::list(NULL) [18:41:47.308] } [18:41:47.308] base::close(...future.stdout) [18:41:47.308] ...future.stdout <- NULL [18:41:47.308] } [18:41:47.308] ...future.result$conditions <- ...future.conditions [18:41:47.308] ...future.result$finished <- base::Sys.time() [18:41:47.308] ...future.result [18:41:47.308] } [18:41:47.314] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:47.315] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:47.315] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:47.315] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.316] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.316] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:47.317] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:47.317] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.318] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.318] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.318] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.319] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:47.320] MultisessionFuture started [18:41:47.320] - Launch lazy future ... done [18:41:47.320] run() for 'MultisessionFuture' ... done [18:41:47.320] Created future: [18:41:47.334] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.334] - Validating connection of MultisessionFuture [18:41:47.335] - received message: FutureResult [18:41:47.335] - Received FutureResult [18:41:47.335] - Erased future from FutureRegistry [18:41:47.335] result() for ClusterFuture ... [18:41:47.335] - result already collected: FutureResult [18:41:47.336] result() for ClusterFuture ... done [18:41:47.336] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.320] MultisessionFuture: [18:41:47.320] Label: 'future_sapply-1' [18:41:47.320] Expression: [18:41:47.320] { [18:41:47.320] do.call(function(...) { [18:41:47.320] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.320] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.320] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.320] on.exit(options(oopts), add = TRUE) [18:41:47.320] } [18:41:47.320] { [18:41:47.320] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.320] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.320] ...future.FUN(...future.X_jj, ...) [18:41:47.320] }) [18:41:47.320] } [18:41:47.320] }, args = future.call.arguments) [18:41:47.320] } [18:41:47.320] Lazy evaluation: FALSE [18:41:47.320] Asynchronous evaluation: TRUE [18:41:47.320] Local evaluation: TRUE [18:41:47.320] Environment: R_GlobalEnv [18:41:47.320] Capture standard output: TRUE [18:41:47.320] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.320] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.320] Packages: [18:41:47.320] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.320] Resolved: TRUE [18:41:47.320] Value: [18:41:47.320] Conditions captured: [18:41:47.320] Early signaling: FALSE [18:41:47.320] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.320] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.336] Chunk #1 of 2 ... DONE [18:41:47.336] Chunk #2 of 2 ... [18:41:47.337] - Finding globals in 'X' for chunk #2 ... [18:41:47.337] getGlobalsAndPackages() ... [18:41:47.337] Searching for globals... [18:41:47.337] [18:41:47.337] Searching for globals ... DONE [18:41:47.338] - globals: [0] [18:41:47.338] getGlobalsAndPackages() ... DONE [18:41:47.338] + additional globals found: [n=0] [18:41:47.338] + additional namespaces needed: [n=0] [18:41:47.338] - Finding globals in 'X' for chunk #2 ... DONE [18:41:47.338] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.339] - seeds: [18:41:47.339] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.339] getGlobalsAndPackages() ... [18:41:47.339] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.339] Resolving globals: FALSE [18:41:47.339] Tweak future expression to call with '...' arguments ... [18:41:47.340] { [18:41:47.340] do.call(function(...) { [18:41:47.340] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.340] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.340] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.340] on.exit(options(oopts), add = TRUE) [18:41:47.340] } [18:41:47.340] { [18:41:47.340] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.340] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.340] ...future.FUN(...future.X_jj, ...) [18:41:47.340] }) [18:41:47.340] } [18:41:47.340] }, args = future.call.arguments) [18:41:47.340] } [18:41:47.340] Tweak future expression to call with '...' arguments ... DONE [18:41:47.341] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.341] [18:41:47.341] getGlobalsAndPackages() ... DONE [18:41:47.341] run() for 'Future' ... [18:41:47.342] - state: 'created' [18:41:47.342] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.358] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.358] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.359] - Field: 'node' [18:41:47.359] - Field: 'label' [18:41:47.359] - Field: 'local' [18:41:47.359] - Field: 'owner' [18:41:47.359] - Field: 'envir' [18:41:47.359] - Field: 'workers' [18:41:47.360] - Field: 'packages' [18:41:47.360] - Field: 'gc' [18:41:47.360] - Field: 'conditions' [18:41:47.360] - Field: 'persistent' [18:41:47.360] - Field: 'expr' [18:41:47.361] - Field: 'uuid' [18:41:47.361] - Field: 'seed' [18:41:47.361] - Field: 'version' [18:41:47.361] - Field: 'result' [18:41:47.361] - Field: 'asynchronous' [18:41:47.361] - Field: 'calls' [18:41:47.362] - Field: 'globals' [18:41:47.362] - Field: 'stdout' [18:41:47.362] - Field: 'earlySignal' [18:41:47.362] - Field: 'lazy' [18:41:47.362] - Field: 'state' [18:41:47.362] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.363] - Launch lazy future ... [18:41:47.363] Packages needed by the future expression (n = 0): [18:41:47.363] Packages needed by future strategies (n = 0): [18:41:47.364] { [18:41:47.364] { [18:41:47.364] { [18:41:47.364] ...future.startTime <- base::Sys.time() [18:41:47.364] { [18:41:47.364] { [18:41:47.364] { [18:41:47.364] { [18:41:47.364] base::local({ [18:41:47.364] has_future <- base::requireNamespace("future", [18:41:47.364] quietly = TRUE) [18:41:47.364] if (has_future) { [18:41:47.364] ns <- base::getNamespace("future") [18:41:47.364] version <- ns[[".package"]][["version"]] [18:41:47.364] if (is.null(version)) [18:41:47.364] version <- utils::packageVersion("future") [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] version <- NULL [18:41:47.364] } [18:41:47.364] if (!has_future || version < "1.8.0") { [18:41:47.364] info <- base::c(r_version = base::gsub("R version ", [18:41:47.364] "", base::R.version$version.string), [18:41:47.364] platform = base::sprintf("%s (%s-bit)", [18:41:47.364] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.364] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.364] "release", "version")], collapse = " "), [18:41:47.364] hostname = base::Sys.info()[["nodename"]]) [18:41:47.364] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.364] info) [18:41:47.364] info <- base::paste(info, collapse = "; ") [18:41:47.364] if (!has_future) { [18:41:47.364] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.364] info) [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.364] info, version) [18:41:47.364] } [18:41:47.364] base::stop(msg) [18:41:47.364] } [18:41:47.364] }) [18:41:47.364] } [18:41:47.364] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.364] base::options(mc.cores = 1L) [18:41:47.364] } [18:41:47.364] ...future.strategy.old <- future::plan("list") [18:41:47.364] options(future.plan = NULL) [18:41:47.364] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.364] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.364] } [18:41:47.364] ...future.workdir <- getwd() [18:41:47.364] } [18:41:47.364] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.364] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.364] } [18:41:47.364] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.364] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.364] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.364] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.364] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.364] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.364] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.364] base::names(...future.oldOptions)) [18:41:47.364] } [18:41:47.364] if (FALSE) { [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] if (TRUE) { [18:41:47.364] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.364] open = "w") [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.364] windows = "NUL", "/dev/null"), open = "w") [18:41:47.364] } [18:41:47.364] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.364] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.364] base::sink(type = "output", split = FALSE) [18:41:47.364] base::close(...future.stdout) [18:41:47.364] }, add = TRUE) [18:41:47.364] } [18:41:47.364] ...future.frame <- base::sys.nframe() [18:41:47.364] ...future.conditions <- base::list() [18:41:47.364] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.364] if (FALSE) { [18:41:47.364] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.364] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.364] } [18:41:47.364] ...future.result <- base::tryCatch({ [18:41:47.364] base::withCallingHandlers({ [18:41:47.364] ...future.value <- base::withVisible(base::local({ [18:41:47.364] ...future.makeSendCondition <- base::local({ [18:41:47.364] sendCondition <- NULL [18:41:47.364] function(frame = 1L) { [18:41:47.364] if (is.function(sendCondition)) [18:41:47.364] return(sendCondition) [18:41:47.364] ns <- getNamespace("parallel") [18:41:47.364] if (exists("sendData", mode = "function", [18:41:47.364] envir = ns)) { [18:41:47.364] parallel_sendData <- get("sendData", mode = "function", [18:41:47.364] envir = ns) [18:41:47.364] envir <- sys.frame(frame) [18:41:47.364] master <- NULL [18:41:47.364] while (!identical(envir, .GlobalEnv) && [18:41:47.364] !identical(envir, emptyenv())) { [18:41:47.364] if (exists("master", mode = "list", envir = envir, [18:41:47.364] inherits = FALSE)) { [18:41:47.364] master <- get("master", mode = "list", [18:41:47.364] envir = envir, inherits = FALSE) [18:41:47.364] if (inherits(master, c("SOCKnode", [18:41:47.364] "SOCK0node"))) { [18:41:47.364] sendCondition <<- function(cond) { [18:41:47.364] data <- list(type = "VALUE", value = cond, [18:41:47.364] success = TRUE) [18:41:47.364] parallel_sendData(master, data) [18:41:47.364] } [18:41:47.364] return(sendCondition) [18:41:47.364] } [18:41:47.364] } [18:41:47.364] frame <- frame + 1L [18:41:47.364] envir <- sys.frame(frame) [18:41:47.364] } [18:41:47.364] } [18:41:47.364] sendCondition <<- function(cond) NULL [18:41:47.364] } [18:41:47.364] }) [18:41:47.364] withCallingHandlers({ [18:41:47.364] { [18:41:47.364] do.call(function(...) { [18:41:47.364] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.364] if (!identical(...future.globals.maxSize.org, [18:41:47.364] ...future.globals.maxSize)) { [18:41:47.364] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.364] on.exit(options(oopts), add = TRUE) [18:41:47.364] } [18:41:47.364] { [18:41:47.364] lapply(seq_along(...future.elements_ii), [18:41:47.364] FUN = function(jj) { [18:41:47.364] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.364] ...future.FUN(...future.X_jj, ...) [18:41:47.364] }) [18:41:47.364] } [18:41:47.364] }, args = future.call.arguments) [18:41:47.364] } [18:41:47.364] }, immediateCondition = function(cond) { [18:41:47.364] sendCondition <- ...future.makeSendCondition() [18:41:47.364] sendCondition(cond) [18:41:47.364] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.364] { [18:41:47.364] inherits <- base::inherits [18:41:47.364] invokeRestart <- base::invokeRestart [18:41:47.364] is.null <- base::is.null [18:41:47.364] muffled <- FALSE [18:41:47.364] if (inherits(cond, "message")) { [18:41:47.364] muffled <- grepl(pattern, "muffleMessage") [18:41:47.364] if (muffled) [18:41:47.364] invokeRestart("muffleMessage") [18:41:47.364] } [18:41:47.364] else if (inherits(cond, "warning")) { [18:41:47.364] muffled <- grepl(pattern, "muffleWarning") [18:41:47.364] if (muffled) [18:41:47.364] invokeRestart("muffleWarning") [18:41:47.364] } [18:41:47.364] else if (inherits(cond, "condition")) { [18:41:47.364] if (!is.null(pattern)) { [18:41:47.364] computeRestarts <- base::computeRestarts [18:41:47.364] grepl <- base::grepl [18:41:47.364] restarts <- computeRestarts(cond) [18:41:47.364] for (restart in restarts) { [18:41:47.364] name <- restart$name [18:41:47.364] if (is.null(name)) [18:41:47.364] next [18:41:47.364] if (!grepl(pattern, name)) [18:41:47.364] next [18:41:47.364] invokeRestart(restart) [18:41:47.364] muffled <- TRUE [18:41:47.364] break [18:41:47.364] } [18:41:47.364] } [18:41:47.364] } [18:41:47.364] invisible(muffled) [18:41:47.364] } [18:41:47.364] muffleCondition(cond) [18:41:47.364] }) [18:41:47.364] })) [18:41:47.364] future::FutureResult(value = ...future.value$value, [18:41:47.364] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.364] ...future.rng), globalenv = if (FALSE) [18:41:47.364] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.364] ...future.globalenv.names)) [18:41:47.364] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.364] }, condition = base::local({ [18:41:47.364] c <- base::c [18:41:47.364] inherits <- base::inherits [18:41:47.364] invokeRestart <- base::invokeRestart [18:41:47.364] length <- base::length [18:41:47.364] list <- base::list [18:41:47.364] seq.int <- base::seq.int [18:41:47.364] signalCondition <- base::signalCondition [18:41:47.364] sys.calls <- base::sys.calls [18:41:47.364] `[[` <- base::`[[` [18:41:47.364] `+` <- base::`+` [18:41:47.364] `<<-` <- base::`<<-` [18:41:47.364] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.364] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.364] 3L)] [18:41:47.364] } [18:41:47.364] function(cond) { [18:41:47.364] is_error <- inherits(cond, "error") [18:41:47.364] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.364] NULL) [18:41:47.364] if (is_error) { [18:41:47.364] sessionInformation <- function() { [18:41:47.364] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.364] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.364] search = base::search(), system = base::Sys.info()) [18:41:47.364] } [18:41:47.364] ...future.conditions[[length(...future.conditions) + [18:41:47.364] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.364] cond$call), session = sessionInformation(), [18:41:47.364] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.364] signalCondition(cond) [18:41:47.364] } [18:41:47.364] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.364] "immediateCondition"))) { [18:41:47.364] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.364] ...future.conditions[[length(...future.conditions) + [18:41:47.364] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.364] if (TRUE && !signal) { [18:41:47.364] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.364] { [18:41:47.364] inherits <- base::inherits [18:41:47.364] invokeRestart <- base::invokeRestart [18:41:47.364] is.null <- base::is.null [18:41:47.364] muffled <- FALSE [18:41:47.364] if (inherits(cond, "message")) { [18:41:47.364] muffled <- grepl(pattern, "muffleMessage") [18:41:47.364] if (muffled) [18:41:47.364] invokeRestart("muffleMessage") [18:41:47.364] } [18:41:47.364] else if (inherits(cond, "warning")) { [18:41:47.364] muffled <- grepl(pattern, "muffleWarning") [18:41:47.364] if (muffled) [18:41:47.364] invokeRestart("muffleWarning") [18:41:47.364] } [18:41:47.364] else if (inherits(cond, "condition")) { [18:41:47.364] if (!is.null(pattern)) { [18:41:47.364] computeRestarts <- base::computeRestarts [18:41:47.364] grepl <- base::grepl [18:41:47.364] restarts <- computeRestarts(cond) [18:41:47.364] for (restart in restarts) { [18:41:47.364] name <- restart$name [18:41:47.364] if (is.null(name)) [18:41:47.364] next [18:41:47.364] if (!grepl(pattern, name)) [18:41:47.364] next [18:41:47.364] invokeRestart(restart) [18:41:47.364] muffled <- TRUE [18:41:47.364] break [18:41:47.364] } [18:41:47.364] } [18:41:47.364] } [18:41:47.364] invisible(muffled) [18:41:47.364] } [18:41:47.364] muffleCondition(cond, pattern = "^muffle") [18:41:47.364] } [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] if (TRUE) { [18:41:47.364] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.364] { [18:41:47.364] inherits <- base::inherits [18:41:47.364] invokeRestart <- base::invokeRestart [18:41:47.364] is.null <- base::is.null [18:41:47.364] muffled <- FALSE [18:41:47.364] if (inherits(cond, "message")) { [18:41:47.364] muffled <- grepl(pattern, "muffleMessage") [18:41:47.364] if (muffled) [18:41:47.364] invokeRestart("muffleMessage") [18:41:47.364] } [18:41:47.364] else if (inherits(cond, "warning")) { [18:41:47.364] muffled <- grepl(pattern, "muffleWarning") [18:41:47.364] if (muffled) [18:41:47.364] invokeRestart("muffleWarning") [18:41:47.364] } [18:41:47.364] else if (inherits(cond, "condition")) { [18:41:47.364] if (!is.null(pattern)) { [18:41:47.364] computeRestarts <- base::computeRestarts [18:41:47.364] grepl <- base::grepl [18:41:47.364] restarts <- computeRestarts(cond) [18:41:47.364] for (restart in restarts) { [18:41:47.364] name <- restart$name [18:41:47.364] if (is.null(name)) [18:41:47.364] next [18:41:47.364] if (!grepl(pattern, name)) [18:41:47.364] next [18:41:47.364] invokeRestart(restart) [18:41:47.364] muffled <- TRUE [18:41:47.364] break [18:41:47.364] } [18:41:47.364] } [18:41:47.364] } [18:41:47.364] invisible(muffled) [18:41:47.364] } [18:41:47.364] muffleCondition(cond, pattern = "^muffle") [18:41:47.364] } [18:41:47.364] } [18:41:47.364] } [18:41:47.364] })) [18:41:47.364] }, error = function(ex) { [18:41:47.364] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.364] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.364] ...future.rng), started = ...future.startTime, [18:41:47.364] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.364] version = "1.8"), class = "FutureResult") [18:41:47.364] }, finally = { [18:41:47.364] if (!identical(...future.workdir, getwd())) [18:41:47.364] setwd(...future.workdir) [18:41:47.364] { [18:41:47.364] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.364] ...future.oldOptions$nwarnings <- NULL [18:41:47.364] } [18:41:47.364] base::options(...future.oldOptions) [18:41:47.364] if (.Platform$OS.type == "windows") { [18:41:47.364] old_names <- names(...future.oldEnvVars) [18:41:47.364] envs <- base::Sys.getenv() [18:41:47.364] names <- names(envs) [18:41:47.364] common <- intersect(names, old_names) [18:41:47.364] added <- setdiff(names, old_names) [18:41:47.364] removed <- setdiff(old_names, names) [18:41:47.364] changed <- common[...future.oldEnvVars[common] != [18:41:47.364] envs[common]] [18:41:47.364] NAMES <- toupper(changed) [18:41:47.364] args <- list() [18:41:47.364] for (kk in seq_along(NAMES)) { [18:41:47.364] name <- changed[[kk]] [18:41:47.364] NAME <- NAMES[[kk]] [18:41:47.364] if (name != NAME && is.element(NAME, old_names)) [18:41:47.364] next [18:41:47.364] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.364] } [18:41:47.364] NAMES <- toupper(added) [18:41:47.364] for (kk in seq_along(NAMES)) { [18:41:47.364] name <- added[[kk]] [18:41:47.364] NAME <- NAMES[[kk]] [18:41:47.364] if (name != NAME && is.element(NAME, old_names)) [18:41:47.364] next [18:41:47.364] args[[name]] <- "" [18:41:47.364] } [18:41:47.364] NAMES <- toupper(removed) [18:41:47.364] for (kk in seq_along(NAMES)) { [18:41:47.364] name <- removed[[kk]] [18:41:47.364] NAME <- NAMES[[kk]] [18:41:47.364] if (name != NAME && is.element(NAME, old_names)) [18:41:47.364] next [18:41:47.364] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.364] } [18:41:47.364] if (length(args) > 0) [18:41:47.364] base::do.call(base::Sys.setenv, args = args) [18:41:47.364] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.364] } [18:41:47.364] { [18:41:47.364] if (base::length(...future.futureOptionsAdded) > [18:41:47.364] 0L) { [18:41:47.364] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.364] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.364] base::options(opts) [18:41:47.364] } [18:41:47.364] { [18:41:47.364] { [18:41:47.364] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.364] NULL [18:41:47.364] } [18:41:47.364] options(future.plan = NULL) [18:41:47.364] if (is.na(NA_character_)) [18:41:47.364] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.364] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.364] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.364] .init = FALSE) [18:41:47.364] } [18:41:47.364] } [18:41:47.364] } [18:41:47.364] }) [18:41:47.364] if (TRUE) { [18:41:47.364] base::sink(type = "output", split = FALSE) [18:41:47.364] if (TRUE) { [18:41:47.364] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.364] } [18:41:47.364] else { [18:41:47.364] ...future.result["stdout"] <- base::list(NULL) [18:41:47.364] } [18:41:47.364] base::close(...future.stdout) [18:41:47.364] ...future.stdout <- NULL [18:41:47.364] } [18:41:47.364] ...future.result$conditions <- ...future.conditions [18:41:47.364] ...future.result$finished <- base::Sys.time() [18:41:47.364] ...future.result [18:41:47.364] } [18:41:47.370] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:47.370] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:47.370] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:47.371] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.371] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.371] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.372] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.372] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.372] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.372] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.373] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.373] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:47.374] MultisessionFuture started [18:41:47.374] - Launch lazy future ... done [18:41:47.374] run() for 'MultisessionFuture' ... done [18:41:47.374] Created future: [18:41:47.388] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.388] - Validating connection of MultisessionFuture [18:41:47.388] - received message: FutureResult [18:41:47.388] - Received FutureResult [18:41:47.389] - Erased future from FutureRegistry [18:41:47.389] result() for ClusterFuture ... [18:41:47.389] - result already collected: FutureResult [18:41:47.389] result() for ClusterFuture ... done [18:41:47.389] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.374] MultisessionFuture: [18:41:47.374] Label: 'future_sapply-2' [18:41:47.374] Expression: [18:41:47.374] { [18:41:47.374] do.call(function(...) { [18:41:47.374] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.374] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.374] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.374] on.exit(options(oopts), add = TRUE) [18:41:47.374] } [18:41:47.374] { [18:41:47.374] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.374] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.374] ...future.FUN(...future.X_jj, ...) [18:41:47.374] }) [18:41:47.374] } [18:41:47.374] }, args = future.call.arguments) [18:41:47.374] } [18:41:47.374] Lazy evaluation: FALSE [18:41:47.374] Asynchronous evaluation: TRUE [18:41:47.374] Local evaluation: TRUE [18:41:47.374] Environment: R_GlobalEnv [18:41:47.374] Capture standard output: TRUE [18:41:47.374] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.374] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.374] Packages: [18:41:47.374] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.374] Resolved: TRUE [18:41:47.374] Value: [18:41:47.374] Conditions captured: [18:41:47.374] Early signaling: FALSE [18:41:47.374] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.374] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.390] Chunk #2 of 2 ... DONE [18:41:47.390] Launching 2 futures (chunks) ... DONE [18:41:47.390] Resolving 2 futures (chunks) ... [18:41:47.390] resolve() on list ... [18:41:47.390] recursive: 0 [18:41:47.391] length: 2 [18:41:47.391] [18:41:47.391] Future #1 [18:41:47.391] result() for ClusterFuture ... [18:41:47.391] - result already collected: FutureResult [18:41:47.391] result() for ClusterFuture ... done [18:41:47.391] result() for ClusterFuture ... [18:41:47.392] - result already collected: FutureResult [18:41:47.392] result() for ClusterFuture ... done [18:41:47.392] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:47.392] - nx: 2 [18:41:47.392] - relay: TRUE [18:41:47.392] - stdout: TRUE [18:41:47.393] - signal: TRUE [18:41:47.393] - resignal: FALSE [18:41:47.393] - force: TRUE [18:41:47.393] - relayed: [n=2] FALSE, FALSE [18:41:47.393] - queued futures: [n=2] FALSE, FALSE [18:41:47.393] - until=1 [18:41:47.394] - relaying element #1 [18:41:47.394] result() for ClusterFuture ... [18:41:47.394] - result already collected: FutureResult [18:41:47.394] result() for ClusterFuture ... done [18:41:47.394] result() for ClusterFuture ... [18:41:47.394] - result already collected: FutureResult [18:41:47.395] result() for ClusterFuture ... done [18:41:47.395] result() for ClusterFuture ... [18:41:47.395] - result already collected: FutureResult [18:41:47.395] result() for ClusterFuture ... done [18:41:47.395] result() for ClusterFuture ... [18:41:47.395] - result already collected: FutureResult [18:41:47.396] result() for ClusterFuture ... done [18:41:47.396] - relayed: [n=2] TRUE, FALSE [18:41:47.396] - queued futures: [n=2] TRUE, FALSE [18:41:47.396] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:47.396] length: 1 (resolved future 1) [18:41:47.396] Future #2 [18:41:47.397] result() for ClusterFuture ... [18:41:47.397] - result already collected: FutureResult [18:41:47.397] result() for ClusterFuture ... done [18:41:47.397] result() for ClusterFuture ... [18:41:47.397] - result already collected: FutureResult [18:41:47.397] result() for ClusterFuture ... done [18:41:47.398] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:47.398] - nx: 2 [18:41:47.398] - relay: TRUE [18:41:47.398] - stdout: TRUE [18:41:47.398] - signal: TRUE [18:41:47.398] - resignal: FALSE [18:41:47.398] - force: TRUE [18:41:47.399] - relayed: [n=2] TRUE, FALSE [18:41:47.399] - queued futures: [n=2] TRUE, FALSE [18:41:47.399] - until=2 [18:41:47.399] - relaying element #2 [18:41:47.399] result() for ClusterFuture ... [18:41:47.399] - result already collected: FutureResult [18:41:47.400] result() for ClusterFuture ... done [18:41:47.400] result() for ClusterFuture ... [18:41:47.400] - result already collected: FutureResult [18:41:47.400] result() for ClusterFuture ... done [18:41:47.400] result() for ClusterFuture ... [18:41:47.400] - result already collected: FutureResult [18:41:47.401] result() for ClusterFuture ... done [18:41:47.401] result() for ClusterFuture ... [18:41:47.401] - result already collected: FutureResult [18:41:47.401] result() for ClusterFuture ... done [18:41:47.401] - relayed: [n=2] TRUE, TRUE [18:41:47.401] - queued futures: [n=2] TRUE, TRUE [18:41:47.402] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:47.402] length: 0 (resolved future 2) [18:41:47.402] Relaying remaining futures [18:41:47.402] signalConditionsASAP(NULL, pos=0) ... [18:41:47.402] - nx: 2 [18:41:47.402] - relay: TRUE [18:41:47.402] - stdout: TRUE [18:41:47.403] - signal: TRUE [18:41:47.403] - resignal: FALSE [18:41:47.403] - force: TRUE [18:41:47.403] - relayed: [n=2] TRUE, TRUE [18:41:47.403] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:47.403] - relayed: [n=2] TRUE, TRUE [18:41:47.404] - queued futures: [n=2] TRUE, TRUE [18:41:47.404] signalConditionsASAP(NULL, pos=0) ... done [18:41:47.404] resolve() on list ... DONE [18:41:47.404] result() for ClusterFuture ... [18:41:47.404] - result already collected: FutureResult [18:41:47.404] result() for ClusterFuture ... done [18:41:47.405] result() for ClusterFuture ... [18:41:47.405] - result already collected: FutureResult [18:41:47.405] result() for ClusterFuture ... done [18:41:47.405] result() for ClusterFuture ... [18:41:47.405] - result already collected: FutureResult [18:41:47.405] result() for ClusterFuture ... done [18:41:47.406] result() for ClusterFuture ... [18:41:47.406] - result already collected: FutureResult [18:41:47.406] result() for ClusterFuture ... done [18:41:47.406] - Number of value chunks collected: 2 [18:41:47.406] Resolving 2 futures (chunks) ... DONE [18:41:47.406] Reducing values from 2 chunks ... [18:41:47.407] - Number of values collected after concatenation: 3 [18:41:47.407] - Number of values expected: 3 [18:41:47.407] Reducing values from 2 chunks ... DONE [18:41:47.407] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:47.409] future_lapply() ... [18:41:47.412] Number of chunks: 2 [18:41:47.413] getGlobalsAndPackagesXApply() ... [18:41:47.413] - future.globals: TRUE [18:41:47.413] getGlobalsAndPackages() ... [18:41:47.413] Searching for globals... [18:41:47.414] - globals found: [2] 'FUN', 'UseMethod' [18:41:47.415] Searching for globals ... DONE [18:41:47.415] Resolving globals: FALSE [18:41:47.415] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:47.416] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:47.416] - globals: [1] 'FUN' [18:41:47.416] [18:41:47.416] getGlobalsAndPackages() ... DONE [18:41:47.416] - globals found/used: [n=1] 'FUN' [18:41:47.417] - needed namespaces: [n=0] [18:41:47.417] Finding globals ... DONE [18:41:47.417] - use_args: TRUE [18:41:47.417] - Getting '...' globals ... [18:41:47.418] resolve() on list ... [18:41:47.418] recursive: 0 [18:41:47.418] length: 1 [18:41:47.418] elements: '...' [18:41:47.418] length: 0 (resolved future 1) [18:41:47.418] resolve() on list ... DONE [18:41:47.419] - '...' content: [n=0] [18:41:47.419] List of 1 [18:41:47.419] $ ...: list() [18:41:47.419] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.419] - attr(*, "where")=List of 1 [18:41:47.419] ..$ ...: [18:41:47.419] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.419] - attr(*, "resolved")= logi TRUE [18:41:47.419] - attr(*, "total_size")= num NA [18:41:47.422] - Getting '...' globals ... DONE [18:41:47.422] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:47.422] List of 2 [18:41:47.422] $ ...future.FUN:function (x, ...) [18:41:47.422] $ ... : list() [18:41:47.422] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.422] - attr(*, "where")=List of 2 [18:41:47.422] ..$ ...future.FUN: [18:41:47.422] ..$ ... : [18:41:47.422] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.422] - attr(*, "resolved")= logi FALSE [18:41:47.422] - attr(*, "total_size")= int 5116 [18:41:47.426] Packages to be attached in all futures: [n=0] [18:41:47.426] getGlobalsAndPackagesXApply() ... DONE [18:41:47.426] Number of futures (= number of chunks): 2 [18:41:47.427] Launching 2 futures (chunks) ... [18:41:47.427] Chunk #1 of 2 ... [18:41:47.427] - Finding globals in 'X' for chunk #1 ... [18:41:47.428] getGlobalsAndPackages() ... [18:41:47.428] Searching for globals... [18:41:47.429] [18:41:47.429] Searching for globals ... DONE [18:41:47.429] - globals: [0] [18:41:47.429] getGlobalsAndPackages() ... DONE [18:41:47.429] + additional globals found: [n=0] [18:41:47.430] + additional namespaces needed: [n=0] [18:41:47.430] - Finding globals in 'X' for chunk #1 ... DONE [18:41:47.430] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.430] - seeds: [18:41:47.430] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.430] getGlobalsAndPackages() ... [18:41:47.431] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.431] Resolving globals: FALSE [18:41:47.431] Tweak future expression to call with '...' arguments ... [18:41:47.431] { [18:41:47.431] do.call(function(...) { [18:41:47.431] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.431] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.431] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.431] on.exit(options(oopts), add = TRUE) [18:41:47.431] } [18:41:47.431] { [18:41:47.431] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.431] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.431] ...future.FUN(...future.X_jj, ...) [18:41:47.431] }) [18:41:47.431] } [18:41:47.431] }, args = future.call.arguments) [18:41:47.431] } [18:41:47.432] Tweak future expression to call with '...' arguments ... DONE [18:41:47.432] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.432] [18:41:47.433] getGlobalsAndPackages() ... DONE [18:41:47.433] run() for 'Future' ... [18:41:47.433] - state: 'created' [18:41:47.433] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.448] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.449] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.449] - Field: 'node' [18:41:47.449] - Field: 'label' [18:41:47.449] - Field: 'local' [18:41:47.449] - Field: 'owner' [18:41:47.450] - Field: 'envir' [18:41:47.450] - Field: 'workers' [18:41:47.450] - Field: 'packages' [18:41:47.450] - Field: 'gc' [18:41:47.450] - Field: 'conditions' [18:41:47.450] - Field: 'persistent' [18:41:47.451] - Field: 'expr' [18:41:47.451] - Field: 'uuid' [18:41:47.451] - Field: 'seed' [18:41:47.451] - Field: 'version' [18:41:47.451] - Field: 'result' [18:41:47.451] - Field: 'asynchronous' [18:41:47.452] - Field: 'calls' [18:41:47.452] - Field: 'globals' [18:41:47.452] - Field: 'stdout' [18:41:47.452] - Field: 'earlySignal' [18:41:47.452] - Field: 'lazy' [18:41:47.453] - Field: 'state' [18:41:47.453] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.453] - Launch lazy future ... [18:41:47.453] Packages needed by the future expression (n = 0): [18:41:47.453] Packages needed by future strategies (n = 0): [18:41:47.458] { [18:41:47.458] { [18:41:47.458] { [18:41:47.458] ...future.startTime <- base::Sys.time() [18:41:47.458] { [18:41:47.458] { [18:41:47.458] { [18:41:47.458] { [18:41:47.458] base::local({ [18:41:47.458] has_future <- base::requireNamespace("future", [18:41:47.458] quietly = TRUE) [18:41:47.458] if (has_future) { [18:41:47.458] ns <- base::getNamespace("future") [18:41:47.458] version <- ns[[".package"]][["version"]] [18:41:47.458] if (is.null(version)) [18:41:47.458] version <- utils::packageVersion("future") [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] version <- NULL [18:41:47.458] } [18:41:47.458] if (!has_future || version < "1.8.0") { [18:41:47.458] info <- base::c(r_version = base::gsub("R version ", [18:41:47.458] "", base::R.version$version.string), [18:41:47.458] platform = base::sprintf("%s (%s-bit)", [18:41:47.458] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.458] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.458] "release", "version")], collapse = " "), [18:41:47.458] hostname = base::Sys.info()[["nodename"]]) [18:41:47.458] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.458] info) [18:41:47.458] info <- base::paste(info, collapse = "; ") [18:41:47.458] if (!has_future) { [18:41:47.458] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.458] info) [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.458] info, version) [18:41:47.458] } [18:41:47.458] base::stop(msg) [18:41:47.458] } [18:41:47.458] }) [18:41:47.458] } [18:41:47.458] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.458] base::options(mc.cores = 1L) [18:41:47.458] } [18:41:47.458] ...future.strategy.old <- future::plan("list") [18:41:47.458] options(future.plan = NULL) [18:41:47.458] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.458] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.458] } [18:41:47.458] ...future.workdir <- getwd() [18:41:47.458] } [18:41:47.458] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.458] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.458] } [18:41:47.458] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.458] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.458] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.458] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.458] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.458] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.458] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.458] base::names(...future.oldOptions)) [18:41:47.458] } [18:41:47.458] if (FALSE) { [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] if (TRUE) { [18:41:47.458] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.458] open = "w") [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.458] windows = "NUL", "/dev/null"), open = "w") [18:41:47.458] } [18:41:47.458] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.458] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.458] base::sink(type = "output", split = FALSE) [18:41:47.458] base::close(...future.stdout) [18:41:47.458] }, add = TRUE) [18:41:47.458] } [18:41:47.458] ...future.frame <- base::sys.nframe() [18:41:47.458] ...future.conditions <- base::list() [18:41:47.458] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.458] if (FALSE) { [18:41:47.458] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.458] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.458] } [18:41:47.458] ...future.result <- base::tryCatch({ [18:41:47.458] base::withCallingHandlers({ [18:41:47.458] ...future.value <- base::withVisible(base::local({ [18:41:47.458] ...future.makeSendCondition <- base::local({ [18:41:47.458] sendCondition <- NULL [18:41:47.458] function(frame = 1L) { [18:41:47.458] if (is.function(sendCondition)) [18:41:47.458] return(sendCondition) [18:41:47.458] ns <- getNamespace("parallel") [18:41:47.458] if (exists("sendData", mode = "function", [18:41:47.458] envir = ns)) { [18:41:47.458] parallel_sendData <- get("sendData", mode = "function", [18:41:47.458] envir = ns) [18:41:47.458] envir <- sys.frame(frame) [18:41:47.458] master <- NULL [18:41:47.458] while (!identical(envir, .GlobalEnv) && [18:41:47.458] !identical(envir, emptyenv())) { [18:41:47.458] if (exists("master", mode = "list", envir = envir, [18:41:47.458] inherits = FALSE)) { [18:41:47.458] master <- get("master", mode = "list", [18:41:47.458] envir = envir, inherits = FALSE) [18:41:47.458] if (inherits(master, c("SOCKnode", [18:41:47.458] "SOCK0node"))) { [18:41:47.458] sendCondition <<- function(cond) { [18:41:47.458] data <- list(type = "VALUE", value = cond, [18:41:47.458] success = TRUE) [18:41:47.458] parallel_sendData(master, data) [18:41:47.458] } [18:41:47.458] return(sendCondition) [18:41:47.458] } [18:41:47.458] } [18:41:47.458] frame <- frame + 1L [18:41:47.458] envir <- sys.frame(frame) [18:41:47.458] } [18:41:47.458] } [18:41:47.458] sendCondition <<- function(cond) NULL [18:41:47.458] } [18:41:47.458] }) [18:41:47.458] withCallingHandlers({ [18:41:47.458] { [18:41:47.458] do.call(function(...) { [18:41:47.458] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.458] if (!identical(...future.globals.maxSize.org, [18:41:47.458] ...future.globals.maxSize)) { [18:41:47.458] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.458] on.exit(options(oopts), add = TRUE) [18:41:47.458] } [18:41:47.458] { [18:41:47.458] lapply(seq_along(...future.elements_ii), [18:41:47.458] FUN = function(jj) { [18:41:47.458] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.458] ...future.FUN(...future.X_jj, ...) [18:41:47.458] }) [18:41:47.458] } [18:41:47.458] }, args = future.call.arguments) [18:41:47.458] } [18:41:47.458] }, immediateCondition = function(cond) { [18:41:47.458] sendCondition <- ...future.makeSendCondition() [18:41:47.458] sendCondition(cond) [18:41:47.458] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.458] { [18:41:47.458] inherits <- base::inherits [18:41:47.458] invokeRestart <- base::invokeRestart [18:41:47.458] is.null <- base::is.null [18:41:47.458] muffled <- FALSE [18:41:47.458] if (inherits(cond, "message")) { [18:41:47.458] muffled <- grepl(pattern, "muffleMessage") [18:41:47.458] if (muffled) [18:41:47.458] invokeRestart("muffleMessage") [18:41:47.458] } [18:41:47.458] else if (inherits(cond, "warning")) { [18:41:47.458] muffled <- grepl(pattern, "muffleWarning") [18:41:47.458] if (muffled) [18:41:47.458] invokeRestart("muffleWarning") [18:41:47.458] } [18:41:47.458] else if (inherits(cond, "condition")) { [18:41:47.458] if (!is.null(pattern)) { [18:41:47.458] computeRestarts <- base::computeRestarts [18:41:47.458] grepl <- base::grepl [18:41:47.458] restarts <- computeRestarts(cond) [18:41:47.458] for (restart in restarts) { [18:41:47.458] name <- restart$name [18:41:47.458] if (is.null(name)) [18:41:47.458] next [18:41:47.458] if (!grepl(pattern, name)) [18:41:47.458] next [18:41:47.458] invokeRestart(restart) [18:41:47.458] muffled <- TRUE [18:41:47.458] break [18:41:47.458] } [18:41:47.458] } [18:41:47.458] } [18:41:47.458] invisible(muffled) [18:41:47.458] } [18:41:47.458] muffleCondition(cond) [18:41:47.458] }) [18:41:47.458] })) [18:41:47.458] future::FutureResult(value = ...future.value$value, [18:41:47.458] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.458] ...future.rng), globalenv = if (FALSE) [18:41:47.458] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.458] ...future.globalenv.names)) [18:41:47.458] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.458] }, condition = base::local({ [18:41:47.458] c <- base::c [18:41:47.458] inherits <- base::inherits [18:41:47.458] invokeRestart <- base::invokeRestart [18:41:47.458] length <- base::length [18:41:47.458] list <- base::list [18:41:47.458] seq.int <- base::seq.int [18:41:47.458] signalCondition <- base::signalCondition [18:41:47.458] sys.calls <- base::sys.calls [18:41:47.458] `[[` <- base::`[[` [18:41:47.458] `+` <- base::`+` [18:41:47.458] `<<-` <- base::`<<-` [18:41:47.458] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.458] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.458] 3L)] [18:41:47.458] } [18:41:47.458] function(cond) { [18:41:47.458] is_error <- inherits(cond, "error") [18:41:47.458] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.458] NULL) [18:41:47.458] if (is_error) { [18:41:47.458] sessionInformation <- function() { [18:41:47.458] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.458] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.458] search = base::search(), system = base::Sys.info()) [18:41:47.458] } [18:41:47.458] ...future.conditions[[length(...future.conditions) + [18:41:47.458] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.458] cond$call), session = sessionInformation(), [18:41:47.458] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.458] signalCondition(cond) [18:41:47.458] } [18:41:47.458] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.458] "immediateCondition"))) { [18:41:47.458] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.458] ...future.conditions[[length(...future.conditions) + [18:41:47.458] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.458] if (TRUE && !signal) { [18:41:47.458] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.458] { [18:41:47.458] inherits <- base::inherits [18:41:47.458] invokeRestart <- base::invokeRestart [18:41:47.458] is.null <- base::is.null [18:41:47.458] muffled <- FALSE [18:41:47.458] if (inherits(cond, "message")) { [18:41:47.458] muffled <- grepl(pattern, "muffleMessage") [18:41:47.458] if (muffled) [18:41:47.458] invokeRestart("muffleMessage") [18:41:47.458] } [18:41:47.458] else if (inherits(cond, "warning")) { [18:41:47.458] muffled <- grepl(pattern, "muffleWarning") [18:41:47.458] if (muffled) [18:41:47.458] invokeRestart("muffleWarning") [18:41:47.458] } [18:41:47.458] else if (inherits(cond, "condition")) { [18:41:47.458] if (!is.null(pattern)) { [18:41:47.458] computeRestarts <- base::computeRestarts [18:41:47.458] grepl <- base::grepl [18:41:47.458] restarts <- computeRestarts(cond) [18:41:47.458] for (restart in restarts) { [18:41:47.458] name <- restart$name [18:41:47.458] if (is.null(name)) [18:41:47.458] next [18:41:47.458] if (!grepl(pattern, name)) [18:41:47.458] next [18:41:47.458] invokeRestart(restart) [18:41:47.458] muffled <- TRUE [18:41:47.458] break [18:41:47.458] } [18:41:47.458] } [18:41:47.458] } [18:41:47.458] invisible(muffled) [18:41:47.458] } [18:41:47.458] muffleCondition(cond, pattern = "^muffle") [18:41:47.458] } [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] if (TRUE) { [18:41:47.458] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.458] { [18:41:47.458] inherits <- base::inherits [18:41:47.458] invokeRestart <- base::invokeRestart [18:41:47.458] is.null <- base::is.null [18:41:47.458] muffled <- FALSE [18:41:47.458] if (inherits(cond, "message")) { [18:41:47.458] muffled <- grepl(pattern, "muffleMessage") [18:41:47.458] if (muffled) [18:41:47.458] invokeRestart("muffleMessage") [18:41:47.458] } [18:41:47.458] else if (inherits(cond, "warning")) { [18:41:47.458] muffled <- grepl(pattern, "muffleWarning") [18:41:47.458] if (muffled) [18:41:47.458] invokeRestart("muffleWarning") [18:41:47.458] } [18:41:47.458] else if (inherits(cond, "condition")) { [18:41:47.458] if (!is.null(pattern)) { [18:41:47.458] computeRestarts <- base::computeRestarts [18:41:47.458] grepl <- base::grepl [18:41:47.458] restarts <- computeRestarts(cond) [18:41:47.458] for (restart in restarts) { [18:41:47.458] name <- restart$name [18:41:47.458] if (is.null(name)) [18:41:47.458] next [18:41:47.458] if (!grepl(pattern, name)) [18:41:47.458] next [18:41:47.458] invokeRestart(restart) [18:41:47.458] muffled <- TRUE [18:41:47.458] break [18:41:47.458] } [18:41:47.458] } [18:41:47.458] } [18:41:47.458] invisible(muffled) [18:41:47.458] } [18:41:47.458] muffleCondition(cond, pattern = "^muffle") [18:41:47.458] } [18:41:47.458] } [18:41:47.458] } [18:41:47.458] })) [18:41:47.458] }, error = function(ex) { [18:41:47.458] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.458] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.458] ...future.rng), started = ...future.startTime, [18:41:47.458] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.458] version = "1.8"), class = "FutureResult") [18:41:47.458] }, finally = { [18:41:47.458] if (!identical(...future.workdir, getwd())) [18:41:47.458] setwd(...future.workdir) [18:41:47.458] { [18:41:47.458] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.458] ...future.oldOptions$nwarnings <- NULL [18:41:47.458] } [18:41:47.458] base::options(...future.oldOptions) [18:41:47.458] if (.Platform$OS.type == "windows") { [18:41:47.458] old_names <- names(...future.oldEnvVars) [18:41:47.458] envs <- base::Sys.getenv() [18:41:47.458] names <- names(envs) [18:41:47.458] common <- intersect(names, old_names) [18:41:47.458] added <- setdiff(names, old_names) [18:41:47.458] removed <- setdiff(old_names, names) [18:41:47.458] changed <- common[...future.oldEnvVars[common] != [18:41:47.458] envs[common]] [18:41:47.458] NAMES <- toupper(changed) [18:41:47.458] args <- list() [18:41:47.458] for (kk in seq_along(NAMES)) { [18:41:47.458] name <- changed[[kk]] [18:41:47.458] NAME <- NAMES[[kk]] [18:41:47.458] if (name != NAME && is.element(NAME, old_names)) [18:41:47.458] next [18:41:47.458] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.458] } [18:41:47.458] NAMES <- toupper(added) [18:41:47.458] for (kk in seq_along(NAMES)) { [18:41:47.458] name <- added[[kk]] [18:41:47.458] NAME <- NAMES[[kk]] [18:41:47.458] if (name != NAME && is.element(NAME, old_names)) [18:41:47.458] next [18:41:47.458] args[[name]] <- "" [18:41:47.458] } [18:41:47.458] NAMES <- toupper(removed) [18:41:47.458] for (kk in seq_along(NAMES)) { [18:41:47.458] name <- removed[[kk]] [18:41:47.458] NAME <- NAMES[[kk]] [18:41:47.458] if (name != NAME && is.element(NAME, old_names)) [18:41:47.458] next [18:41:47.458] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.458] } [18:41:47.458] if (length(args) > 0) [18:41:47.458] base::do.call(base::Sys.setenv, args = args) [18:41:47.458] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.458] } [18:41:47.458] { [18:41:47.458] if (base::length(...future.futureOptionsAdded) > [18:41:47.458] 0L) { [18:41:47.458] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.458] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.458] base::options(opts) [18:41:47.458] } [18:41:47.458] { [18:41:47.458] { [18:41:47.458] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.458] NULL [18:41:47.458] } [18:41:47.458] options(future.plan = NULL) [18:41:47.458] if (is.na(NA_character_)) [18:41:47.458] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.458] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.458] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.458] .init = FALSE) [18:41:47.458] } [18:41:47.458] } [18:41:47.458] } [18:41:47.458] }) [18:41:47.458] if (TRUE) { [18:41:47.458] base::sink(type = "output", split = FALSE) [18:41:47.458] if (TRUE) { [18:41:47.458] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.458] } [18:41:47.458] else { [18:41:47.458] ...future.result["stdout"] <- base::list(NULL) [18:41:47.458] } [18:41:47.458] base::close(...future.stdout) [18:41:47.458] ...future.stdout <- NULL [18:41:47.458] } [18:41:47.458] ...future.result$conditions <- ...future.conditions [18:41:47.458] ...future.result$finished <- base::Sys.time() [18:41:47.458] ...future.result [18:41:47.458] } [18:41:47.463] Exporting 5 global objects (968 bytes) to cluster node #1 ... [18:41:47.464] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:47.464] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:47.464] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.465] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.465] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:47.465] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:47.465] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.466] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.466] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.466] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.466] Exporting 5 global objects (968 bytes) to cluster node #1 ... DONE [18:41:47.467] MultisessionFuture started [18:41:47.467] - Launch lazy future ... done [18:41:47.467] run() for 'MultisessionFuture' ... done [18:41:47.468] Created future: [18:41:47.480] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.480] - Validating connection of MultisessionFuture [18:41:47.481] - received message: FutureResult [18:41:47.481] - Received FutureResult [18:41:47.481] - Erased future from FutureRegistry [18:41:47.481] result() for ClusterFuture ... [18:41:47.481] - result already collected: FutureResult [18:41:47.482] result() for ClusterFuture ... done [18:41:47.482] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.468] MultisessionFuture: [18:41:47.468] Label: 'future_sapply-1' [18:41:47.468] Expression: [18:41:47.468] { [18:41:47.468] do.call(function(...) { [18:41:47.468] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.468] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.468] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.468] on.exit(options(oopts), add = TRUE) [18:41:47.468] } [18:41:47.468] { [18:41:47.468] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.468] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.468] ...future.FUN(...future.X_jj, ...) [18:41:47.468] }) [18:41:47.468] } [18:41:47.468] }, args = future.call.arguments) [18:41:47.468] } [18:41:47.468] Lazy evaluation: FALSE [18:41:47.468] Asynchronous evaluation: TRUE [18:41:47.468] Local evaluation: TRUE [18:41:47.468] Environment: R_GlobalEnv [18:41:47.468] Capture standard output: TRUE [18:41:47.468] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.468] Globals: 5 objects totaling 518 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.468] Packages: [18:41:47.468] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.468] Resolved: TRUE [18:41:47.468] Value: [18:41:47.468] Conditions captured: [18:41:47.468] Early signaling: FALSE [18:41:47.468] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.468] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.482] Chunk #1 of 2 ... DONE [18:41:47.482] Chunk #2 of 2 ... [18:41:47.483] - Finding globals in 'X' for chunk #2 ... [18:41:47.483] getGlobalsAndPackages() ... [18:41:47.483] Searching for globals... [18:41:47.483] [18:41:47.483] Searching for globals ... DONE [18:41:47.484] - globals: [0] [18:41:47.484] getGlobalsAndPackages() ... DONE [18:41:47.484] + additional globals found: [n=0] [18:41:47.484] + additional namespaces needed: [n=0] [18:41:47.484] - Finding globals in 'X' for chunk #2 ... DONE [18:41:47.484] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.484] - seeds: [18:41:47.485] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.485] getGlobalsAndPackages() ... [18:41:47.485] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.485] Resolving globals: FALSE [18:41:47.485] Tweak future expression to call with '...' arguments ... [18:41:47.486] { [18:41:47.486] do.call(function(...) { [18:41:47.486] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.486] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.486] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.486] on.exit(options(oopts), add = TRUE) [18:41:47.486] } [18:41:47.486] { [18:41:47.486] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.486] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.486] ...future.FUN(...future.X_jj, ...) [18:41:47.486] }) [18:41:47.486] } [18:41:47.486] }, args = future.call.arguments) [18:41:47.486] } [18:41:47.486] Tweak future expression to call with '...' arguments ... DONE [18:41:47.486] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.487] [18:41:47.487] getGlobalsAndPackages() ... DONE [18:41:47.487] run() for 'Future' ... [18:41:47.487] - state: 'created' [18:41:47.488] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.505] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.505] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.505] - Field: 'node' [18:41:47.506] - Field: 'label' [18:41:47.506] - Field: 'local' [18:41:47.506] - Field: 'owner' [18:41:47.507] - Field: 'envir' [18:41:47.507] - Field: 'workers' [18:41:47.507] - Field: 'packages' [18:41:47.508] - Field: 'gc' [18:41:47.508] - Field: 'conditions' [18:41:47.508] - Field: 'persistent' [18:41:47.508] - Field: 'expr' [18:41:47.508] - Field: 'uuid' [18:41:47.509] - Field: 'seed' [18:41:47.509] - Field: 'version' [18:41:47.509] - Field: 'result' [18:41:47.509] - Field: 'asynchronous' [18:41:47.509] - Field: 'calls' [18:41:47.509] - Field: 'globals' [18:41:47.510] - Field: 'stdout' [18:41:47.510] - Field: 'earlySignal' [18:41:47.510] - Field: 'lazy' [18:41:47.510] - Field: 'state' [18:41:47.510] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.510] - Launch lazy future ... [18:41:47.511] Packages needed by the future expression (n = 0): [18:41:47.511] Packages needed by future strategies (n = 0): [18:41:47.512] { [18:41:47.512] { [18:41:47.512] { [18:41:47.512] ...future.startTime <- base::Sys.time() [18:41:47.512] { [18:41:47.512] { [18:41:47.512] { [18:41:47.512] { [18:41:47.512] base::local({ [18:41:47.512] has_future <- base::requireNamespace("future", [18:41:47.512] quietly = TRUE) [18:41:47.512] if (has_future) { [18:41:47.512] ns <- base::getNamespace("future") [18:41:47.512] version <- ns[[".package"]][["version"]] [18:41:47.512] if (is.null(version)) [18:41:47.512] version <- utils::packageVersion("future") [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] version <- NULL [18:41:47.512] } [18:41:47.512] if (!has_future || version < "1.8.0") { [18:41:47.512] info <- base::c(r_version = base::gsub("R version ", [18:41:47.512] "", base::R.version$version.string), [18:41:47.512] platform = base::sprintf("%s (%s-bit)", [18:41:47.512] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.512] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.512] "release", "version")], collapse = " "), [18:41:47.512] hostname = base::Sys.info()[["nodename"]]) [18:41:47.512] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.512] info) [18:41:47.512] info <- base::paste(info, collapse = "; ") [18:41:47.512] if (!has_future) { [18:41:47.512] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.512] info) [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.512] info, version) [18:41:47.512] } [18:41:47.512] base::stop(msg) [18:41:47.512] } [18:41:47.512] }) [18:41:47.512] } [18:41:47.512] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.512] base::options(mc.cores = 1L) [18:41:47.512] } [18:41:47.512] ...future.strategy.old <- future::plan("list") [18:41:47.512] options(future.plan = NULL) [18:41:47.512] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.512] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.512] } [18:41:47.512] ...future.workdir <- getwd() [18:41:47.512] } [18:41:47.512] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.512] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.512] } [18:41:47.512] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.512] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.512] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.512] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.512] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.512] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.512] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.512] base::names(...future.oldOptions)) [18:41:47.512] } [18:41:47.512] if (FALSE) { [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] if (TRUE) { [18:41:47.512] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.512] open = "w") [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.512] windows = "NUL", "/dev/null"), open = "w") [18:41:47.512] } [18:41:47.512] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.512] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.512] base::sink(type = "output", split = FALSE) [18:41:47.512] base::close(...future.stdout) [18:41:47.512] }, add = TRUE) [18:41:47.512] } [18:41:47.512] ...future.frame <- base::sys.nframe() [18:41:47.512] ...future.conditions <- base::list() [18:41:47.512] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.512] if (FALSE) { [18:41:47.512] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.512] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.512] } [18:41:47.512] ...future.result <- base::tryCatch({ [18:41:47.512] base::withCallingHandlers({ [18:41:47.512] ...future.value <- base::withVisible(base::local({ [18:41:47.512] ...future.makeSendCondition <- base::local({ [18:41:47.512] sendCondition <- NULL [18:41:47.512] function(frame = 1L) { [18:41:47.512] if (is.function(sendCondition)) [18:41:47.512] return(sendCondition) [18:41:47.512] ns <- getNamespace("parallel") [18:41:47.512] if (exists("sendData", mode = "function", [18:41:47.512] envir = ns)) { [18:41:47.512] parallel_sendData <- get("sendData", mode = "function", [18:41:47.512] envir = ns) [18:41:47.512] envir <- sys.frame(frame) [18:41:47.512] master <- NULL [18:41:47.512] while (!identical(envir, .GlobalEnv) && [18:41:47.512] !identical(envir, emptyenv())) { [18:41:47.512] if (exists("master", mode = "list", envir = envir, [18:41:47.512] inherits = FALSE)) { [18:41:47.512] master <- get("master", mode = "list", [18:41:47.512] envir = envir, inherits = FALSE) [18:41:47.512] if (inherits(master, c("SOCKnode", [18:41:47.512] "SOCK0node"))) { [18:41:47.512] sendCondition <<- function(cond) { [18:41:47.512] data <- list(type = "VALUE", value = cond, [18:41:47.512] success = TRUE) [18:41:47.512] parallel_sendData(master, data) [18:41:47.512] } [18:41:47.512] return(sendCondition) [18:41:47.512] } [18:41:47.512] } [18:41:47.512] frame <- frame + 1L [18:41:47.512] envir <- sys.frame(frame) [18:41:47.512] } [18:41:47.512] } [18:41:47.512] sendCondition <<- function(cond) NULL [18:41:47.512] } [18:41:47.512] }) [18:41:47.512] withCallingHandlers({ [18:41:47.512] { [18:41:47.512] do.call(function(...) { [18:41:47.512] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.512] if (!identical(...future.globals.maxSize.org, [18:41:47.512] ...future.globals.maxSize)) { [18:41:47.512] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.512] on.exit(options(oopts), add = TRUE) [18:41:47.512] } [18:41:47.512] { [18:41:47.512] lapply(seq_along(...future.elements_ii), [18:41:47.512] FUN = function(jj) { [18:41:47.512] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.512] ...future.FUN(...future.X_jj, ...) [18:41:47.512] }) [18:41:47.512] } [18:41:47.512] }, args = future.call.arguments) [18:41:47.512] } [18:41:47.512] }, immediateCondition = function(cond) { [18:41:47.512] sendCondition <- ...future.makeSendCondition() [18:41:47.512] sendCondition(cond) [18:41:47.512] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.512] { [18:41:47.512] inherits <- base::inherits [18:41:47.512] invokeRestart <- base::invokeRestart [18:41:47.512] is.null <- base::is.null [18:41:47.512] muffled <- FALSE [18:41:47.512] if (inherits(cond, "message")) { [18:41:47.512] muffled <- grepl(pattern, "muffleMessage") [18:41:47.512] if (muffled) [18:41:47.512] invokeRestart("muffleMessage") [18:41:47.512] } [18:41:47.512] else if (inherits(cond, "warning")) { [18:41:47.512] muffled <- grepl(pattern, "muffleWarning") [18:41:47.512] if (muffled) [18:41:47.512] invokeRestart("muffleWarning") [18:41:47.512] } [18:41:47.512] else if (inherits(cond, "condition")) { [18:41:47.512] if (!is.null(pattern)) { [18:41:47.512] computeRestarts <- base::computeRestarts [18:41:47.512] grepl <- base::grepl [18:41:47.512] restarts <- computeRestarts(cond) [18:41:47.512] for (restart in restarts) { [18:41:47.512] name <- restart$name [18:41:47.512] if (is.null(name)) [18:41:47.512] next [18:41:47.512] if (!grepl(pattern, name)) [18:41:47.512] next [18:41:47.512] invokeRestart(restart) [18:41:47.512] muffled <- TRUE [18:41:47.512] break [18:41:47.512] } [18:41:47.512] } [18:41:47.512] } [18:41:47.512] invisible(muffled) [18:41:47.512] } [18:41:47.512] muffleCondition(cond) [18:41:47.512] }) [18:41:47.512] })) [18:41:47.512] future::FutureResult(value = ...future.value$value, [18:41:47.512] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.512] ...future.rng), globalenv = if (FALSE) [18:41:47.512] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.512] ...future.globalenv.names)) [18:41:47.512] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.512] }, condition = base::local({ [18:41:47.512] c <- base::c [18:41:47.512] inherits <- base::inherits [18:41:47.512] invokeRestart <- base::invokeRestart [18:41:47.512] length <- base::length [18:41:47.512] list <- base::list [18:41:47.512] seq.int <- base::seq.int [18:41:47.512] signalCondition <- base::signalCondition [18:41:47.512] sys.calls <- base::sys.calls [18:41:47.512] `[[` <- base::`[[` [18:41:47.512] `+` <- base::`+` [18:41:47.512] `<<-` <- base::`<<-` [18:41:47.512] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.512] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.512] 3L)] [18:41:47.512] } [18:41:47.512] function(cond) { [18:41:47.512] is_error <- inherits(cond, "error") [18:41:47.512] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.512] NULL) [18:41:47.512] if (is_error) { [18:41:47.512] sessionInformation <- function() { [18:41:47.512] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.512] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.512] search = base::search(), system = base::Sys.info()) [18:41:47.512] } [18:41:47.512] ...future.conditions[[length(...future.conditions) + [18:41:47.512] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.512] cond$call), session = sessionInformation(), [18:41:47.512] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.512] signalCondition(cond) [18:41:47.512] } [18:41:47.512] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.512] "immediateCondition"))) { [18:41:47.512] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.512] ...future.conditions[[length(...future.conditions) + [18:41:47.512] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.512] if (TRUE && !signal) { [18:41:47.512] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.512] { [18:41:47.512] inherits <- base::inherits [18:41:47.512] invokeRestart <- base::invokeRestart [18:41:47.512] is.null <- base::is.null [18:41:47.512] muffled <- FALSE [18:41:47.512] if (inherits(cond, "message")) { [18:41:47.512] muffled <- grepl(pattern, "muffleMessage") [18:41:47.512] if (muffled) [18:41:47.512] invokeRestart("muffleMessage") [18:41:47.512] } [18:41:47.512] else if (inherits(cond, "warning")) { [18:41:47.512] muffled <- grepl(pattern, "muffleWarning") [18:41:47.512] if (muffled) [18:41:47.512] invokeRestart("muffleWarning") [18:41:47.512] } [18:41:47.512] else if (inherits(cond, "condition")) { [18:41:47.512] if (!is.null(pattern)) { [18:41:47.512] computeRestarts <- base::computeRestarts [18:41:47.512] grepl <- base::grepl [18:41:47.512] restarts <- computeRestarts(cond) [18:41:47.512] for (restart in restarts) { [18:41:47.512] name <- restart$name [18:41:47.512] if (is.null(name)) [18:41:47.512] next [18:41:47.512] if (!grepl(pattern, name)) [18:41:47.512] next [18:41:47.512] invokeRestart(restart) [18:41:47.512] muffled <- TRUE [18:41:47.512] break [18:41:47.512] } [18:41:47.512] } [18:41:47.512] } [18:41:47.512] invisible(muffled) [18:41:47.512] } [18:41:47.512] muffleCondition(cond, pattern = "^muffle") [18:41:47.512] } [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] if (TRUE) { [18:41:47.512] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.512] { [18:41:47.512] inherits <- base::inherits [18:41:47.512] invokeRestart <- base::invokeRestart [18:41:47.512] is.null <- base::is.null [18:41:47.512] muffled <- FALSE [18:41:47.512] if (inherits(cond, "message")) { [18:41:47.512] muffled <- grepl(pattern, "muffleMessage") [18:41:47.512] if (muffled) [18:41:47.512] invokeRestart("muffleMessage") [18:41:47.512] } [18:41:47.512] else if (inherits(cond, "warning")) { [18:41:47.512] muffled <- grepl(pattern, "muffleWarning") [18:41:47.512] if (muffled) [18:41:47.512] invokeRestart("muffleWarning") [18:41:47.512] } [18:41:47.512] else if (inherits(cond, "condition")) { [18:41:47.512] if (!is.null(pattern)) { [18:41:47.512] computeRestarts <- base::computeRestarts [18:41:47.512] grepl <- base::grepl [18:41:47.512] restarts <- computeRestarts(cond) [18:41:47.512] for (restart in restarts) { [18:41:47.512] name <- restart$name [18:41:47.512] if (is.null(name)) [18:41:47.512] next [18:41:47.512] if (!grepl(pattern, name)) [18:41:47.512] next [18:41:47.512] invokeRestart(restart) [18:41:47.512] muffled <- TRUE [18:41:47.512] break [18:41:47.512] } [18:41:47.512] } [18:41:47.512] } [18:41:47.512] invisible(muffled) [18:41:47.512] } [18:41:47.512] muffleCondition(cond, pattern = "^muffle") [18:41:47.512] } [18:41:47.512] } [18:41:47.512] } [18:41:47.512] })) [18:41:47.512] }, error = function(ex) { [18:41:47.512] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.512] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.512] ...future.rng), started = ...future.startTime, [18:41:47.512] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.512] version = "1.8"), class = "FutureResult") [18:41:47.512] }, finally = { [18:41:47.512] if (!identical(...future.workdir, getwd())) [18:41:47.512] setwd(...future.workdir) [18:41:47.512] { [18:41:47.512] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.512] ...future.oldOptions$nwarnings <- NULL [18:41:47.512] } [18:41:47.512] base::options(...future.oldOptions) [18:41:47.512] if (.Platform$OS.type == "windows") { [18:41:47.512] old_names <- names(...future.oldEnvVars) [18:41:47.512] envs <- base::Sys.getenv() [18:41:47.512] names <- names(envs) [18:41:47.512] common <- intersect(names, old_names) [18:41:47.512] added <- setdiff(names, old_names) [18:41:47.512] removed <- setdiff(old_names, names) [18:41:47.512] changed <- common[...future.oldEnvVars[common] != [18:41:47.512] envs[common]] [18:41:47.512] NAMES <- toupper(changed) [18:41:47.512] args <- list() [18:41:47.512] for (kk in seq_along(NAMES)) { [18:41:47.512] name <- changed[[kk]] [18:41:47.512] NAME <- NAMES[[kk]] [18:41:47.512] if (name != NAME && is.element(NAME, old_names)) [18:41:47.512] next [18:41:47.512] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.512] } [18:41:47.512] NAMES <- toupper(added) [18:41:47.512] for (kk in seq_along(NAMES)) { [18:41:47.512] name <- added[[kk]] [18:41:47.512] NAME <- NAMES[[kk]] [18:41:47.512] if (name != NAME && is.element(NAME, old_names)) [18:41:47.512] next [18:41:47.512] args[[name]] <- "" [18:41:47.512] } [18:41:47.512] NAMES <- toupper(removed) [18:41:47.512] for (kk in seq_along(NAMES)) { [18:41:47.512] name <- removed[[kk]] [18:41:47.512] NAME <- NAMES[[kk]] [18:41:47.512] if (name != NAME && is.element(NAME, old_names)) [18:41:47.512] next [18:41:47.512] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.512] } [18:41:47.512] if (length(args) > 0) [18:41:47.512] base::do.call(base::Sys.setenv, args = args) [18:41:47.512] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.512] } [18:41:47.512] { [18:41:47.512] if (base::length(...future.futureOptionsAdded) > [18:41:47.512] 0L) { [18:41:47.512] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.512] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.512] base::options(opts) [18:41:47.512] } [18:41:47.512] { [18:41:47.512] { [18:41:47.512] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.512] NULL [18:41:47.512] } [18:41:47.512] options(future.plan = NULL) [18:41:47.512] if (is.na(NA_character_)) [18:41:47.512] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.512] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.512] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.512] .init = FALSE) [18:41:47.512] } [18:41:47.512] } [18:41:47.512] } [18:41:47.512] }) [18:41:47.512] if (TRUE) { [18:41:47.512] base::sink(type = "output", split = FALSE) [18:41:47.512] if (TRUE) { [18:41:47.512] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.512] } [18:41:47.512] else { [18:41:47.512] ...future.result["stdout"] <- base::list(NULL) [18:41:47.512] } [18:41:47.512] base::close(...future.stdout) [18:41:47.512] ...future.stdout <- NULL [18:41:47.512] } [18:41:47.512] ...future.result$conditions <- ...future.conditions [18:41:47.512] ...future.result$finished <- base::Sys.time() [18:41:47.512] ...future.result [18:41:47.512] } [18:41:47.517] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:47.517] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:47.518] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:47.518] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.518] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.519] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.519] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.519] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.520] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.520] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.521] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.521] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:47.522] MultisessionFuture started [18:41:47.523] - Launch lazy future ... done [18:41:47.523] run() for 'MultisessionFuture' ... done [18:41:47.523] Created future: [18:41:47.537] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.537] - Validating connection of MultisessionFuture [18:41:47.537] - received message: FutureResult [18:41:47.537] - Received FutureResult [18:41:47.538] - Erased future from FutureRegistry [18:41:47.538] result() for ClusterFuture ... [18:41:47.538] - result already collected: FutureResult [18:41:47.538] result() for ClusterFuture ... done [18:41:47.538] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.524] MultisessionFuture: [18:41:47.524] Label: 'future_sapply-2' [18:41:47.524] Expression: [18:41:47.524] { [18:41:47.524] do.call(function(...) { [18:41:47.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.524] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.524] on.exit(options(oopts), add = TRUE) [18:41:47.524] } [18:41:47.524] { [18:41:47.524] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.524] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.524] ...future.FUN(...future.X_jj, ...) [18:41:47.524] }) [18:41:47.524] } [18:41:47.524] }, args = future.call.arguments) [18:41:47.524] } [18:41:47.524] Lazy evaluation: FALSE [18:41:47.524] Asynchronous evaluation: TRUE [18:41:47.524] Local evaluation: TRUE [18:41:47.524] Environment: R_GlobalEnv [18:41:47.524] Capture standard output: TRUE [18:41:47.524] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.524] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.524] Packages: [18:41:47.524] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.524] Resolved: TRUE [18:41:47.524] Value: [18:41:47.524] Conditions captured: [18:41:47.524] Early signaling: FALSE [18:41:47.524] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.524] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.539] Chunk #2 of 2 ... DONE [18:41:47.539] Launching 2 futures (chunks) ... DONE [18:41:47.539] Resolving 2 futures (chunks) ... [18:41:47.539] resolve() on list ... [18:41:47.540] recursive: 0 [18:41:47.540] length: 2 [18:41:47.540] [18:41:47.540] Future #1 [18:41:47.540] result() for ClusterFuture ... [18:41:47.541] - result already collected: FutureResult [18:41:47.541] result() for ClusterFuture ... done [18:41:47.541] result() for ClusterFuture ... [18:41:47.541] - result already collected: FutureResult [18:41:47.541] result() for ClusterFuture ... done [18:41:47.541] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:47.541] - nx: 2 [18:41:47.542] - relay: TRUE [18:41:47.542] - stdout: TRUE [18:41:47.542] - signal: TRUE [18:41:47.542] - resignal: FALSE [18:41:47.542] - force: TRUE [18:41:47.542] - relayed: [n=2] FALSE, FALSE [18:41:47.543] - queued futures: [n=2] FALSE, FALSE [18:41:47.543] - until=1 [18:41:47.543] - relaying element #1 [18:41:47.543] result() for ClusterFuture ... [18:41:47.543] - result already collected: FutureResult [18:41:47.543] result() for ClusterFuture ... done [18:41:47.543] result() for ClusterFuture ... [18:41:47.544] - result already collected: FutureResult [18:41:47.544] result() for ClusterFuture ... done [18:41:47.544] result() for ClusterFuture ... [18:41:47.544] - result already collected: FutureResult [18:41:47.544] result() for ClusterFuture ... done [18:41:47.544] result() for ClusterFuture ... [18:41:47.545] - result already collected: FutureResult [18:41:47.545] result() for ClusterFuture ... done [18:41:47.545] - relayed: [n=2] TRUE, FALSE [18:41:47.545] - queued futures: [n=2] TRUE, FALSE [18:41:47.545] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:47.545] length: 1 (resolved future 1) [18:41:47.546] Future #2 [18:41:47.546] result() for ClusterFuture ... [18:41:47.546] - result already collected: FutureResult [18:41:47.546] result() for ClusterFuture ... done [18:41:47.546] result() for ClusterFuture ... [18:41:47.546] - result already collected: FutureResult [18:41:47.547] result() for ClusterFuture ... done [18:41:47.547] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:47.547] - nx: 2 [18:41:47.547] - relay: TRUE [18:41:47.547] - stdout: TRUE [18:41:47.547] - signal: TRUE [18:41:47.547] - resignal: FALSE [18:41:47.548] - force: TRUE [18:41:47.548] - relayed: [n=2] TRUE, FALSE [18:41:47.548] - queued futures: [n=2] TRUE, FALSE [18:41:47.548] - until=2 [18:41:47.548] - relaying element #2 [18:41:47.548] result() for ClusterFuture ... [18:41:47.549] - result already collected: FutureResult [18:41:47.549] result() for ClusterFuture ... done [18:41:47.549] result() for ClusterFuture ... [18:41:47.549] - result already collected: FutureResult [18:41:47.549] result() for ClusterFuture ... done [18:41:47.549] result() for ClusterFuture ... [18:41:47.550] - result already collected: FutureResult [18:41:47.550] result() for ClusterFuture ... done [18:41:47.550] result() for ClusterFuture ... [18:41:47.550] - result already collected: FutureResult [18:41:47.550] result() for ClusterFuture ... done [18:41:47.550] - relayed: [n=2] TRUE, TRUE [18:41:47.551] - queued futures: [n=2] TRUE, TRUE [18:41:47.551] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:47.551] length: 0 (resolved future 2) [18:41:47.552] Relaying remaining futures [18:41:47.552] signalConditionsASAP(NULL, pos=0) ... [18:41:47.552] - nx: 2 [18:41:47.553] - relay: TRUE [18:41:47.553] - stdout: TRUE [18:41:47.553] - signal: TRUE [18:41:47.553] - resignal: FALSE [18:41:47.554] - force: TRUE [18:41:47.554] - relayed: [n=2] TRUE, TRUE [18:41:47.554] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:47.554] - relayed: [n=2] TRUE, TRUE [18:41:47.554] - queued futures: [n=2] TRUE, TRUE [18:41:47.554] signalConditionsASAP(NULL, pos=0) ... done [18:41:47.555] resolve() on list ... DONE [18:41:47.555] result() for ClusterFuture ... [18:41:47.555] - result already collected: FutureResult [18:41:47.555] result() for ClusterFuture ... done [18:41:47.555] result() for ClusterFuture ... [18:41:47.555] - result already collected: FutureResult [18:41:47.556] result() for ClusterFuture ... done [18:41:47.556] result() for ClusterFuture ... [18:41:47.556] - result already collected: FutureResult [18:41:47.556] result() for ClusterFuture ... done [18:41:47.556] result() for ClusterFuture ... [18:41:47.556] - result already collected: FutureResult [18:41:47.557] result() for ClusterFuture ... done [18:41:47.557] - Number of value chunks collected: 2 [18:41:47.557] Resolving 2 futures (chunks) ... DONE [18:41:47.557] Reducing values from 2 chunks ... [18:41:47.557] - Number of values collected after concatenation: 3 [18:41:47.557] - Number of values expected: 3 [18:41:47.558] Reducing values from 2 chunks ... DONE [18:41:47.558] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:47.560] future_lapply() ... [18:41:47.563] Number of chunks: 2 [18:41:47.564] getGlobalsAndPackagesXApply() ... [18:41:47.564] - future.globals: TRUE [18:41:47.564] getGlobalsAndPackages() ... [18:41:47.564] Searching for globals... [18:41:47.566] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:47.566] Searching for globals ... DONE [18:41:47.566] Resolving globals: FALSE [18:41:47.567] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:47.567] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:47.568] - globals: [1] 'FUN' [18:41:47.568] [18:41:47.568] getGlobalsAndPackages() ... DONE [18:41:47.568] - globals found/used: [n=1] 'FUN' [18:41:47.568] - needed namespaces: [n=0] [18:41:47.568] Finding globals ... DONE [18:41:47.569] - use_args: TRUE [18:41:47.569] - Getting '...' globals ... [18:41:47.569] resolve() on list ... [18:41:47.569] recursive: 0 [18:41:47.570] length: 1 [18:41:47.570] elements: '...' [18:41:47.570] length: 0 (resolved future 1) [18:41:47.570] resolve() on list ... DONE [18:41:47.570] - '...' content: [n=0] [18:41:47.571] List of 1 [18:41:47.571] $ ...: list() [18:41:47.571] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.571] - attr(*, "where")=List of 1 [18:41:47.571] ..$ ...: [18:41:47.571] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.571] - attr(*, "resolved")= logi TRUE [18:41:47.571] - attr(*, "total_size")= num NA [18:41:47.574] - Getting '...' globals ... DONE [18:41:47.574] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:47.574] List of 2 [18:41:47.574] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:47.574] $ ... : list() [18:41:47.574] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.574] - attr(*, "where")=List of 2 [18:41:47.574] ..$ ...future.FUN: [18:41:47.574] ..$ ... : [18:41:47.574] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.574] - attr(*, "resolved")= logi FALSE [18:41:47.574] - attr(*, "total_size")= int 6598 [18:41:47.577] Packages to be attached in all futures: [n=0] [18:41:47.578] getGlobalsAndPackagesXApply() ... DONE [18:41:47.578] Number of futures (= number of chunks): 2 [18:41:47.578] Launching 2 futures (chunks) ... [18:41:47.578] Chunk #1 of 2 ... [18:41:47.578] - Finding globals in 'X' for chunk #1 ... [18:41:47.579] getGlobalsAndPackages() ... [18:41:47.579] Searching for globals... [18:41:47.579] [18:41:47.579] Searching for globals ... DONE [18:41:47.579] - globals: [0] [18:41:47.580] getGlobalsAndPackages() ... DONE [18:41:47.580] + additional globals found: [n=0] [18:41:47.580] + additional namespaces needed: [n=0] [18:41:47.580] - Finding globals in 'X' for chunk #1 ... DONE [18:41:47.580] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.580] - seeds: [18:41:47.581] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.581] getGlobalsAndPackages() ... [18:41:47.581] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.581] Resolving globals: FALSE [18:41:47.581] Tweak future expression to call with '...' arguments ... [18:41:47.581] { [18:41:47.581] do.call(function(...) { [18:41:47.581] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.581] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.581] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.581] on.exit(options(oopts), add = TRUE) [18:41:47.581] } [18:41:47.581] { [18:41:47.581] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.581] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.581] ...future.FUN(...future.X_jj, ...) [18:41:47.581] }) [18:41:47.581] } [18:41:47.581] }, args = future.call.arguments) [18:41:47.581] } [18:41:47.582] Tweak future expression to call with '...' arguments ... DONE [18:41:47.583] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.583] [18:41:47.583] getGlobalsAndPackages() ... DONE [18:41:47.584] run() for 'Future' ... [18:41:47.584] - state: 'created' [18:41:47.585] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.601] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.601] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.601] - Field: 'node' [18:41:47.601] - Field: 'label' [18:41:47.602] - Field: 'local' [18:41:47.602] - Field: 'owner' [18:41:47.602] - Field: 'envir' [18:41:47.602] - Field: 'workers' [18:41:47.602] - Field: 'packages' [18:41:47.603] - Field: 'gc' [18:41:47.603] - Field: 'conditions' [18:41:47.603] - Field: 'persistent' [18:41:47.603] - Field: 'expr' [18:41:47.603] - Field: 'uuid' [18:41:47.603] - Field: 'seed' [18:41:47.604] - Field: 'version' [18:41:47.604] - Field: 'result' [18:41:47.604] - Field: 'asynchronous' [18:41:47.604] - Field: 'calls' [18:41:47.604] - Field: 'globals' [18:41:47.604] - Field: 'stdout' [18:41:47.605] - Field: 'earlySignal' [18:41:47.605] - Field: 'lazy' [18:41:47.605] - Field: 'state' [18:41:47.605] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.605] - Launch lazy future ... [18:41:47.606] Packages needed by the future expression (n = 0): [18:41:47.606] Packages needed by future strategies (n = 0): [18:41:47.607] { [18:41:47.607] { [18:41:47.607] { [18:41:47.607] ...future.startTime <- base::Sys.time() [18:41:47.607] { [18:41:47.607] { [18:41:47.607] { [18:41:47.607] { [18:41:47.607] base::local({ [18:41:47.607] has_future <- base::requireNamespace("future", [18:41:47.607] quietly = TRUE) [18:41:47.607] if (has_future) { [18:41:47.607] ns <- base::getNamespace("future") [18:41:47.607] version <- ns[[".package"]][["version"]] [18:41:47.607] if (is.null(version)) [18:41:47.607] version <- utils::packageVersion("future") [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] version <- NULL [18:41:47.607] } [18:41:47.607] if (!has_future || version < "1.8.0") { [18:41:47.607] info <- base::c(r_version = base::gsub("R version ", [18:41:47.607] "", base::R.version$version.string), [18:41:47.607] platform = base::sprintf("%s (%s-bit)", [18:41:47.607] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.607] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.607] "release", "version")], collapse = " "), [18:41:47.607] hostname = base::Sys.info()[["nodename"]]) [18:41:47.607] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.607] info) [18:41:47.607] info <- base::paste(info, collapse = "; ") [18:41:47.607] if (!has_future) { [18:41:47.607] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.607] info) [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.607] info, version) [18:41:47.607] } [18:41:47.607] base::stop(msg) [18:41:47.607] } [18:41:47.607] }) [18:41:47.607] } [18:41:47.607] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.607] base::options(mc.cores = 1L) [18:41:47.607] } [18:41:47.607] ...future.strategy.old <- future::plan("list") [18:41:47.607] options(future.plan = NULL) [18:41:47.607] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.607] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.607] } [18:41:47.607] ...future.workdir <- getwd() [18:41:47.607] } [18:41:47.607] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.607] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.607] } [18:41:47.607] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.607] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.607] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.607] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.607] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.607] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.607] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.607] base::names(...future.oldOptions)) [18:41:47.607] } [18:41:47.607] if (FALSE) { [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] if (TRUE) { [18:41:47.607] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.607] open = "w") [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.607] windows = "NUL", "/dev/null"), open = "w") [18:41:47.607] } [18:41:47.607] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.607] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.607] base::sink(type = "output", split = FALSE) [18:41:47.607] base::close(...future.stdout) [18:41:47.607] }, add = TRUE) [18:41:47.607] } [18:41:47.607] ...future.frame <- base::sys.nframe() [18:41:47.607] ...future.conditions <- base::list() [18:41:47.607] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.607] if (FALSE) { [18:41:47.607] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.607] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.607] } [18:41:47.607] ...future.result <- base::tryCatch({ [18:41:47.607] base::withCallingHandlers({ [18:41:47.607] ...future.value <- base::withVisible(base::local({ [18:41:47.607] ...future.makeSendCondition <- base::local({ [18:41:47.607] sendCondition <- NULL [18:41:47.607] function(frame = 1L) { [18:41:47.607] if (is.function(sendCondition)) [18:41:47.607] return(sendCondition) [18:41:47.607] ns <- getNamespace("parallel") [18:41:47.607] if (exists("sendData", mode = "function", [18:41:47.607] envir = ns)) { [18:41:47.607] parallel_sendData <- get("sendData", mode = "function", [18:41:47.607] envir = ns) [18:41:47.607] envir <- sys.frame(frame) [18:41:47.607] master <- NULL [18:41:47.607] while (!identical(envir, .GlobalEnv) && [18:41:47.607] !identical(envir, emptyenv())) { [18:41:47.607] if (exists("master", mode = "list", envir = envir, [18:41:47.607] inherits = FALSE)) { [18:41:47.607] master <- get("master", mode = "list", [18:41:47.607] envir = envir, inherits = FALSE) [18:41:47.607] if (inherits(master, c("SOCKnode", [18:41:47.607] "SOCK0node"))) { [18:41:47.607] sendCondition <<- function(cond) { [18:41:47.607] data <- list(type = "VALUE", value = cond, [18:41:47.607] success = TRUE) [18:41:47.607] parallel_sendData(master, data) [18:41:47.607] } [18:41:47.607] return(sendCondition) [18:41:47.607] } [18:41:47.607] } [18:41:47.607] frame <- frame + 1L [18:41:47.607] envir <- sys.frame(frame) [18:41:47.607] } [18:41:47.607] } [18:41:47.607] sendCondition <<- function(cond) NULL [18:41:47.607] } [18:41:47.607] }) [18:41:47.607] withCallingHandlers({ [18:41:47.607] { [18:41:47.607] do.call(function(...) { [18:41:47.607] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.607] if (!identical(...future.globals.maxSize.org, [18:41:47.607] ...future.globals.maxSize)) { [18:41:47.607] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.607] on.exit(options(oopts), add = TRUE) [18:41:47.607] } [18:41:47.607] { [18:41:47.607] lapply(seq_along(...future.elements_ii), [18:41:47.607] FUN = function(jj) { [18:41:47.607] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.607] ...future.FUN(...future.X_jj, ...) [18:41:47.607] }) [18:41:47.607] } [18:41:47.607] }, args = future.call.arguments) [18:41:47.607] } [18:41:47.607] }, immediateCondition = function(cond) { [18:41:47.607] sendCondition <- ...future.makeSendCondition() [18:41:47.607] sendCondition(cond) [18:41:47.607] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.607] { [18:41:47.607] inherits <- base::inherits [18:41:47.607] invokeRestart <- base::invokeRestart [18:41:47.607] is.null <- base::is.null [18:41:47.607] muffled <- FALSE [18:41:47.607] if (inherits(cond, "message")) { [18:41:47.607] muffled <- grepl(pattern, "muffleMessage") [18:41:47.607] if (muffled) [18:41:47.607] invokeRestart("muffleMessage") [18:41:47.607] } [18:41:47.607] else if (inherits(cond, "warning")) { [18:41:47.607] muffled <- grepl(pattern, "muffleWarning") [18:41:47.607] if (muffled) [18:41:47.607] invokeRestart("muffleWarning") [18:41:47.607] } [18:41:47.607] else if (inherits(cond, "condition")) { [18:41:47.607] if (!is.null(pattern)) { [18:41:47.607] computeRestarts <- base::computeRestarts [18:41:47.607] grepl <- base::grepl [18:41:47.607] restarts <- computeRestarts(cond) [18:41:47.607] for (restart in restarts) { [18:41:47.607] name <- restart$name [18:41:47.607] if (is.null(name)) [18:41:47.607] next [18:41:47.607] if (!grepl(pattern, name)) [18:41:47.607] next [18:41:47.607] invokeRestart(restart) [18:41:47.607] muffled <- TRUE [18:41:47.607] break [18:41:47.607] } [18:41:47.607] } [18:41:47.607] } [18:41:47.607] invisible(muffled) [18:41:47.607] } [18:41:47.607] muffleCondition(cond) [18:41:47.607] }) [18:41:47.607] })) [18:41:47.607] future::FutureResult(value = ...future.value$value, [18:41:47.607] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.607] ...future.rng), globalenv = if (FALSE) [18:41:47.607] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.607] ...future.globalenv.names)) [18:41:47.607] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.607] }, condition = base::local({ [18:41:47.607] c <- base::c [18:41:47.607] inherits <- base::inherits [18:41:47.607] invokeRestart <- base::invokeRestart [18:41:47.607] length <- base::length [18:41:47.607] list <- base::list [18:41:47.607] seq.int <- base::seq.int [18:41:47.607] signalCondition <- base::signalCondition [18:41:47.607] sys.calls <- base::sys.calls [18:41:47.607] `[[` <- base::`[[` [18:41:47.607] `+` <- base::`+` [18:41:47.607] `<<-` <- base::`<<-` [18:41:47.607] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.607] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.607] 3L)] [18:41:47.607] } [18:41:47.607] function(cond) { [18:41:47.607] is_error <- inherits(cond, "error") [18:41:47.607] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.607] NULL) [18:41:47.607] if (is_error) { [18:41:47.607] sessionInformation <- function() { [18:41:47.607] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.607] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.607] search = base::search(), system = base::Sys.info()) [18:41:47.607] } [18:41:47.607] ...future.conditions[[length(...future.conditions) + [18:41:47.607] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.607] cond$call), session = sessionInformation(), [18:41:47.607] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.607] signalCondition(cond) [18:41:47.607] } [18:41:47.607] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.607] "immediateCondition"))) { [18:41:47.607] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.607] ...future.conditions[[length(...future.conditions) + [18:41:47.607] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.607] if (TRUE && !signal) { [18:41:47.607] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.607] { [18:41:47.607] inherits <- base::inherits [18:41:47.607] invokeRestart <- base::invokeRestart [18:41:47.607] is.null <- base::is.null [18:41:47.607] muffled <- FALSE [18:41:47.607] if (inherits(cond, "message")) { [18:41:47.607] muffled <- grepl(pattern, "muffleMessage") [18:41:47.607] if (muffled) [18:41:47.607] invokeRestart("muffleMessage") [18:41:47.607] } [18:41:47.607] else if (inherits(cond, "warning")) { [18:41:47.607] muffled <- grepl(pattern, "muffleWarning") [18:41:47.607] if (muffled) [18:41:47.607] invokeRestart("muffleWarning") [18:41:47.607] } [18:41:47.607] else if (inherits(cond, "condition")) { [18:41:47.607] if (!is.null(pattern)) { [18:41:47.607] computeRestarts <- base::computeRestarts [18:41:47.607] grepl <- base::grepl [18:41:47.607] restarts <- computeRestarts(cond) [18:41:47.607] for (restart in restarts) { [18:41:47.607] name <- restart$name [18:41:47.607] if (is.null(name)) [18:41:47.607] next [18:41:47.607] if (!grepl(pattern, name)) [18:41:47.607] next [18:41:47.607] invokeRestart(restart) [18:41:47.607] muffled <- TRUE [18:41:47.607] break [18:41:47.607] } [18:41:47.607] } [18:41:47.607] } [18:41:47.607] invisible(muffled) [18:41:47.607] } [18:41:47.607] muffleCondition(cond, pattern = "^muffle") [18:41:47.607] } [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] if (TRUE) { [18:41:47.607] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.607] { [18:41:47.607] inherits <- base::inherits [18:41:47.607] invokeRestart <- base::invokeRestart [18:41:47.607] is.null <- base::is.null [18:41:47.607] muffled <- FALSE [18:41:47.607] if (inherits(cond, "message")) { [18:41:47.607] muffled <- grepl(pattern, "muffleMessage") [18:41:47.607] if (muffled) [18:41:47.607] invokeRestart("muffleMessage") [18:41:47.607] } [18:41:47.607] else if (inherits(cond, "warning")) { [18:41:47.607] muffled <- grepl(pattern, "muffleWarning") [18:41:47.607] if (muffled) [18:41:47.607] invokeRestart("muffleWarning") [18:41:47.607] } [18:41:47.607] else if (inherits(cond, "condition")) { [18:41:47.607] if (!is.null(pattern)) { [18:41:47.607] computeRestarts <- base::computeRestarts [18:41:47.607] grepl <- base::grepl [18:41:47.607] restarts <- computeRestarts(cond) [18:41:47.607] for (restart in restarts) { [18:41:47.607] name <- restart$name [18:41:47.607] if (is.null(name)) [18:41:47.607] next [18:41:47.607] if (!grepl(pattern, name)) [18:41:47.607] next [18:41:47.607] invokeRestart(restart) [18:41:47.607] muffled <- TRUE [18:41:47.607] break [18:41:47.607] } [18:41:47.607] } [18:41:47.607] } [18:41:47.607] invisible(muffled) [18:41:47.607] } [18:41:47.607] muffleCondition(cond, pattern = "^muffle") [18:41:47.607] } [18:41:47.607] } [18:41:47.607] } [18:41:47.607] })) [18:41:47.607] }, error = function(ex) { [18:41:47.607] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.607] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.607] ...future.rng), started = ...future.startTime, [18:41:47.607] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.607] version = "1.8"), class = "FutureResult") [18:41:47.607] }, finally = { [18:41:47.607] if (!identical(...future.workdir, getwd())) [18:41:47.607] setwd(...future.workdir) [18:41:47.607] { [18:41:47.607] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.607] ...future.oldOptions$nwarnings <- NULL [18:41:47.607] } [18:41:47.607] base::options(...future.oldOptions) [18:41:47.607] if (.Platform$OS.type == "windows") { [18:41:47.607] old_names <- names(...future.oldEnvVars) [18:41:47.607] envs <- base::Sys.getenv() [18:41:47.607] names <- names(envs) [18:41:47.607] common <- intersect(names, old_names) [18:41:47.607] added <- setdiff(names, old_names) [18:41:47.607] removed <- setdiff(old_names, names) [18:41:47.607] changed <- common[...future.oldEnvVars[common] != [18:41:47.607] envs[common]] [18:41:47.607] NAMES <- toupper(changed) [18:41:47.607] args <- list() [18:41:47.607] for (kk in seq_along(NAMES)) { [18:41:47.607] name <- changed[[kk]] [18:41:47.607] NAME <- NAMES[[kk]] [18:41:47.607] if (name != NAME && is.element(NAME, old_names)) [18:41:47.607] next [18:41:47.607] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.607] } [18:41:47.607] NAMES <- toupper(added) [18:41:47.607] for (kk in seq_along(NAMES)) { [18:41:47.607] name <- added[[kk]] [18:41:47.607] NAME <- NAMES[[kk]] [18:41:47.607] if (name != NAME && is.element(NAME, old_names)) [18:41:47.607] next [18:41:47.607] args[[name]] <- "" [18:41:47.607] } [18:41:47.607] NAMES <- toupper(removed) [18:41:47.607] for (kk in seq_along(NAMES)) { [18:41:47.607] name <- removed[[kk]] [18:41:47.607] NAME <- NAMES[[kk]] [18:41:47.607] if (name != NAME && is.element(NAME, old_names)) [18:41:47.607] next [18:41:47.607] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.607] } [18:41:47.607] if (length(args) > 0) [18:41:47.607] base::do.call(base::Sys.setenv, args = args) [18:41:47.607] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.607] } [18:41:47.607] { [18:41:47.607] if (base::length(...future.futureOptionsAdded) > [18:41:47.607] 0L) { [18:41:47.607] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.607] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.607] base::options(opts) [18:41:47.607] } [18:41:47.607] { [18:41:47.607] { [18:41:47.607] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.607] NULL [18:41:47.607] } [18:41:47.607] options(future.plan = NULL) [18:41:47.607] if (is.na(NA_character_)) [18:41:47.607] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.607] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.607] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.607] .init = FALSE) [18:41:47.607] } [18:41:47.607] } [18:41:47.607] } [18:41:47.607] }) [18:41:47.607] if (TRUE) { [18:41:47.607] base::sink(type = "output", split = FALSE) [18:41:47.607] if (TRUE) { [18:41:47.607] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.607] } [18:41:47.607] else { [18:41:47.607] ...future.result["stdout"] <- base::list(NULL) [18:41:47.607] } [18:41:47.607] base::close(...future.stdout) [18:41:47.607] ...future.stdout <- NULL [18:41:47.607] } [18:41:47.607] ...future.result$conditions <- ...future.conditions [18:41:47.607] ...future.result$finished <- base::Sys.time() [18:41:47.607] ...future.result [18:41:47.607] } [18:41:47.612] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... [18:41:47.613] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:47.613] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:47.613] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.614] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.614] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:47.615] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:47.615] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.616] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.616] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.617] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.617] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... DONE [18:41:47.618] MultisessionFuture started [18:41:47.618] - Launch lazy future ... done [18:41:47.619] run() for 'MultisessionFuture' ... done [18:41:47.619] Created future: [18:41:47.632] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.632] - Validating connection of MultisessionFuture [18:41:47.633] - received message: FutureResult [18:41:47.633] - Received FutureResult [18:41:47.633] - Erased future from FutureRegistry [18:41:47.633] result() for ClusterFuture ... [18:41:47.633] - result already collected: FutureResult [18:41:47.634] result() for ClusterFuture ... done [18:41:47.634] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.619] MultisessionFuture: [18:41:47.619] Label: 'future_sapply-1' [18:41:47.619] Expression: [18:41:47.619] { [18:41:47.619] do.call(function(...) { [18:41:47.619] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.619] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.619] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.619] on.exit(options(oopts), add = TRUE) [18:41:47.619] } [18:41:47.619] { [18:41:47.619] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.619] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.619] ...future.FUN(...future.X_jj, ...) [18:41:47.619] }) [18:41:47.619] } [18:41:47.619] }, args = future.call.arguments) [18:41:47.619] } [18:41:47.619] Lazy evaluation: FALSE [18:41:47.619] Asynchronous evaluation: TRUE [18:41:47.619] Local evaluation: TRUE [18:41:47.619] Environment: R_GlobalEnv [18:41:47.619] Capture standard output: TRUE [18:41:47.619] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.619] Globals: 5 objects totaling 1.00 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.619] Packages: [18:41:47.619] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.619] Resolved: TRUE [18:41:47.619] Value: [18:41:47.619] Conditions captured: [18:41:47.619] Early signaling: FALSE [18:41:47.619] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.619] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.634] Chunk #1 of 2 ... DONE [18:41:47.635] Chunk #2 of 2 ... [18:41:47.635] - Finding globals in 'X' for chunk #2 ... [18:41:47.635] getGlobalsAndPackages() ... [18:41:47.635] Searching for globals... [18:41:47.635] [18:41:47.636] Searching for globals ... DONE [18:41:47.636] - globals: [0] [18:41:47.636] getGlobalsAndPackages() ... DONE [18:41:47.636] + additional globals found: [n=0] [18:41:47.636] + additional namespaces needed: [n=0] [18:41:47.636] - Finding globals in 'X' for chunk #2 ... DONE [18:41:47.637] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.637] - seeds: [18:41:47.637] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.637] getGlobalsAndPackages() ... [18:41:47.637] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.637] Resolving globals: FALSE [18:41:47.638] Tweak future expression to call with '...' arguments ... [18:41:47.638] { [18:41:47.638] do.call(function(...) { [18:41:47.638] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.638] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.638] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.638] on.exit(options(oopts), add = TRUE) [18:41:47.638] } [18:41:47.638] { [18:41:47.638] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.638] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.638] ...future.FUN(...future.X_jj, ...) [18:41:47.638] }) [18:41:47.638] } [18:41:47.638] }, args = future.call.arguments) [18:41:47.638] } [18:41:47.638] Tweak future expression to call with '...' arguments ... DONE [18:41:47.639] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.639] [18:41:47.639] getGlobalsAndPackages() ... DONE [18:41:47.640] run() for 'Future' ... [18:41:47.640] - state: 'created' [18:41:47.640] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.656] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.656] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.656] - Field: 'node' [18:41:47.656] - Field: 'label' [18:41:47.657] - Field: 'local' [18:41:47.657] - Field: 'owner' [18:41:47.657] - Field: 'envir' [18:41:47.657] - Field: 'workers' [18:41:47.657] - Field: 'packages' [18:41:47.658] - Field: 'gc' [18:41:47.658] - Field: 'conditions' [18:41:47.658] - Field: 'persistent' [18:41:47.658] - Field: 'expr' [18:41:47.658] - Field: 'uuid' [18:41:47.658] - Field: 'seed' [18:41:47.659] - Field: 'version' [18:41:47.659] - Field: 'result' [18:41:47.659] - Field: 'asynchronous' [18:41:47.659] - Field: 'calls' [18:41:47.659] - Field: 'globals' [18:41:47.660] - Field: 'stdout' [18:41:47.660] - Field: 'earlySignal' [18:41:47.660] - Field: 'lazy' [18:41:47.660] - Field: 'state' [18:41:47.660] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.661] - Launch lazy future ... [18:41:47.661] Packages needed by the future expression (n = 0): [18:41:47.662] Packages needed by future strategies (n = 0): [18:41:47.662] { [18:41:47.662] { [18:41:47.662] { [18:41:47.662] ...future.startTime <- base::Sys.time() [18:41:47.662] { [18:41:47.662] { [18:41:47.662] { [18:41:47.662] { [18:41:47.662] base::local({ [18:41:47.662] has_future <- base::requireNamespace("future", [18:41:47.662] quietly = TRUE) [18:41:47.662] if (has_future) { [18:41:47.662] ns <- base::getNamespace("future") [18:41:47.662] version <- ns[[".package"]][["version"]] [18:41:47.662] if (is.null(version)) [18:41:47.662] version <- utils::packageVersion("future") [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] version <- NULL [18:41:47.662] } [18:41:47.662] if (!has_future || version < "1.8.0") { [18:41:47.662] info <- base::c(r_version = base::gsub("R version ", [18:41:47.662] "", base::R.version$version.string), [18:41:47.662] platform = base::sprintf("%s (%s-bit)", [18:41:47.662] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.662] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.662] "release", "version")], collapse = " "), [18:41:47.662] hostname = base::Sys.info()[["nodename"]]) [18:41:47.662] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.662] info) [18:41:47.662] info <- base::paste(info, collapse = "; ") [18:41:47.662] if (!has_future) { [18:41:47.662] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.662] info) [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.662] info, version) [18:41:47.662] } [18:41:47.662] base::stop(msg) [18:41:47.662] } [18:41:47.662] }) [18:41:47.662] } [18:41:47.662] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.662] base::options(mc.cores = 1L) [18:41:47.662] } [18:41:47.662] ...future.strategy.old <- future::plan("list") [18:41:47.662] options(future.plan = NULL) [18:41:47.662] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.662] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.662] } [18:41:47.662] ...future.workdir <- getwd() [18:41:47.662] } [18:41:47.662] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.662] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.662] } [18:41:47.662] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.662] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.662] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.662] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.662] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.662] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.662] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.662] base::names(...future.oldOptions)) [18:41:47.662] } [18:41:47.662] if (FALSE) { [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] if (TRUE) { [18:41:47.662] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.662] open = "w") [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.662] windows = "NUL", "/dev/null"), open = "w") [18:41:47.662] } [18:41:47.662] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.662] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.662] base::sink(type = "output", split = FALSE) [18:41:47.662] base::close(...future.stdout) [18:41:47.662] }, add = TRUE) [18:41:47.662] } [18:41:47.662] ...future.frame <- base::sys.nframe() [18:41:47.662] ...future.conditions <- base::list() [18:41:47.662] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.662] if (FALSE) { [18:41:47.662] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.662] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.662] } [18:41:47.662] ...future.result <- base::tryCatch({ [18:41:47.662] base::withCallingHandlers({ [18:41:47.662] ...future.value <- base::withVisible(base::local({ [18:41:47.662] ...future.makeSendCondition <- base::local({ [18:41:47.662] sendCondition <- NULL [18:41:47.662] function(frame = 1L) { [18:41:47.662] if (is.function(sendCondition)) [18:41:47.662] return(sendCondition) [18:41:47.662] ns <- getNamespace("parallel") [18:41:47.662] if (exists("sendData", mode = "function", [18:41:47.662] envir = ns)) { [18:41:47.662] parallel_sendData <- get("sendData", mode = "function", [18:41:47.662] envir = ns) [18:41:47.662] envir <- sys.frame(frame) [18:41:47.662] master <- NULL [18:41:47.662] while (!identical(envir, .GlobalEnv) && [18:41:47.662] !identical(envir, emptyenv())) { [18:41:47.662] if (exists("master", mode = "list", envir = envir, [18:41:47.662] inherits = FALSE)) { [18:41:47.662] master <- get("master", mode = "list", [18:41:47.662] envir = envir, inherits = FALSE) [18:41:47.662] if (inherits(master, c("SOCKnode", [18:41:47.662] "SOCK0node"))) { [18:41:47.662] sendCondition <<- function(cond) { [18:41:47.662] data <- list(type = "VALUE", value = cond, [18:41:47.662] success = TRUE) [18:41:47.662] parallel_sendData(master, data) [18:41:47.662] } [18:41:47.662] return(sendCondition) [18:41:47.662] } [18:41:47.662] } [18:41:47.662] frame <- frame + 1L [18:41:47.662] envir <- sys.frame(frame) [18:41:47.662] } [18:41:47.662] } [18:41:47.662] sendCondition <<- function(cond) NULL [18:41:47.662] } [18:41:47.662] }) [18:41:47.662] withCallingHandlers({ [18:41:47.662] { [18:41:47.662] do.call(function(...) { [18:41:47.662] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.662] if (!identical(...future.globals.maxSize.org, [18:41:47.662] ...future.globals.maxSize)) { [18:41:47.662] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.662] on.exit(options(oopts), add = TRUE) [18:41:47.662] } [18:41:47.662] { [18:41:47.662] lapply(seq_along(...future.elements_ii), [18:41:47.662] FUN = function(jj) { [18:41:47.662] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.662] ...future.FUN(...future.X_jj, ...) [18:41:47.662] }) [18:41:47.662] } [18:41:47.662] }, args = future.call.arguments) [18:41:47.662] } [18:41:47.662] }, immediateCondition = function(cond) { [18:41:47.662] sendCondition <- ...future.makeSendCondition() [18:41:47.662] sendCondition(cond) [18:41:47.662] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.662] { [18:41:47.662] inherits <- base::inherits [18:41:47.662] invokeRestart <- base::invokeRestart [18:41:47.662] is.null <- base::is.null [18:41:47.662] muffled <- FALSE [18:41:47.662] if (inherits(cond, "message")) { [18:41:47.662] muffled <- grepl(pattern, "muffleMessage") [18:41:47.662] if (muffled) [18:41:47.662] invokeRestart("muffleMessage") [18:41:47.662] } [18:41:47.662] else if (inherits(cond, "warning")) { [18:41:47.662] muffled <- grepl(pattern, "muffleWarning") [18:41:47.662] if (muffled) [18:41:47.662] invokeRestart("muffleWarning") [18:41:47.662] } [18:41:47.662] else if (inherits(cond, "condition")) { [18:41:47.662] if (!is.null(pattern)) { [18:41:47.662] computeRestarts <- base::computeRestarts [18:41:47.662] grepl <- base::grepl [18:41:47.662] restarts <- computeRestarts(cond) [18:41:47.662] for (restart in restarts) { [18:41:47.662] name <- restart$name [18:41:47.662] if (is.null(name)) [18:41:47.662] next [18:41:47.662] if (!grepl(pattern, name)) [18:41:47.662] next [18:41:47.662] invokeRestart(restart) [18:41:47.662] muffled <- TRUE [18:41:47.662] break [18:41:47.662] } [18:41:47.662] } [18:41:47.662] } [18:41:47.662] invisible(muffled) [18:41:47.662] } [18:41:47.662] muffleCondition(cond) [18:41:47.662] }) [18:41:47.662] })) [18:41:47.662] future::FutureResult(value = ...future.value$value, [18:41:47.662] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.662] ...future.rng), globalenv = if (FALSE) [18:41:47.662] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.662] ...future.globalenv.names)) [18:41:47.662] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.662] }, condition = base::local({ [18:41:47.662] c <- base::c [18:41:47.662] inherits <- base::inherits [18:41:47.662] invokeRestart <- base::invokeRestart [18:41:47.662] length <- base::length [18:41:47.662] list <- base::list [18:41:47.662] seq.int <- base::seq.int [18:41:47.662] signalCondition <- base::signalCondition [18:41:47.662] sys.calls <- base::sys.calls [18:41:47.662] `[[` <- base::`[[` [18:41:47.662] `+` <- base::`+` [18:41:47.662] `<<-` <- base::`<<-` [18:41:47.662] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.662] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.662] 3L)] [18:41:47.662] } [18:41:47.662] function(cond) { [18:41:47.662] is_error <- inherits(cond, "error") [18:41:47.662] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.662] NULL) [18:41:47.662] if (is_error) { [18:41:47.662] sessionInformation <- function() { [18:41:47.662] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.662] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.662] search = base::search(), system = base::Sys.info()) [18:41:47.662] } [18:41:47.662] ...future.conditions[[length(...future.conditions) + [18:41:47.662] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.662] cond$call), session = sessionInformation(), [18:41:47.662] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.662] signalCondition(cond) [18:41:47.662] } [18:41:47.662] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.662] "immediateCondition"))) { [18:41:47.662] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.662] ...future.conditions[[length(...future.conditions) + [18:41:47.662] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.662] if (TRUE && !signal) { [18:41:47.662] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.662] { [18:41:47.662] inherits <- base::inherits [18:41:47.662] invokeRestart <- base::invokeRestart [18:41:47.662] is.null <- base::is.null [18:41:47.662] muffled <- FALSE [18:41:47.662] if (inherits(cond, "message")) { [18:41:47.662] muffled <- grepl(pattern, "muffleMessage") [18:41:47.662] if (muffled) [18:41:47.662] invokeRestart("muffleMessage") [18:41:47.662] } [18:41:47.662] else if (inherits(cond, "warning")) { [18:41:47.662] muffled <- grepl(pattern, "muffleWarning") [18:41:47.662] if (muffled) [18:41:47.662] invokeRestart("muffleWarning") [18:41:47.662] } [18:41:47.662] else if (inherits(cond, "condition")) { [18:41:47.662] if (!is.null(pattern)) { [18:41:47.662] computeRestarts <- base::computeRestarts [18:41:47.662] grepl <- base::grepl [18:41:47.662] restarts <- computeRestarts(cond) [18:41:47.662] for (restart in restarts) { [18:41:47.662] name <- restart$name [18:41:47.662] if (is.null(name)) [18:41:47.662] next [18:41:47.662] if (!grepl(pattern, name)) [18:41:47.662] next [18:41:47.662] invokeRestart(restart) [18:41:47.662] muffled <- TRUE [18:41:47.662] break [18:41:47.662] } [18:41:47.662] } [18:41:47.662] } [18:41:47.662] invisible(muffled) [18:41:47.662] } [18:41:47.662] muffleCondition(cond, pattern = "^muffle") [18:41:47.662] } [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] if (TRUE) { [18:41:47.662] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.662] { [18:41:47.662] inherits <- base::inherits [18:41:47.662] invokeRestart <- base::invokeRestart [18:41:47.662] is.null <- base::is.null [18:41:47.662] muffled <- FALSE [18:41:47.662] if (inherits(cond, "message")) { [18:41:47.662] muffled <- grepl(pattern, "muffleMessage") [18:41:47.662] if (muffled) [18:41:47.662] invokeRestart("muffleMessage") [18:41:47.662] } [18:41:47.662] else if (inherits(cond, "warning")) { [18:41:47.662] muffled <- grepl(pattern, "muffleWarning") [18:41:47.662] if (muffled) [18:41:47.662] invokeRestart("muffleWarning") [18:41:47.662] } [18:41:47.662] else if (inherits(cond, "condition")) { [18:41:47.662] if (!is.null(pattern)) { [18:41:47.662] computeRestarts <- base::computeRestarts [18:41:47.662] grepl <- base::grepl [18:41:47.662] restarts <- computeRestarts(cond) [18:41:47.662] for (restart in restarts) { [18:41:47.662] name <- restart$name [18:41:47.662] if (is.null(name)) [18:41:47.662] next [18:41:47.662] if (!grepl(pattern, name)) [18:41:47.662] next [18:41:47.662] invokeRestart(restart) [18:41:47.662] muffled <- TRUE [18:41:47.662] break [18:41:47.662] } [18:41:47.662] } [18:41:47.662] } [18:41:47.662] invisible(muffled) [18:41:47.662] } [18:41:47.662] muffleCondition(cond, pattern = "^muffle") [18:41:47.662] } [18:41:47.662] } [18:41:47.662] } [18:41:47.662] })) [18:41:47.662] }, error = function(ex) { [18:41:47.662] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.662] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.662] ...future.rng), started = ...future.startTime, [18:41:47.662] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.662] version = "1.8"), class = "FutureResult") [18:41:47.662] }, finally = { [18:41:47.662] if (!identical(...future.workdir, getwd())) [18:41:47.662] setwd(...future.workdir) [18:41:47.662] { [18:41:47.662] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.662] ...future.oldOptions$nwarnings <- NULL [18:41:47.662] } [18:41:47.662] base::options(...future.oldOptions) [18:41:47.662] if (.Platform$OS.type == "windows") { [18:41:47.662] old_names <- names(...future.oldEnvVars) [18:41:47.662] envs <- base::Sys.getenv() [18:41:47.662] names <- names(envs) [18:41:47.662] common <- intersect(names, old_names) [18:41:47.662] added <- setdiff(names, old_names) [18:41:47.662] removed <- setdiff(old_names, names) [18:41:47.662] changed <- common[...future.oldEnvVars[common] != [18:41:47.662] envs[common]] [18:41:47.662] NAMES <- toupper(changed) [18:41:47.662] args <- list() [18:41:47.662] for (kk in seq_along(NAMES)) { [18:41:47.662] name <- changed[[kk]] [18:41:47.662] NAME <- NAMES[[kk]] [18:41:47.662] if (name != NAME && is.element(NAME, old_names)) [18:41:47.662] next [18:41:47.662] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.662] } [18:41:47.662] NAMES <- toupper(added) [18:41:47.662] for (kk in seq_along(NAMES)) { [18:41:47.662] name <- added[[kk]] [18:41:47.662] NAME <- NAMES[[kk]] [18:41:47.662] if (name != NAME && is.element(NAME, old_names)) [18:41:47.662] next [18:41:47.662] args[[name]] <- "" [18:41:47.662] } [18:41:47.662] NAMES <- toupper(removed) [18:41:47.662] for (kk in seq_along(NAMES)) { [18:41:47.662] name <- removed[[kk]] [18:41:47.662] NAME <- NAMES[[kk]] [18:41:47.662] if (name != NAME && is.element(NAME, old_names)) [18:41:47.662] next [18:41:47.662] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.662] } [18:41:47.662] if (length(args) > 0) [18:41:47.662] base::do.call(base::Sys.setenv, args = args) [18:41:47.662] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.662] } [18:41:47.662] { [18:41:47.662] if (base::length(...future.futureOptionsAdded) > [18:41:47.662] 0L) { [18:41:47.662] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.662] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.662] base::options(opts) [18:41:47.662] } [18:41:47.662] { [18:41:47.662] { [18:41:47.662] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.662] NULL [18:41:47.662] } [18:41:47.662] options(future.plan = NULL) [18:41:47.662] if (is.na(NA_character_)) [18:41:47.662] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.662] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.662] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.662] .init = FALSE) [18:41:47.662] } [18:41:47.662] } [18:41:47.662] } [18:41:47.662] }) [18:41:47.662] if (TRUE) { [18:41:47.662] base::sink(type = "output", split = FALSE) [18:41:47.662] if (TRUE) { [18:41:47.662] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.662] } [18:41:47.662] else { [18:41:47.662] ...future.result["stdout"] <- base::list(NULL) [18:41:47.662] } [18:41:47.662] base::close(...future.stdout) [18:41:47.662] ...future.stdout <- NULL [18:41:47.662] } [18:41:47.662] ...future.result$conditions <- ...future.conditions [18:41:47.662] ...future.result$finished <- base::Sys.time() [18:41:47.662] ...future.result [18:41:47.662] } [18:41:47.668] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:47.669] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:47.669] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:47.669] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.670] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.670] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.671] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.671] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.671] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.671] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.672] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.672] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:47.673] MultisessionFuture started [18:41:47.673] - Launch lazy future ... done [18:41:47.678] run() for 'MultisessionFuture' ... done [18:41:47.678] Created future: [18:41:47.687] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.687] - Validating connection of MultisessionFuture [18:41:47.687] - received message: FutureResult [18:41:47.688] - Received FutureResult [18:41:47.688] - Erased future from FutureRegistry [18:41:47.688] result() for ClusterFuture ... [18:41:47.688] - result already collected: FutureResult [18:41:47.688] result() for ClusterFuture ... done [18:41:47.689] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.679] MultisessionFuture: [18:41:47.679] Label: 'future_sapply-2' [18:41:47.679] Expression: [18:41:47.679] { [18:41:47.679] do.call(function(...) { [18:41:47.679] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.679] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.679] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.679] on.exit(options(oopts), add = TRUE) [18:41:47.679] } [18:41:47.679] { [18:41:47.679] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.679] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.679] ...future.FUN(...future.X_jj, ...) [18:41:47.679] }) [18:41:47.679] } [18:41:47.679] }, args = future.call.arguments) [18:41:47.679] } [18:41:47.679] Lazy evaluation: FALSE [18:41:47.679] Asynchronous evaluation: TRUE [18:41:47.679] Local evaluation: TRUE [18:41:47.679] Environment: R_GlobalEnv [18:41:47.679] Capture standard output: TRUE [18:41:47.679] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.679] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.679] Packages: [18:41:47.679] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.679] Resolved: TRUE [18:41:47.679] Value: [18:41:47.679] Conditions captured: [18:41:47.679] Early signaling: FALSE [18:41:47.679] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.679] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.689] Chunk #2 of 2 ... DONE [18:41:47.689] Launching 2 futures (chunks) ... DONE [18:41:47.689] Resolving 2 futures (chunks) ... [18:41:47.689] resolve() on list ... [18:41:47.690] recursive: 0 [18:41:47.690] length: 2 [18:41:47.690] [18:41:47.690] Future #1 [18:41:47.690] result() for ClusterFuture ... [18:41:47.690] - result already collected: FutureResult [18:41:47.691] result() for ClusterFuture ... done [18:41:47.691] result() for ClusterFuture ... [18:41:47.691] - result already collected: FutureResult [18:41:47.691] result() for ClusterFuture ... done [18:41:47.691] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:47.691] - nx: 2 [18:41:47.692] - relay: TRUE [18:41:47.692] - stdout: TRUE [18:41:47.692] - signal: TRUE [18:41:47.692] - resignal: FALSE [18:41:47.692] - force: TRUE [18:41:47.692] - relayed: [n=2] FALSE, FALSE [18:41:47.692] - queued futures: [n=2] FALSE, FALSE [18:41:47.693] - until=1 [18:41:47.693] - relaying element #1 [18:41:47.693] result() for ClusterFuture ... [18:41:47.693] - result already collected: FutureResult [18:41:47.693] result() for ClusterFuture ... done [18:41:47.693] result() for ClusterFuture ... [18:41:47.694] - result already collected: FutureResult [18:41:47.694] result() for ClusterFuture ... done [18:41:47.694] result() for ClusterFuture ... [18:41:47.694] - result already collected: FutureResult [18:41:47.694] result() for ClusterFuture ... done [18:41:47.694] result() for ClusterFuture ... [18:41:47.695] - result already collected: FutureResult [18:41:47.695] result() for ClusterFuture ... done [18:41:47.695] - relayed: [n=2] TRUE, FALSE [18:41:47.695] - queued futures: [n=2] TRUE, FALSE [18:41:47.695] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:47.695] length: 1 (resolved future 1) [18:41:47.696] Future #2 [18:41:47.696] result() for ClusterFuture ... [18:41:47.696] - result already collected: FutureResult [18:41:47.696] result() for ClusterFuture ... done [18:41:47.696] result() for ClusterFuture ... [18:41:47.696] - result already collected: FutureResult [18:41:47.696] result() for ClusterFuture ... done [18:41:47.697] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:47.697] - nx: 2 [18:41:47.697] - relay: TRUE [18:41:47.697] - stdout: TRUE [18:41:47.697] - signal: TRUE [18:41:47.697] - resignal: FALSE [18:41:47.698] - force: TRUE [18:41:47.698] - relayed: [n=2] TRUE, FALSE [18:41:47.698] - queued futures: [n=2] TRUE, FALSE [18:41:47.698] - until=2 [18:41:47.698] - relaying element #2 [18:41:47.698] result() for ClusterFuture ... [18:41:47.698] - result already collected: FutureResult [18:41:47.699] result() for ClusterFuture ... done [18:41:47.699] result() for ClusterFuture ... [18:41:47.699] - result already collected: FutureResult [18:41:47.699] result() for ClusterFuture ... done [18:41:47.699] result() for ClusterFuture ... [18:41:47.699] - result already collected: FutureResult [18:41:47.700] result() for ClusterFuture ... done [18:41:47.700] result() for ClusterFuture ... [18:41:47.700] - result already collected: FutureResult [18:41:47.700] result() for ClusterFuture ... done [18:41:47.700] - relayed: [n=2] TRUE, TRUE [18:41:47.700] - queued futures: [n=2] TRUE, TRUE [18:41:47.700] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:47.701] length: 0 (resolved future 2) [18:41:47.701] Relaying remaining futures [18:41:47.701] signalConditionsASAP(NULL, pos=0) ... [18:41:47.701] - nx: 2 [18:41:47.701] - relay: TRUE [18:41:47.701] - stdout: TRUE [18:41:47.702] - signal: TRUE [18:41:47.702] - resignal: FALSE [18:41:47.702] - force: TRUE [18:41:47.702] - relayed: [n=2] TRUE, TRUE [18:41:47.702] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:47.702] - relayed: [n=2] TRUE, TRUE [18:41:47.703] - queued futures: [n=2] TRUE, TRUE [18:41:47.703] signalConditionsASAP(NULL, pos=0) ... done [18:41:47.703] resolve() on list ... DONE [18:41:47.703] result() for ClusterFuture ... [18:41:47.703] - result already collected: FutureResult [18:41:47.703] result() for ClusterFuture ... done [18:41:47.703] result() for ClusterFuture ... [18:41:47.704] - result already collected: FutureResult [18:41:47.704] result() for ClusterFuture ... done [18:41:47.704] result() for ClusterFuture ... [18:41:47.704] - result already collected: FutureResult [18:41:47.704] result() for ClusterFuture ... done [18:41:47.704] result() for ClusterFuture ... [18:41:47.705] - result already collected: FutureResult [18:41:47.705] result() for ClusterFuture ... done [18:41:47.705] - Number of value chunks collected: 2 [18:41:47.705] Resolving 2 futures (chunks) ... DONE [18:41:47.705] Reducing values from 2 chunks ... [18:41:47.705] - Number of values collected after concatenation: 3 [18:41:47.706] - Number of values expected: 3 [18:41:47.706] Reducing values from 2 chunks ... DONE [18:41:47.706] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:47.709] future_lapply() ... [18:41:47.713] Number of chunks: 2 [18:41:47.713] getGlobalsAndPackagesXApply() ... [18:41:47.713] - future.globals: TRUE [18:41:47.713] getGlobalsAndPackages() ... [18:41:47.713] Searching for globals... [18:41:47.715] - globals found: [1] 'FUN' [18:41:47.715] Searching for globals ... DONE [18:41:47.715] Resolving globals: FALSE [18:41:47.715] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:47.716] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:47.716] - globals: [1] 'FUN' [18:41:47.716] [18:41:47.716] getGlobalsAndPackages() ... DONE [18:41:47.716] - globals found/used: [n=1] 'FUN' [18:41:47.717] - needed namespaces: [n=0] [18:41:47.717] Finding globals ... DONE [18:41:47.717] - use_args: TRUE [18:41:47.717] - Getting '...' globals ... [18:41:47.718] resolve() on list ... [18:41:47.718] recursive: 0 [18:41:47.718] length: 1 [18:41:47.718] elements: '...' [18:41:47.718] length: 0 (resolved future 1) [18:41:47.718] resolve() on list ... DONE [18:41:47.719] - '...' content: [n=0] [18:41:47.719] List of 1 [18:41:47.719] $ ...: list() [18:41:47.719] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.719] - attr(*, "where")=List of 1 [18:41:47.719] ..$ ...: [18:41:47.719] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.719] - attr(*, "resolved")= logi TRUE [18:41:47.719] - attr(*, "total_size")= num NA [18:41:47.722] - Getting '...' globals ... DONE [18:41:47.722] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:47.722] List of 2 [18:41:47.722] $ ...future.FUN:function (x) [18:41:47.722] $ ... : list() [18:41:47.722] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.722] - attr(*, "where")=List of 2 [18:41:47.722] ..$ ...future.FUN: [18:41:47.722] ..$ ... : [18:41:47.722] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.722] - attr(*, "resolved")= logi FALSE [18:41:47.722] - attr(*, "total_size")= int 4876 [18:41:47.726] Packages to be attached in all futures: [n=0] [18:41:47.726] getGlobalsAndPackagesXApply() ... DONE [18:41:47.726] Number of futures (= number of chunks): 2 [18:41:47.726] Launching 2 futures (chunks) ... [18:41:47.726] Chunk #1 of 2 ... [18:41:47.727] - Finding globals in 'X' for chunk #1 ... [18:41:47.727] getGlobalsAndPackages() ... [18:41:47.727] Searching for globals... [18:41:47.727] [18:41:47.727] Searching for globals ... DONE [18:41:47.728] - globals: [0] [18:41:47.728] getGlobalsAndPackages() ... DONE [18:41:47.728] + additional globals found: [n=0] [18:41:47.728] + additional namespaces needed: [n=0] [18:41:47.728] - Finding globals in 'X' for chunk #1 ... DONE [18:41:47.728] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.728] - seeds: [18:41:47.729] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.729] getGlobalsAndPackages() ... [18:41:47.729] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.729] Resolving globals: FALSE [18:41:47.729] Tweak future expression to call with '...' arguments ... [18:41:47.730] { [18:41:47.730] do.call(function(...) { [18:41:47.730] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.730] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.730] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.730] on.exit(options(oopts), add = TRUE) [18:41:47.730] } [18:41:47.730] { [18:41:47.730] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.730] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.730] ...future.FUN(...future.X_jj, ...) [18:41:47.730] }) [18:41:47.730] } [18:41:47.730] }, args = future.call.arguments) [18:41:47.730] } [18:41:47.730] Tweak future expression to call with '...' arguments ... DONE [18:41:47.730] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.731] [18:41:47.731] getGlobalsAndPackages() ... DONE [18:41:47.731] run() for 'Future' ... [18:41:47.731] - state: 'created' [18:41:47.732] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.749] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.749] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.750] - Field: 'node' [18:41:47.750] - Field: 'label' [18:41:47.750] - Field: 'local' [18:41:47.751] - Field: 'owner' [18:41:47.751] - Field: 'envir' [18:41:47.751] - Field: 'workers' [18:41:47.751] - Field: 'packages' [18:41:47.752] - Field: 'gc' [18:41:47.752] - Field: 'conditions' [18:41:47.752] - Field: 'persistent' [18:41:47.753] - Field: 'expr' [18:41:47.753] - Field: 'uuid' [18:41:47.753] - Field: 'seed' [18:41:47.753] - Field: 'version' [18:41:47.754] - Field: 'result' [18:41:47.754] - Field: 'asynchronous' [18:41:47.754] - Field: 'calls' [18:41:47.755] - Field: 'globals' [18:41:47.755] - Field: 'stdout' [18:41:47.755] - Field: 'earlySignal' [18:41:47.755] - Field: 'lazy' [18:41:47.756] - Field: 'state' [18:41:47.756] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.756] - Launch lazy future ... [18:41:47.757] Packages needed by the future expression (n = 0): [18:41:47.757] Packages needed by future strategies (n = 0): [18:41:47.758] { [18:41:47.758] { [18:41:47.758] { [18:41:47.758] ...future.startTime <- base::Sys.time() [18:41:47.758] { [18:41:47.758] { [18:41:47.758] { [18:41:47.758] { [18:41:47.758] base::local({ [18:41:47.758] has_future <- base::requireNamespace("future", [18:41:47.758] quietly = TRUE) [18:41:47.758] if (has_future) { [18:41:47.758] ns <- base::getNamespace("future") [18:41:47.758] version <- ns[[".package"]][["version"]] [18:41:47.758] if (is.null(version)) [18:41:47.758] version <- utils::packageVersion("future") [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] version <- NULL [18:41:47.758] } [18:41:47.758] if (!has_future || version < "1.8.0") { [18:41:47.758] info <- base::c(r_version = base::gsub("R version ", [18:41:47.758] "", base::R.version$version.string), [18:41:47.758] platform = base::sprintf("%s (%s-bit)", [18:41:47.758] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.758] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.758] "release", "version")], collapse = " "), [18:41:47.758] hostname = base::Sys.info()[["nodename"]]) [18:41:47.758] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.758] info) [18:41:47.758] info <- base::paste(info, collapse = "; ") [18:41:47.758] if (!has_future) { [18:41:47.758] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.758] info) [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.758] info, version) [18:41:47.758] } [18:41:47.758] base::stop(msg) [18:41:47.758] } [18:41:47.758] }) [18:41:47.758] } [18:41:47.758] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.758] base::options(mc.cores = 1L) [18:41:47.758] } [18:41:47.758] ...future.strategy.old <- future::plan("list") [18:41:47.758] options(future.plan = NULL) [18:41:47.758] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.758] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.758] } [18:41:47.758] ...future.workdir <- getwd() [18:41:47.758] } [18:41:47.758] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.758] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.758] } [18:41:47.758] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.758] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.758] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.758] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.758] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.758] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.758] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.758] base::names(...future.oldOptions)) [18:41:47.758] } [18:41:47.758] if (FALSE) { [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] if (TRUE) { [18:41:47.758] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.758] open = "w") [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.758] windows = "NUL", "/dev/null"), open = "w") [18:41:47.758] } [18:41:47.758] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.758] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.758] base::sink(type = "output", split = FALSE) [18:41:47.758] base::close(...future.stdout) [18:41:47.758] }, add = TRUE) [18:41:47.758] } [18:41:47.758] ...future.frame <- base::sys.nframe() [18:41:47.758] ...future.conditions <- base::list() [18:41:47.758] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.758] if (FALSE) { [18:41:47.758] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.758] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.758] } [18:41:47.758] ...future.result <- base::tryCatch({ [18:41:47.758] base::withCallingHandlers({ [18:41:47.758] ...future.value <- base::withVisible(base::local({ [18:41:47.758] ...future.makeSendCondition <- base::local({ [18:41:47.758] sendCondition <- NULL [18:41:47.758] function(frame = 1L) { [18:41:47.758] if (is.function(sendCondition)) [18:41:47.758] return(sendCondition) [18:41:47.758] ns <- getNamespace("parallel") [18:41:47.758] if (exists("sendData", mode = "function", [18:41:47.758] envir = ns)) { [18:41:47.758] parallel_sendData <- get("sendData", mode = "function", [18:41:47.758] envir = ns) [18:41:47.758] envir <- sys.frame(frame) [18:41:47.758] master <- NULL [18:41:47.758] while (!identical(envir, .GlobalEnv) && [18:41:47.758] !identical(envir, emptyenv())) { [18:41:47.758] if (exists("master", mode = "list", envir = envir, [18:41:47.758] inherits = FALSE)) { [18:41:47.758] master <- get("master", mode = "list", [18:41:47.758] envir = envir, inherits = FALSE) [18:41:47.758] if (inherits(master, c("SOCKnode", [18:41:47.758] "SOCK0node"))) { [18:41:47.758] sendCondition <<- function(cond) { [18:41:47.758] data <- list(type = "VALUE", value = cond, [18:41:47.758] success = TRUE) [18:41:47.758] parallel_sendData(master, data) [18:41:47.758] } [18:41:47.758] return(sendCondition) [18:41:47.758] } [18:41:47.758] } [18:41:47.758] frame <- frame + 1L [18:41:47.758] envir <- sys.frame(frame) [18:41:47.758] } [18:41:47.758] } [18:41:47.758] sendCondition <<- function(cond) NULL [18:41:47.758] } [18:41:47.758] }) [18:41:47.758] withCallingHandlers({ [18:41:47.758] { [18:41:47.758] do.call(function(...) { [18:41:47.758] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.758] if (!identical(...future.globals.maxSize.org, [18:41:47.758] ...future.globals.maxSize)) { [18:41:47.758] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.758] on.exit(options(oopts), add = TRUE) [18:41:47.758] } [18:41:47.758] { [18:41:47.758] lapply(seq_along(...future.elements_ii), [18:41:47.758] FUN = function(jj) { [18:41:47.758] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.758] ...future.FUN(...future.X_jj, ...) [18:41:47.758] }) [18:41:47.758] } [18:41:47.758] }, args = future.call.arguments) [18:41:47.758] } [18:41:47.758] }, immediateCondition = function(cond) { [18:41:47.758] sendCondition <- ...future.makeSendCondition() [18:41:47.758] sendCondition(cond) [18:41:47.758] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.758] { [18:41:47.758] inherits <- base::inherits [18:41:47.758] invokeRestart <- base::invokeRestart [18:41:47.758] is.null <- base::is.null [18:41:47.758] muffled <- FALSE [18:41:47.758] if (inherits(cond, "message")) { [18:41:47.758] muffled <- grepl(pattern, "muffleMessage") [18:41:47.758] if (muffled) [18:41:47.758] invokeRestart("muffleMessage") [18:41:47.758] } [18:41:47.758] else if (inherits(cond, "warning")) { [18:41:47.758] muffled <- grepl(pattern, "muffleWarning") [18:41:47.758] if (muffled) [18:41:47.758] invokeRestart("muffleWarning") [18:41:47.758] } [18:41:47.758] else if (inherits(cond, "condition")) { [18:41:47.758] if (!is.null(pattern)) { [18:41:47.758] computeRestarts <- base::computeRestarts [18:41:47.758] grepl <- base::grepl [18:41:47.758] restarts <- computeRestarts(cond) [18:41:47.758] for (restart in restarts) { [18:41:47.758] name <- restart$name [18:41:47.758] if (is.null(name)) [18:41:47.758] next [18:41:47.758] if (!grepl(pattern, name)) [18:41:47.758] next [18:41:47.758] invokeRestart(restart) [18:41:47.758] muffled <- TRUE [18:41:47.758] break [18:41:47.758] } [18:41:47.758] } [18:41:47.758] } [18:41:47.758] invisible(muffled) [18:41:47.758] } [18:41:47.758] muffleCondition(cond) [18:41:47.758] }) [18:41:47.758] })) [18:41:47.758] future::FutureResult(value = ...future.value$value, [18:41:47.758] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.758] ...future.rng), globalenv = if (FALSE) [18:41:47.758] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.758] ...future.globalenv.names)) [18:41:47.758] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.758] }, condition = base::local({ [18:41:47.758] c <- base::c [18:41:47.758] inherits <- base::inherits [18:41:47.758] invokeRestart <- base::invokeRestart [18:41:47.758] length <- base::length [18:41:47.758] list <- base::list [18:41:47.758] seq.int <- base::seq.int [18:41:47.758] signalCondition <- base::signalCondition [18:41:47.758] sys.calls <- base::sys.calls [18:41:47.758] `[[` <- base::`[[` [18:41:47.758] `+` <- base::`+` [18:41:47.758] `<<-` <- base::`<<-` [18:41:47.758] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.758] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.758] 3L)] [18:41:47.758] } [18:41:47.758] function(cond) { [18:41:47.758] is_error <- inherits(cond, "error") [18:41:47.758] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.758] NULL) [18:41:47.758] if (is_error) { [18:41:47.758] sessionInformation <- function() { [18:41:47.758] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.758] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.758] search = base::search(), system = base::Sys.info()) [18:41:47.758] } [18:41:47.758] ...future.conditions[[length(...future.conditions) + [18:41:47.758] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.758] cond$call), session = sessionInformation(), [18:41:47.758] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.758] signalCondition(cond) [18:41:47.758] } [18:41:47.758] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.758] "immediateCondition"))) { [18:41:47.758] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.758] ...future.conditions[[length(...future.conditions) + [18:41:47.758] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.758] if (TRUE && !signal) { [18:41:47.758] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.758] { [18:41:47.758] inherits <- base::inherits [18:41:47.758] invokeRestart <- base::invokeRestart [18:41:47.758] is.null <- base::is.null [18:41:47.758] muffled <- FALSE [18:41:47.758] if (inherits(cond, "message")) { [18:41:47.758] muffled <- grepl(pattern, "muffleMessage") [18:41:47.758] if (muffled) [18:41:47.758] invokeRestart("muffleMessage") [18:41:47.758] } [18:41:47.758] else if (inherits(cond, "warning")) { [18:41:47.758] muffled <- grepl(pattern, "muffleWarning") [18:41:47.758] if (muffled) [18:41:47.758] invokeRestart("muffleWarning") [18:41:47.758] } [18:41:47.758] else if (inherits(cond, "condition")) { [18:41:47.758] if (!is.null(pattern)) { [18:41:47.758] computeRestarts <- base::computeRestarts [18:41:47.758] grepl <- base::grepl [18:41:47.758] restarts <- computeRestarts(cond) [18:41:47.758] for (restart in restarts) { [18:41:47.758] name <- restart$name [18:41:47.758] if (is.null(name)) [18:41:47.758] next [18:41:47.758] if (!grepl(pattern, name)) [18:41:47.758] next [18:41:47.758] invokeRestart(restart) [18:41:47.758] muffled <- TRUE [18:41:47.758] break [18:41:47.758] } [18:41:47.758] } [18:41:47.758] } [18:41:47.758] invisible(muffled) [18:41:47.758] } [18:41:47.758] muffleCondition(cond, pattern = "^muffle") [18:41:47.758] } [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] if (TRUE) { [18:41:47.758] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.758] { [18:41:47.758] inherits <- base::inherits [18:41:47.758] invokeRestart <- base::invokeRestart [18:41:47.758] is.null <- base::is.null [18:41:47.758] muffled <- FALSE [18:41:47.758] if (inherits(cond, "message")) { [18:41:47.758] muffled <- grepl(pattern, "muffleMessage") [18:41:47.758] if (muffled) [18:41:47.758] invokeRestart("muffleMessage") [18:41:47.758] } [18:41:47.758] else if (inherits(cond, "warning")) { [18:41:47.758] muffled <- grepl(pattern, "muffleWarning") [18:41:47.758] if (muffled) [18:41:47.758] invokeRestart("muffleWarning") [18:41:47.758] } [18:41:47.758] else if (inherits(cond, "condition")) { [18:41:47.758] if (!is.null(pattern)) { [18:41:47.758] computeRestarts <- base::computeRestarts [18:41:47.758] grepl <- base::grepl [18:41:47.758] restarts <- computeRestarts(cond) [18:41:47.758] for (restart in restarts) { [18:41:47.758] name <- restart$name [18:41:47.758] if (is.null(name)) [18:41:47.758] next [18:41:47.758] if (!grepl(pattern, name)) [18:41:47.758] next [18:41:47.758] invokeRestart(restart) [18:41:47.758] muffled <- TRUE [18:41:47.758] break [18:41:47.758] } [18:41:47.758] } [18:41:47.758] } [18:41:47.758] invisible(muffled) [18:41:47.758] } [18:41:47.758] muffleCondition(cond, pattern = "^muffle") [18:41:47.758] } [18:41:47.758] } [18:41:47.758] } [18:41:47.758] })) [18:41:47.758] }, error = function(ex) { [18:41:47.758] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.758] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.758] ...future.rng), started = ...future.startTime, [18:41:47.758] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.758] version = "1.8"), class = "FutureResult") [18:41:47.758] }, finally = { [18:41:47.758] if (!identical(...future.workdir, getwd())) [18:41:47.758] setwd(...future.workdir) [18:41:47.758] { [18:41:47.758] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.758] ...future.oldOptions$nwarnings <- NULL [18:41:47.758] } [18:41:47.758] base::options(...future.oldOptions) [18:41:47.758] if (.Platform$OS.type == "windows") { [18:41:47.758] old_names <- names(...future.oldEnvVars) [18:41:47.758] envs <- base::Sys.getenv() [18:41:47.758] names <- names(envs) [18:41:47.758] common <- intersect(names, old_names) [18:41:47.758] added <- setdiff(names, old_names) [18:41:47.758] removed <- setdiff(old_names, names) [18:41:47.758] changed <- common[...future.oldEnvVars[common] != [18:41:47.758] envs[common]] [18:41:47.758] NAMES <- toupper(changed) [18:41:47.758] args <- list() [18:41:47.758] for (kk in seq_along(NAMES)) { [18:41:47.758] name <- changed[[kk]] [18:41:47.758] NAME <- NAMES[[kk]] [18:41:47.758] if (name != NAME && is.element(NAME, old_names)) [18:41:47.758] next [18:41:47.758] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.758] } [18:41:47.758] NAMES <- toupper(added) [18:41:47.758] for (kk in seq_along(NAMES)) { [18:41:47.758] name <- added[[kk]] [18:41:47.758] NAME <- NAMES[[kk]] [18:41:47.758] if (name != NAME && is.element(NAME, old_names)) [18:41:47.758] next [18:41:47.758] args[[name]] <- "" [18:41:47.758] } [18:41:47.758] NAMES <- toupper(removed) [18:41:47.758] for (kk in seq_along(NAMES)) { [18:41:47.758] name <- removed[[kk]] [18:41:47.758] NAME <- NAMES[[kk]] [18:41:47.758] if (name != NAME && is.element(NAME, old_names)) [18:41:47.758] next [18:41:47.758] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.758] } [18:41:47.758] if (length(args) > 0) [18:41:47.758] base::do.call(base::Sys.setenv, args = args) [18:41:47.758] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.758] } [18:41:47.758] { [18:41:47.758] if (base::length(...future.futureOptionsAdded) > [18:41:47.758] 0L) { [18:41:47.758] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.758] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.758] base::options(opts) [18:41:47.758] } [18:41:47.758] { [18:41:47.758] { [18:41:47.758] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.758] NULL [18:41:47.758] } [18:41:47.758] options(future.plan = NULL) [18:41:47.758] if (is.na(NA_character_)) [18:41:47.758] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.758] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.758] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.758] .init = FALSE) [18:41:47.758] } [18:41:47.758] } [18:41:47.758] } [18:41:47.758] }) [18:41:47.758] if (TRUE) { [18:41:47.758] base::sink(type = "output", split = FALSE) [18:41:47.758] if (TRUE) { [18:41:47.758] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.758] } [18:41:47.758] else { [18:41:47.758] ...future.result["stdout"] <- base::list(NULL) [18:41:47.758] } [18:41:47.758] base::close(...future.stdout) [18:41:47.758] ...future.stdout <- NULL [18:41:47.758] } [18:41:47.758] ...future.result$conditions <- ...future.conditions [18:41:47.758] ...future.result$finished <- base::Sys.time() [18:41:47.758] ...future.result [18:41:47.758] } [18:41:47.767] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:47.767] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:47.768] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:47.768] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.768] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.769] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:47.769] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:47.770] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.770] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.770] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.771] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.771] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:47.772] MultisessionFuture started [18:41:47.772] - Launch lazy future ... done [18:41:47.773] run() for 'MultisessionFuture' ... done [18:41:47.773] Created future: [18:41:47.787] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.787] - Validating connection of MultisessionFuture [18:41:47.787] - received message: FutureResult [18:41:47.788] - Received FutureResult [18:41:47.788] - Erased future from FutureRegistry [18:41:47.788] result() for ClusterFuture ... [18:41:47.788] - result already collected: FutureResult [18:41:47.789] result() for ClusterFuture ... done [18:41:47.789] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.773] MultisessionFuture: [18:41:47.773] Label: 'future_sapply-1' [18:41:47.773] Expression: [18:41:47.773] { [18:41:47.773] do.call(function(...) { [18:41:47.773] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.773] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.773] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.773] on.exit(options(oopts), add = TRUE) [18:41:47.773] } [18:41:47.773] { [18:41:47.773] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.773] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.773] ...future.FUN(...future.X_jj, ...) [18:41:47.773] }) [18:41:47.773] } [18:41:47.773] }, args = future.call.arguments) [18:41:47.773] } [18:41:47.773] Lazy evaluation: FALSE [18:41:47.773] Asynchronous evaluation: TRUE [18:41:47.773] Local evaluation: TRUE [18:41:47.773] Environment: R_GlobalEnv [18:41:47.773] Capture standard output: TRUE [18:41:47.773] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.773] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.773] Packages: [18:41:47.773] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.773] Resolved: TRUE [18:41:47.773] Value: [18:41:47.773] Conditions captured: [18:41:47.773] Early signaling: FALSE [18:41:47.773] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.773] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.790] Chunk #1 of 2 ... DONE [18:41:47.790] Chunk #2 of 2 ... [18:41:47.790] - Finding globals in 'X' for chunk #2 ... [18:41:47.791] getGlobalsAndPackages() ... [18:41:47.791] Searching for globals... [18:41:47.791] [18:41:47.792] Searching for globals ... DONE [18:41:47.792] - globals: [0] [18:41:47.792] getGlobalsAndPackages() ... DONE [18:41:47.792] + additional globals found: [n=0] [18:41:47.793] + additional namespaces needed: [n=0] [18:41:47.793] - Finding globals in 'X' for chunk #2 ... DONE [18:41:47.793] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.793] - seeds: [18:41:47.794] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.794] getGlobalsAndPackages() ... [18:41:47.794] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.794] Resolving globals: FALSE [18:41:47.795] Tweak future expression to call with '...' arguments ... [18:41:47.795] { [18:41:47.795] do.call(function(...) { [18:41:47.795] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.795] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.795] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.795] on.exit(options(oopts), add = TRUE) [18:41:47.795] } [18:41:47.795] { [18:41:47.795] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.795] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.795] ...future.FUN(...future.X_jj, ...) [18:41:47.795] }) [18:41:47.795] } [18:41:47.795] }, args = future.call.arguments) [18:41:47.795] } [18:41:47.796] Tweak future expression to call with '...' arguments ... DONE [18:41:47.797] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.797] [18:41:47.797] getGlobalsAndPackages() ... DONE [18:41:47.798] run() for 'Future' ... [18:41:47.798] - state: 'created' [18:41:47.798] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.817] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.818] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.818] - Field: 'node' [18:41:47.819] - Field: 'label' [18:41:47.819] - Field: 'local' [18:41:47.819] - Field: 'owner' [18:41:47.820] - Field: 'envir' [18:41:47.820] - Field: 'workers' [18:41:47.820] - Field: 'packages' [18:41:47.820] - Field: 'gc' [18:41:47.820] - Field: 'conditions' [18:41:47.820] - Field: 'persistent' [18:41:47.821] - Field: 'expr' [18:41:47.821] - Field: 'uuid' [18:41:47.821] - Field: 'seed' [18:41:47.821] - Field: 'version' [18:41:47.821] - Field: 'result' [18:41:47.822] - Field: 'asynchronous' [18:41:47.822] - Field: 'calls' [18:41:47.822] - Field: 'globals' [18:41:47.822] - Field: 'stdout' [18:41:47.822] - Field: 'earlySignal' [18:41:47.822] - Field: 'lazy' [18:41:47.823] - Field: 'state' [18:41:47.823] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.823] - Launch lazy future ... [18:41:47.823] Packages needed by the future expression (n = 0): [18:41:47.823] Packages needed by future strategies (n = 0): [18:41:47.824] { [18:41:47.824] { [18:41:47.824] { [18:41:47.824] ...future.startTime <- base::Sys.time() [18:41:47.824] { [18:41:47.824] { [18:41:47.824] { [18:41:47.824] { [18:41:47.824] base::local({ [18:41:47.824] has_future <- base::requireNamespace("future", [18:41:47.824] quietly = TRUE) [18:41:47.824] if (has_future) { [18:41:47.824] ns <- base::getNamespace("future") [18:41:47.824] version <- ns[[".package"]][["version"]] [18:41:47.824] if (is.null(version)) [18:41:47.824] version <- utils::packageVersion("future") [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] version <- NULL [18:41:47.824] } [18:41:47.824] if (!has_future || version < "1.8.0") { [18:41:47.824] info <- base::c(r_version = base::gsub("R version ", [18:41:47.824] "", base::R.version$version.string), [18:41:47.824] platform = base::sprintf("%s (%s-bit)", [18:41:47.824] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.824] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.824] "release", "version")], collapse = " "), [18:41:47.824] hostname = base::Sys.info()[["nodename"]]) [18:41:47.824] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.824] info) [18:41:47.824] info <- base::paste(info, collapse = "; ") [18:41:47.824] if (!has_future) { [18:41:47.824] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.824] info) [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.824] info, version) [18:41:47.824] } [18:41:47.824] base::stop(msg) [18:41:47.824] } [18:41:47.824] }) [18:41:47.824] } [18:41:47.824] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.824] base::options(mc.cores = 1L) [18:41:47.824] } [18:41:47.824] ...future.strategy.old <- future::plan("list") [18:41:47.824] options(future.plan = NULL) [18:41:47.824] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.824] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.824] } [18:41:47.824] ...future.workdir <- getwd() [18:41:47.824] } [18:41:47.824] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.824] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.824] } [18:41:47.824] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.824] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.824] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.824] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.824] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.824] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.824] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.824] base::names(...future.oldOptions)) [18:41:47.824] } [18:41:47.824] if (FALSE) { [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] if (TRUE) { [18:41:47.824] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.824] open = "w") [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.824] windows = "NUL", "/dev/null"), open = "w") [18:41:47.824] } [18:41:47.824] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.824] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.824] base::sink(type = "output", split = FALSE) [18:41:47.824] base::close(...future.stdout) [18:41:47.824] }, add = TRUE) [18:41:47.824] } [18:41:47.824] ...future.frame <- base::sys.nframe() [18:41:47.824] ...future.conditions <- base::list() [18:41:47.824] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.824] if (FALSE) { [18:41:47.824] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.824] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.824] } [18:41:47.824] ...future.result <- base::tryCatch({ [18:41:47.824] base::withCallingHandlers({ [18:41:47.824] ...future.value <- base::withVisible(base::local({ [18:41:47.824] ...future.makeSendCondition <- base::local({ [18:41:47.824] sendCondition <- NULL [18:41:47.824] function(frame = 1L) { [18:41:47.824] if (is.function(sendCondition)) [18:41:47.824] return(sendCondition) [18:41:47.824] ns <- getNamespace("parallel") [18:41:47.824] if (exists("sendData", mode = "function", [18:41:47.824] envir = ns)) { [18:41:47.824] parallel_sendData <- get("sendData", mode = "function", [18:41:47.824] envir = ns) [18:41:47.824] envir <- sys.frame(frame) [18:41:47.824] master <- NULL [18:41:47.824] while (!identical(envir, .GlobalEnv) && [18:41:47.824] !identical(envir, emptyenv())) { [18:41:47.824] if (exists("master", mode = "list", envir = envir, [18:41:47.824] inherits = FALSE)) { [18:41:47.824] master <- get("master", mode = "list", [18:41:47.824] envir = envir, inherits = FALSE) [18:41:47.824] if (inherits(master, c("SOCKnode", [18:41:47.824] "SOCK0node"))) { [18:41:47.824] sendCondition <<- function(cond) { [18:41:47.824] data <- list(type = "VALUE", value = cond, [18:41:47.824] success = TRUE) [18:41:47.824] parallel_sendData(master, data) [18:41:47.824] } [18:41:47.824] return(sendCondition) [18:41:47.824] } [18:41:47.824] } [18:41:47.824] frame <- frame + 1L [18:41:47.824] envir <- sys.frame(frame) [18:41:47.824] } [18:41:47.824] } [18:41:47.824] sendCondition <<- function(cond) NULL [18:41:47.824] } [18:41:47.824] }) [18:41:47.824] withCallingHandlers({ [18:41:47.824] { [18:41:47.824] do.call(function(...) { [18:41:47.824] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.824] if (!identical(...future.globals.maxSize.org, [18:41:47.824] ...future.globals.maxSize)) { [18:41:47.824] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.824] on.exit(options(oopts), add = TRUE) [18:41:47.824] } [18:41:47.824] { [18:41:47.824] lapply(seq_along(...future.elements_ii), [18:41:47.824] FUN = function(jj) { [18:41:47.824] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.824] ...future.FUN(...future.X_jj, ...) [18:41:47.824] }) [18:41:47.824] } [18:41:47.824] }, args = future.call.arguments) [18:41:47.824] } [18:41:47.824] }, immediateCondition = function(cond) { [18:41:47.824] sendCondition <- ...future.makeSendCondition() [18:41:47.824] sendCondition(cond) [18:41:47.824] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.824] { [18:41:47.824] inherits <- base::inherits [18:41:47.824] invokeRestart <- base::invokeRestart [18:41:47.824] is.null <- base::is.null [18:41:47.824] muffled <- FALSE [18:41:47.824] if (inherits(cond, "message")) { [18:41:47.824] muffled <- grepl(pattern, "muffleMessage") [18:41:47.824] if (muffled) [18:41:47.824] invokeRestart("muffleMessage") [18:41:47.824] } [18:41:47.824] else if (inherits(cond, "warning")) { [18:41:47.824] muffled <- grepl(pattern, "muffleWarning") [18:41:47.824] if (muffled) [18:41:47.824] invokeRestart("muffleWarning") [18:41:47.824] } [18:41:47.824] else if (inherits(cond, "condition")) { [18:41:47.824] if (!is.null(pattern)) { [18:41:47.824] computeRestarts <- base::computeRestarts [18:41:47.824] grepl <- base::grepl [18:41:47.824] restarts <- computeRestarts(cond) [18:41:47.824] for (restart in restarts) { [18:41:47.824] name <- restart$name [18:41:47.824] if (is.null(name)) [18:41:47.824] next [18:41:47.824] if (!grepl(pattern, name)) [18:41:47.824] next [18:41:47.824] invokeRestart(restart) [18:41:47.824] muffled <- TRUE [18:41:47.824] break [18:41:47.824] } [18:41:47.824] } [18:41:47.824] } [18:41:47.824] invisible(muffled) [18:41:47.824] } [18:41:47.824] muffleCondition(cond) [18:41:47.824] }) [18:41:47.824] })) [18:41:47.824] future::FutureResult(value = ...future.value$value, [18:41:47.824] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.824] ...future.rng), globalenv = if (FALSE) [18:41:47.824] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.824] ...future.globalenv.names)) [18:41:47.824] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.824] }, condition = base::local({ [18:41:47.824] c <- base::c [18:41:47.824] inherits <- base::inherits [18:41:47.824] invokeRestart <- base::invokeRestart [18:41:47.824] length <- base::length [18:41:47.824] list <- base::list [18:41:47.824] seq.int <- base::seq.int [18:41:47.824] signalCondition <- base::signalCondition [18:41:47.824] sys.calls <- base::sys.calls [18:41:47.824] `[[` <- base::`[[` [18:41:47.824] `+` <- base::`+` [18:41:47.824] `<<-` <- base::`<<-` [18:41:47.824] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.824] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.824] 3L)] [18:41:47.824] } [18:41:47.824] function(cond) { [18:41:47.824] is_error <- inherits(cond, "error") [18:41:47.824] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.824] NULL) [18:41:47.824] if (is_error) { [18:41:47.824] sessionInformation <- function() { [18:41:47.824] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.824] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.824] search = base::search(), system = base::Sys.info()) [18:41:47.824] } [18:41:47.824] ...future.conditions[[length(...future.conditions) + [18:41:47.824] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.824] cond$call), session = sessionInformation(), [18:41:47.824] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.824] signalCondition(cond) [18:41:47.824] } [18:41:47.824] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.824] "immediateCondition"))) { [18:41:47.824] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.824] ...future.conditions[[length(...future.conditions) + [18:41:47.824] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.824] if (TRUE && !signal) { [18:41:47.824] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.824] { [18:41:47.824] inherits <- base::inherits [18:41:47.824] invokeRestart <- base::invokeRestart [18:41:47.824] is.null <- base::is.null [18:41:47.824] muffled <- FALSE [18:41:47.824] if (inherits(cond, "message")) { [18:41:47.824] muffled <- grepl(pattern, "muffleMessage") [18:41:47.824] if (muffled) [18:41:47.824] invokeRestart("muffleMessage") [18:41:47.824] } [18:41:47.824] else if (inherits(cond, "warning")) { [18:41:47.824] muffled <- grepl(pattern, "muffleWarning") [18:41:47.824] if (muffled) [18:41:47.824] invokeRestart("muffleWarning") [18:41:47.824] } [18:41:47.824] else if (inherits(cond, "condition")) { [18:41:47.824] if (!is.null(pattern)) { [18:41:47.824] computeRestarts <- base::computeRestarts [18:41:47.824] grepl <- base::grepl [18:41:47.824] restarts <- computeRestarts(cond) [18:41:47.824] for (restart in restarts) { [18:41:47.824] name <- restart$name [18:41:47.824] if (is.null(name)) [18:41:47.824] next [18:41:47.824] if (!grepl(pattern, name)) [18:41:47.824] next [18:41:47.824] invokeRestart(restart) [18:41:47.824] muffled <- TRUE [18:41:47.824] break [18:41:47.824] } [18:41:47.824] } [18:41:47.824] } [18:41:47.824] invisible(muffled) [18:41:47.824] } [18:41:47.824] muffleCondition(cond, pattern = "^muffle") [18:41:47.824] } [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] if (TRUE) { [18:41:47.824] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.824] { [18:41:47.824] inherits <- base::inherits [18:41:47.824] invokeRestart <- base::invokeRestart [18:41:47.824] is.null <- base::is.null [18:41:47.824] muffled <- FALSE [18:41:47.824] if (inherits(cond, "message")) { [18:41:47.824] muffled <- grepl(pattern, "muffleMessage") [18:41:47.824] if (muffled) [18:41:47.824] invokeRestart("muffleMessage") [18:41:47.824] } [18:41:47.824] else if (inherits(cond, "warning")) { [18:41:47.824] muffled <- grepl(pattern, "muffleWarning") [18:41:47.824] if (muffled) [18:41:47.824] invokeRestart("muffleWarning") [18:41:47.824] } [18:41:47.824] else if (inherits(cond, "condition")) { [18:41:47.824] if (!is.null(pattern)) { [18:41:47.824] computeRestarts <- base::computeRestarts [18:41:47.824] grepl <- base::grepl [18:41:47.824] restarts <- computeRestarts(cond) [18:41:47.824] for (restart in restarts) { [18:41:47.824] name <- restart$name [18:41:47.824] if (is.null(name)) [18:41:47.824] next [18:41:47.824] if (!grepl(pattern, name)) [18:41:47.824] next [18:41:47.824] invokeRestart(restart) [18:41:47.824] muffled <- TRUE [18:41:47.824] break [18:41:47.824] } [18:41:47.824] } [18:41:47.824] } [18:41:47.824] invisible(muffled) [18:41:47.824] } [18:41:47.824] muffleCondition(cond, pattern = "^muffle") [18:41:47.824] } [18:41:47.824] } [18:41:47.824] } [18:41:47.824] })) [18:41:47.824] }, error = function(ex) { [18:41:47.824] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.824] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.824] ...future.rng), started = ...future.startTime, [18:41:47.824] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.824] version = "1.8"), class = "FutureResult") [18:41:47.824] }, finally = { [18:41:47.824] if (!identical(...future.workdir, getwd())) [18:41:47.824] setwd(...future.workdir) [18:41:47.824] { [18:41:47.824] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.824] ...future.oldOptions$nwarnings <- NULL [18:41:47.824] } [18:41:47.824] base::options(...future.oldOptions) [18:41:47.824] if (.Platform$OS.type == "windows") { [18:41:47.824] old_names <- names(...future.oldEnvVars) [18:41:47.824] envs <- base::Sys.getenv() [18:41:47.824] names <- names(envs) [18:41:47.824] common <- intersect(names, old_names) [18:41:47.824] added <- setdiff(names, old_names) [18:41:47.824] removed <- setdiff(old_names, names) [18:41:47.824] changed <- common[...future.oldEnvVars[common] != [18:41:47.824] envs[common]] [18:41:47.824] NAMES <- toupper(changed) [18:41:47.824] args <- list() [18:41:47.824] for (kk in seq_along(NAMES)) { [18:41:47.824] name <- changed[[kk]] [18:41:47.824] NAME <- NAMES[[kk]] [18:41:47.824] if (name != NAME && is.element(NAME, old_names)) [18:41:47.824] next [18:41:47.824] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.824] } [18:41:47.824] NAMES <- toupper(added) [18:41:47.824] for (kk in seq_along(NAMES)) { [18:41:47.824] name <- added[[kk]] [18:41:47.824] NAME <- NAMES[[kk]] [18:41:47.824] if (name != NAME && is.element(NAME, old_names)) [18:41:47.824] next [18:41:47.824] args[[name]] <- "" [18:41:47.824] } [18:41:47.824] NAMES <- toupper(removed) [18:41:47.824] for (kk in seq_along(NAMES)) { [18:41:47.824] name <- removed[[kk]] [18:41:47.824] NAME <- NAMES[[kk]] [18:41:47.824] if (name != NAME && is.element(NAME, old_names)) [18:41:47.824] next [18:41:47.824] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.824] } [18:41:47.824] if (length(args) > 0) [18:41:47.824] base::do.call(base::Sys.setenv, args = args) [18:41:47.824] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.824] } [18:41:47.824] { [18:41:47.824] if (base::length(...future.futureOptionsAdded) > [18:41:47.824] 0L) { [18:41:47.824] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.824] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.824] base::options(opts) [18:41:47.824] } [18:41:47.824] { [18:41:47.824] { [18:41:47.824] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.824] NULL [18:41:47.824] } [18:41:47.824] options(future.plan = NULL) [18:41:47.824] if (is.na(NA_character_)) [18:41:47.824] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.824] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.824] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.824] .init = FALSE) [18:41:47.824] } [18:41:47.824] } [18:41:47.824] } [18:41:47.824] }) [18:41:47.824] if (TRUE) { [18:41:47.824] base::sink(type = "output", split = FALSE) [18:41:47.824] if (TRUE) { [18:41:47.824] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.824] } [18:41:47.824] else { [18:41:47.824] ...future.result["stdout"] <- base::list(NULL) [18:41:47.824] } [18:41:47.824] base::close(...future.stdout) [18:41:47.824] ...future.stdout <- NULL [18:41:47.824] } [18:41:47.824] ...future.result$conditions <- ...future.conditions [18:41:47.824] ...future.result$finished <- base::Sys.time() [18:41:47.824] ...future.result [18:41:47.824] } [18:41:47.829] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:47.830] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:47.830] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:47.830] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.831] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.831] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.831] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.831] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.832] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.832] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.832] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.833] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:47.834] MultisessionFuture started [18:41:47.834] - Launch lazy future ... done [18:41:47.834] run() for 'MultisessionFuture' ... done [18:41:47.834] Created future: [18:41:47.848] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.848] - Validating connection of MultisessionFuture [18:41:47.848] - received message: FutureResult [18:41:47.848] - Received FutureResult [18:41:47.849] - Erased future from FutureRegistry [18:41:47.849] result() for ClusterFuture ... [18:41:47.849] - result already collected: FutureResult [18:41:47.849] result() for ClusterFuture ... done [18:41:47.849] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.834] MultisessionFuture: [18:41:47.834] Label: 'future_sapply-2' [18:41:47.834] Expression: [18:41:47.834] { [18:41:47.834] do.call(function(...) { [18:41:47.834] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.834] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.834] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.834] on.exit(options(oopts), add = TRUE) [18:41:47.834] } [18:41:47.834] { [18:41:47.834] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.834] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.834] ...future.FUN(...future.X_jj, ...) [18:41:47.834] }) [18:41:47.834] } [18:41:47.834] }, args = future.call.arguments) [18:41:47.834] } [18:41:47.834] Lazy evaluation: FALSE [18:41:47.834] Asynchronous evaluation: TRUE [18:41:47.834] Local evaluation: TRUE [18:41:47.834] Environment: R_GlobalEnv [18:41:47.834] Capture standard output: TRUE [18:41:47.834] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.834] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.834] Packages: [18:41:47.834] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.834] Resolved: TRUE [18:41:47.834] Value: [18:41:47.834] Conditions captured: [18:41:47.834] Early signaling: FALSE [18:41:47.834] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.834] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.850] Chunk #2 of 2 ... DONE [18:41:47.850] Launching 2 futures (chunks) ... DONE [18:41:47.850] Resolving 2 futures (chunks) ... [18:41:47.850] resolve() on list ... [18:41:47.850] recursive: 0 [18:41:47.850] length: 2 [18:41:47.851] [18:41:47.851] Future #1 [18:41:47.851] result() for ClusterFuture ... [18:41:47.851] - result already collected: FutureResult [18:41:47.851] result() for ClusterFuture ... done [18:41:47.851] result() for ClusterFuture ... [18:41:47.852] - result already collected: FutureResult [18:41:47.852] result() for ClusterFuture ... done [18:41:47.852] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:47.852] - nx: 2 [18:41:47.852] - relay: TRUE [18:41:47.852] - stdout: TRUE [18:41:47.853] - signal: TRUE [18:41:47.853] - resignal: FALSE [18:41:47.853] - force: TRUE [18:41:47.853] - relayed: [n=2] FALSE, FALSE [18:41:47.853] - queued futures: [n=2] FALSE, FALSE [18:41:47.853] - until=1 [18:41:47.853] - relaying element #1 [18:41:47.854] result() for ClusterFuture ... [18:41:47.854] - result already collected: FutureResult [18:41:47.854] result() for ClusterFuture ... done [18:41:47.854] result() for ClusterFuture ... [18:41:47.854] - result already collected: FutureResult [18:41:47.854] result() for ClusterFuture ... done [18:41:47.855] result() for ClusterFuture ... [18:41:47.855] - result already collected: FutureResult [18:41:47.855] result() for ClusterFuture ... done [18:41:47.855] result() for ClusterFuture ... [18:41:47.855] - result already collected: FutureResult [18:41:47.855] result() for ClusterFuture ... done [18:41:47.856] - relayed: [n=2] TRUE, FALSE [18:41:47.856] - queued futures: [n=2] TRUE, FALSE [18:41:47.856] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:47.856] length: 1 (resolved future 1) [18:41:47.856] Future #2 [18:41:47.856] result() for ClusterFuture ... [18:41:47.857] - result already collected: FutureResult [18:41:47.857] result() for ClusterFuture ... done [18:41:47.857] result() for ClusterFuture ... [18:41:47.857] - result already collected: FutureResult [18:41:47.857] result() for ClusterFuture ... done [18:41:47.857] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:47.858] - nx: 2 [18:41:47.858] - relay: TRUE [18:41:47.858] - stdout: TRUE [18:41:47.858] - signal: TRUE [18:41:47.858] - resignal: FALSE [18:41:47.858] - force: TRUE [18:41:47.858] - relayed: [n=2] TRUE, FALSE [18:41:47.859] - queued futures: [n=2] TRUE, FALSE [18:41:47.859] - until=2 [18:41:47.859] - relaying element #2 [18:41:47.859] result() for ClusterFuture ... [18:41:47.859] - result already collected: FutureResult [18:41:47.859] result() for ClusterFuture ... done [18:41:47.860] result() for ClusterFuture ... [18:41:47.860] - result already collected: FutureResult [18:41:47.860] result() for ClusterFuture ... done [18:41:47.860] result() for ClusterFuture ... [18:41:47.860] - result already collected: FutureResult [18:41:47.860] result() for ClusterFuture ... done [18:41:47.861] result() for ClusterFuture ... [18:41:47.861] - result already collected: FutureResult [18:41:47.861] result() for ClusterFuture ... done [18:41:47.861] - relayed: [n=2] TRUE, TRUE [18:41:47.861] - queued futures: [n=2] TRUE, TRUE [18:41:47.861] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:47.861] length: 0 (resolved future 2) [18:41:47.862] Relaying remaining futures [18:41:47.862] signalConditionsASAP(NULL, pos=0) ... [18:41:47.862] - nx: 2 [18:41:47.862] - relay: TRUE [18:41:47.862] - stdout: TRUE [18:41:47.862] - signal: TRUE [18:41:47.863] - resignal: FALSE [18:41:47.863] - force: TRUE [18:41:47.863] - relayed: [n=2] TRUE, TRUE [18:41:47.863] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:47.863] - relayed: [n=2] TRUE, TRUE [18:41:47.864] - queued futures: [n=2] TRUE, TRUE [18:41:47.864] signalConditionsASAP(NULL, pos=0) ... done [18:41:47.864] resolve() on list ... DONE [18:41:47.865] result() for ClusterFuture ... [18:41:47.865] - result already collected: FutureResult [18:41:47.865] result() for ClusterFuture ... done [18:41:47.865] result() for ClusterFuture ... [18:41:47.866] - result already collected: FutureResult [18:41:47.866] result() for ClusterFuture ... done [18:41:47.866] result() for ClusterFuture ... [18:41:47.867] - result already collected: FutureResult [18:41:47.867] result() for ClusterFuture ... done [18:41:47.867] result() for ClusterFuture ... [18:41:47.867] - result already collected: FutureResult [18:41:47.867] result() for ClusterFuture ... done [18:41:47.867] - Number of value chunks collected: 2 [18:41:47.868] Resolving 2 futures (chunks) ... DONE [18:41:47.868] Reducing values from 2 chunks ... [18:41:47.868] - Number of values collected after concatenation: 3 [18:41:47.868] - Number of values expected: 3 [18:41:47.868] Reducing values from 2 chunks ... DONE [18:41:47.868] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:47.871] future_lapply() ... [18:41:47.874] Number of chunks: 2 [18:41:47.874] getGlobalsAndPackagesXApply() ... [18:41:47.874] - future.globals: TRUE [18:41:47.874] getGlobalsAndPackages() ... [18:41:47.874] Searching for globals... [18:41:47.879] - globals found: [2] 'FUN', 'UseMethod' [18:41:47.879] Searching for globals ... DONE [18:41:47.879] Resolving globals: FALSE [18:41:47.880] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:47.880] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:47.881] - globals: [1] 'FUN' [18:41:47.881] [18:41:47.881] getGlobalsAndPackages() ... DONE [18:41:47.881] - globals found/used: [n=1] 'FUN' [18:41:47.881] - needed namespaces: [n=0] [18:41:47.882] Finding globals ... DONE [18:41:47.882] - use_args: TRUE [18:41:47.882] - Getting '...' globals ... [18:41:47.882] resolve() on list ... [18:41:47.882] recursive: 0 [18:41:47.883] length: 1 [18:41:47.883] elements: '...' [18:41:47.883] length: 0 (resolved future 1) [18:41:47.883] resolve() on list ... DONE [18:41:47.883] - '...' content: [n=0] [18:41:47.883] List of 1 [18:41:47.883] $ ...: list() [18:41:47.883] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.883] - attr(*, "where")=List of 1 [18:41:47.883] ..$ ...: [18:41:47.883] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.883] - attr(*, "resolved")= logi TRUE [18:41:47.883] - attr(*, "total_size")= num NA [18:41:47.886] - Getting '...' globals ... DONE [18:41:47.887] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:47.887] List of 2 [18:41:47.887] $ ...future.FUN:function (x, ...) [18:41:47.887] $ ... : list() [18:41:47.887] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:47.887] - attr(*, "where")=List of 2 [18:41:47.887] ..$ ...future.FUN: [18:41:47.887] ..$ ... : [18:41:47.887] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:47.887] - attr(*, "resolved")= logi FALSE [18:41:47.887] - attr(*, "total_size")= int 5116 [18:41:47.890] Packages to be attached in all futures: [n=0] [18:41:47.890] getGlobalsAndPackagesXApply() ... DONE [18:41:47.890] Number of futures (= number of chunks): 2 [18:41:47.891] Launching 2 futures (chunks) ... [18:41:47.891] Chunk #1 of 2 ... [18:41:47.891] - Finding globals in 'X' for chunk #1 ... [18:41:47.891] getGlobalsAndPackages() ... [18:41:47.891] Searching for globals... [18:41:47.892] [18:41:47.892] Searching for globals ... DONE [18:41:47.892] - globals: [0] [18:41:47.892] getGlobalsAndPackages() ... DONE [18:41:47.892] + additional globals found: [n=0] [18:41:47.892] + additional namespaces needed: [n=0] [18:41:47.893] - Finding globals in 'X' for chunk #1 ... DONE [18:41:47.893] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.893] - seeds: [18:41:47.893] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.893] getGlobalsAndPackages() ... [18:41:47.893] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.894] Resolving globals: FALSE [18:41:47.894] Tweak future expression to call with '...' arguments ... [18:41:47.894] { [18:41:47.894] do.call(function(...) { [18:41:47.894] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.894] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.894] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.894] on.exit(options(oopts), add = TRUE) [18:41:47.894] } [18:41:47.894] { [18:41:47.894] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.894] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.894] ...future.FUN(...future.X_jj, ...) [18:41:47.894] }) [18:41:47.894] } [18:41:47.894] }, args = future.call.arguments) [18:41:47.894] } [18:41:47.895] Tweak future expression to call with '...' arguments ... DONE [18:41:47.896] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.896] [18:41:47.896] getGlobalsAndPackages() ... DONE [18:41:47.897] run() for 'Future' ... [18:41:47.897] - state: 'created' [18:41:47.898] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.913] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.914] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.914] - Field: 'node' [18:41:47.914] - Field: 'label' [18:41:47.914] - Field: 'local' [18:41:47.915] - Field: 'owner' [18:41:47.915] - Field: 'envir' [18:41:47.915] - Field: 'workers' [18:41:47.915] - Field: 'packages' [18:41:47.915] - Field: 'gc' [18:41:47.915] - Field: 'conditions' [18:41:47.916] - Field: 'persistent' [18:41:47.916] - Field: 'expr' [18:41:47.916] - Field: 'uuid' [18:41:47.916] - Field: 'seed' [18:41:47.916] - Field: 'version' [18:41:47.917] - Field: 'result' [18:41:47.917] - Field: 'asynchronous' [18:41:47.917] - Field: 'calls' [18:41:47.917] - Field: 'globals' [18:41:47.917] - Field: 'stdout' [18:41:47.918] - Field: 'earlySignal' [18:41:47.918] - Field: 'lazy' [18:41:47.918] - Field: 'state' [18:41:47.918] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.918] - Launch lazy future ... [18:41:47.919] Packages needed by the future expression (n = 0): [18:41:47.919] Packages needed by future strategies (n = 0): [18:41:47.920] { [18:41:47.920] { [18:41:47.920] { [18:41:47.920] ...future.startTime <- base::Sys.time() [18:41:47.920] { [18:41:47.920] { [18:41:47.920] { [18:41:47.920] { [18:41:47.920] base::local({ [18:41:47.920] has_future <- base::requireNamespace("future", [18:41:47.920] quietly = TRUE) [18:41:47.920] if (has_future) { [18:41:47.920] ns <- base::getNamespace("future") [18:41:47.920] version <- ns[[".package"]][["version"]] [18:41:47.920] if (is.null(version)) [18:41:47.920] version <- utils::packageVersion("future") [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] version <- NULL [18:41:47.920] } [18:41:47.920] if (!has_future || version < "1.8.0") { [18:41:47.920] info <- base::c(r_version = base::gsub("R version ", [18:41:47.920] "", base::R.version$version.string), [18:41:47.920] platform = base::sprintf("%s (%s-bit)", [18:41:47.920] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.920] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.920] "release", "version")], collapse = " "), [18:41:47.920] hostname = base::Sys.info()[["nodename"]]) [18:41:47.920] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.920] info) [18:41:47.920] info <- base::paste(info, collapse = "; ") [18:41:47.920] if (!has_future) { [18:41:47.920] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.920] info) [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.920] info, version) [18:41:47.920] } [18:41:47.920] base::stop(msg) [18:41:47.920] } [18:41:47.920] }) [18:41:47.920] } [18:41:47.920] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.920] base::options(mc.cores = 1L) [18:41:47.920] } [18:41:47.920] ...future.strategy.old <- future::plan("list") [18:41:47.920] options(future.plan = NULL) [18:41:47.920] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.920] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.920] } [18:41:47.920] ...future.workdir <- getwd() [18:41:47.920] } [18:41:47.920] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.920] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.920] } [18:41:47.920] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.920] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.920] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.920] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.920] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.920] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.920] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.920] base::names(...future.oldOptions)) [18:41:47.920] } [18:41:47.920] if (FALSE) { [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] if (TRUE) { [18:41:47.920] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.920] open = "w") [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.920] windows = "NUL", "/dev/null"), open = "w") [18:41:47.920] } [18:41:47.920] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.920] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.920] base::sink(type = "output", split = FALSE) [18:41:47.920] base::close(...future.stdout) [18:41:47.920] }, add = TRUE) [18:41:47.920] } [18:41:47.920] ...future.frame <- base::sys.nframe() [18:41:47.920] ...future.conditions <- base::list() [18:41:47.920] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.920] if (FALSE) { [18:41:47.920] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.920] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.920] } [18:41:47.920] ...future.result <- base::tryCatch({ [18:41:47.920] base::withCallingHandlers({ [18:41:47.920] ...future.value <- base::withVisible(base::local({ [18:41:47.920] ...future.makeSendCondition <- base::local({ [18:41:47.920] sendCondition <- NULL [18:41:47.920] function(frame = 1L) { [18:41:47.920] if (is.function(sendCondition)) [18:41:47.920] return(sendCondition) [18:41:47.920] ns <- getNamespace("parallel") [18:41:47.920] if (exists("sendData", mode = "function", [18:41:47.920] envir = ns)) { [18:41:47.920] parallel_sendData <- get("sendData", mode = "function", [18:41:47.920] envir = ns) [18:41:47.920] envir <- sys.frame(frame) [18:41:47.920] master <- NULL [18:41:47.920] while (!identical(envir, .GlobalEnv) && [18:41:47.920] !identical(envir, emptyenv())) { [18:41:47.920] if (exists("master", mode = "list", envir = envir, [18:41:47.920] inherits = FALSE)) { [18:41:47.920] master <- get("master", mode = "list", [18:41:47.920] envir = envir, inherits = FALSE) [18:41:47.920] if (inherits(master, c("SOCKnode", [18:41:47.920] "SOCK0node"))) { [18:41:47.920] sendCondition <<- function(cond) { [18:41:47.920] data <- list(type = "VALUE", value = cond, [18:41:47.920] success = TRUE) [18:41:47.920] parallel_sendData(master, data) [18:41:47.920] } [18:41:47.920] return(sendCondition) [18:41:47.920] } [18:41:47.920] } [18:41:47.920] frame <- frame + 1L [18:41:47.920] envir <- sys.frame(frame) [18:41:47.920] } [18:41:47.920] } [18:41:47.920] sendCondition <<- function(cond) NULL [18:41:47.920] } [18:41:47.920] }) [18:41:47.920] withCallingHandlers({ [18:41:47.920] { [18:41:47.920] do.call(function(...) { [18:41:47.920] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.920] if (!identical(...future.globals.maxSize.org, [18:41:47.920] ...future.globals.maxSize)) { [18:41:47.920] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.920] on.exit(options(oopts), add = TRUE) [18:41:47.920] } [18:41:47.920] { [18:41:47.920] lapply(seq_along(...future.elements_ii), [18:41:47.920] FUN = function(jj) { [18:41:47.920] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.920] ...future.FUN(...future.X_jj, ...) [18:41:47.920] }) [18:41:47.920] } [18:41:47.920] }, args = future.call.arguments) [18:41:47.920] } [18:41:47.920] }, immediateCondition = function(cond) { [18:41:47.920] sendCondition <- ...future.makeSendCondition() [18:41:47.920] sendCondition(cond) [18:41:47.920] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.920] { [18:41:47.920] inherits <- base::inherits [18:41:47.920] invokeRestart <- base::invokeRestart [18:41:47.920] is.null <- base::is.null [18:41:47.920] muffled <- FALSE [18:41:47.920] if (inherits(cond, "message")) { [18:41:47.920] muffled <- grepl(pattern, "muffleMessage") [18:41:47.920] if (muffled) [18:41:47.920] invokeRestart("muffleMessage") [18:41:47.920] } [18:41:47.920] else if (inherits(cond, "warning")) { [18:41:47.920] muffled <- grepl(pattern, "muffleWarning") [18:41:47.920] if (muffled) [18:41:47.920] invokeRestart("muffleWarning") [18:41:47.920] } [18:41:47.920] else if (inherits(cond, "condition")) { [18:41:47.920] if (!is.null(pattern)) { [18:41:47.920] computeRestarts <- base::computeRestarts [18:41:47.920] grepl <- base::grepl [18:41:47.920] restarts <- computeRestarts(cond) [18:41:47.920] for (restart in restarts) { [18:41:47.920] name <- restart$name [18:41:47.920] if (is.null(name)) [18:41:47.920] next [18:41:47.920] if (!grepl(pattern, name)) [18:41:47.920] next [18:41:47.920] invokeRestart(restart) [18:41:47.920] muffled <- TRUE [18:41:47.920] break [18:41:47.920] } [18:41:47.920] } [18:41:47.920] } [18:41:47.920] invisible(muffled) [18:41:47.920] } [18:41:47.920] muffleCondition(cond) [18:41:47.920] }) [18:41:47.920] })) [18:41:47.920] future::FutureResult(value = ...future.value$value, [18:41:47.920] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.920] ...future.rng), globalenv = if (FALSE) [18:41:47.920] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.920] ...future.globalenv.names)) [18:41:47.920] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.920] }, condition = base::local({ [18:41:47.920] c <- base::c [18:41:47.920] inherits <- base::inherits [18:41:47.920] invokeRestart <- base::invokeRestart [18:41:47.920] length <- base::length [18:41:47.920] list <- base::list [18:41:47.920] seq.int <- base::seq.int [18:41:47.920] signalCondition <- base::signalCondition [18:41:47.920] sys.calls <- base::sys.calls [18:41:47.920] `[[` <- base::`[[` [18:41:47.920] `+` <- base::`+` [18:41:47.920] `<<-` <- base::`<<-` [18:41:47.920] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.920] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.920] 3L)] [18:41:47.920] } [18:41:47.920] function(cond) { [18:41:47.920] is_error <- inherits(cond, "error") [18:41:47.920] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.920] NULL) [18:41:47.920] if (is_error) { [18:41:47.920] sessionInformation <- function() { [18:41:47.920] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.920] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.920] search = base::search(), system = base::Sys.info()) [18:41:47.920] } [18:41:47.920] ...future.conditions[[length(...future.conditions) + [18:41:47.920] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.920] cond$call), session = sessionInformation(), [18:41:47.920] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.920] signalCondition(cond) [18:41:47.920] } [18:41:47.920] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.920] "immediateCondition"))) { [18:41:47.920] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.920] ...future.conditions[[length(...future.conditions) + [18:41:47.920] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.920] if (TRUE && !signal) { [18:41:47.920] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.920] { [18:41:47.920] inherits <- base::inherits [18:41:47.920] invokeRestart <- base::invokeRestart [18:41:47.920] is.null <- base::is.null [18:41:47.920] muffled <- FALSE [18:41:47.920] if (inherits(cond, "message")) { [18:41:47.920] muffled <- grepl(pattern, "muffleMessage") [18:41:47.920] if (muffled) [18:41:47.920] invokeRestart("muffleMessage") [18:41:47.920] } [18:41:47.920] else if (inherits(cond, "warning")) { [18:41:47.920] muffled <- grepl(pattern, "muffleWarning") [18:41:47.920] if (muffled) [18:41:47.920] invokeRestart("muffleWarning") [18:41:47.920] } [18:41:47.920] else if (inherits(cond, "condition")) { [18:41:47.920] if (!is.null(pattern)) { [18:41:47.920] computeRestarts <- base::computeRestarts [18:41:47.920] grepl <- base::grepl [18:41:47.920] restarts <- computeRestarts(cond) [18:41:47.920] for (restart in restarts) { [18:41:47.920] name <- restart$name [18:41:47.920] if (is.null(name)) [18:41:47.920] next [18:41:47.920] if (!grepl(pattern, name)) [18:41:47.920] next [18:41:47.920] invokeRestart(restart) [18:41:47.920] muffled <- TRUE [18:41:47.920] break [18:41:47.920] } [18:41:47.920] } [18:41:47.920] } [18:41:47.920] invisible(muffled) [18:41:47.920] } [18:41:47.920] muffleCondition(cond, pattern = "^muffle") [18:41:47.920] } [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] if (TRUE) { [18:41:47.920] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.920] { [18:41:47.920] inherits <- base::inherits [18:41:47.920] invokeRestart <- base::invokeRestart [18:41:47.920] is.null <- base::is.null [18:41:47.920] muffled <- FALSE [18:41:47.920] if (inherits(cond, "message")) { [18:41:47.920] muffled <- grepl(pattern, "muffleMessage") [18:41:47.920] if (muffled) [18:41:47.920] invokeRestart("muffleMessage") [18:41:47.920] } [18:41:47.920] else if (inherits(cond, "warning")) { [18:41:47.920] muffled <- grepl(pattern, "muffleWarning") [18:41:47.920] if (muffled) [18:41:47.920] invokeRestart("muffleWarning") [18:41:47.920] } [18:41:47.920] else if (inherits(cond, "condition")) { [18:41:47.920] if (!is.null(pattern)) { [18:41:47.920] computeRestarts <- base::computeRestarts [18:41:47.920] grepl <- base::grepl [18:41:47.920] restarts <- computeRestarts(cond) [18:41:47.920] for (restart in restarts) { [18:41:47.920] name <- restart$name [18:41:47.920] if (is.null(name)) [18:41:47.920] next [18:41:47.920] if (!grepl(pattern, name)) [18:41:47.920] next [18:41:47.920] invokeRestart(restart) [18:41:47.920] muffled <- TRUE [18:41:47.920] break [18:41:47.920] } [18:41:47.920] } [18:41:47.920] } [18:41:47.920] invisible(muffled) [18:41:47.920] } [18:41:47.920] muffleCondition(cond, pattern = "^muffle") [18:41:47.920] } [18:41:47.920] } [18:41:47.920] } [18:41:47.920] })) [18:41:47.920] }, error = function(ex) { [18:41:47.920] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.920] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.920] ...future.rng), started = ...future.startTime, [18:41:47.920] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.920] version = "1.8"), class = "FutureResult") [18:41:47.920] }, finally = { [18:41:47.920] if (!identical(...future.workdir, getwd())) [18:41:47.920] setwd(...future.workdir) [18:41:47.920] { [18:41:47.920] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.920] ...future.oldOptions$nwarnings <- NULL [18:41:47.920] } [18:41:47.920] base::options(...future.oldOptions) [18:41:47.920] if (.Platform$OS.type == "windows") { [18:41:47.920] old_names <- names(...future.oldEnvVars) [18:41:47.920] envs <- base::Sys.getenv() [18:41:47.920] names <- names(envs) [18:41:47.920] common <- intersect(names, old_names) [18:41:47.920] added <- setdiff(names, old_names) [18:41:47.920] removed <- setdiff(old_names, names) [18:41:47.920] changed <- common[...future.oldEnvVars[common] != [18:41:47.920] envs[common]] [18:41:47.920] NAMES <- toupper(changed) [18:41:47.920] args <- list() [18:41:47.920] for (kk in seq_along(NAMES)) { [18:41:47.920] name <- changed[[kk]] [18:41:47.920] NAME <- NAMES[[kk]] [18:41:47.920] if (name != NAME && is.element(NAME, old_names)) [18:41:47.920] next [18:41:47.920] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.920] } [18:41:47.920] NAMES <- toupper(added) [18:41:47.920] for (kk in seq_along(NAMES)) { [18:41:47.920] name <- added[[kk]] [18:41:47.920] NAME <- NAMES[[kk]] [18:41:47.920] if (name != NAME && is.element(NAME, old_names)) [18:41:47.920] next [18:41:47.920] args[[name]] <- "" [18:41:47.920] } [18:41:47.920] NAMES <- toupper(removed) [18:41:47.920] for (kk in seq_along(NAMES)) { [18:41:47.920] name <- removed[[kk]] [18:41:47.920] NAME <- NAMES[[kk]] [18:41:47.920] if (name != NAME && is.element(NAME, old_names)) [18:41:47.920] next [18:41:47.920] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.920] } [18:41:47.920] if (length(args) > 0) [18:41:47.920] base::do.call(base::Sys.setenv, args = args) [18:41:47.920] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.920] } [18:41:47.920] { [18:41:47.920] if (base::length(...future.futureOptionsAdded) > [18:41:47.920] 0L) { [18:41:47.920] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.920] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.920] base::options(opts) [18:41:47.920] } [18:41:47.920] { [18:41:47.920] { [18:41:47.920] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.920] NULL [18:41:47.920] } [18:41:47.920] options(future.plan = NULL) [18:41:47.920] if (is.na(NA_character_)) [18:41:47.920] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.920] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.920] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.920] .init = FALSE) [18:41:47.920] } [18:41:47.920] } [18:41:47.920] } [18:41:47.920] }) [18:41:47.920] if (TRUE) { [18:41:47.920] base::sink(type = "output", split = FALSE) [18:41:47.920] if (TRUE) { [18:41:47.920] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.920] } [18:41:47.920] else { [18:41:47.920] ...future.result["stdout"] <- base::list(NULL) [18:41:47.920] } [18:41:47.920] base::close(...future.stdout) [18:41:47.920] ...future.stdout <- NULL [18:41:47.920] } [18:41:47.920] ...future.result$conditions <- ...future.conditions [18:41:47.920] ...future.result$finished <- base::Sys.time() [18:41:47.920] ...future.result [18:41:47.920] } [18:41:47.925] Exporting 5 global objects (968 bytes) to cluster node #1 ... [18:41:47.925] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:47.925] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:47.926] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.926] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.927] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:47.927] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:47.928] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.928] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.929] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.929] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.929] Exporting 5 global objects (968 bytes) to cluster node #1 ... DONE [18:41:47.930] MultisessionFuture started [18:41:47.931] - Launch lazy future ... done [18:41:47.931] run() for 'MultisessionFuture' ... done [18:41:47.931] Created future: [18:41:47.944] receiveMessageFromWorker() for ClusterFuture ... [18:41:47.945] - Validating connection of MultisessionFuture [18:41:47.945] - received message: FutureResult [18:41:47.946] - Received FutureResult [18:41:47.946] - Erased future from FutureRegistry [18:41:47.946] result() for ClusterFuture ... [18:41:47.946] - result already collected: FutureResult [18:41:47.947] result() for ClusterFuture ... done [18:41:47.947] receiveMessageFromWorker() for ClusterFuture ... done [18:41:47.932] MultisessionFuture: [18:41:47.932] Label: 'future_sapply-1' [18:41:47.932] Expression: [18:41:47.932] { [18:41:47.932] do.call(function(...) { [18:41:47.932] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.932] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.932] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.932] on.exit(options(oopts), add = TRUE) [18:41:47.932] } [18:41:47.932] { [18:41:47.932] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.932] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.932] ...future.FUN(...future.X_jj, ...) [18:41:47.932] }) [18:41:47.932] } [18:41:47.932] }, args = future.call.arguments) [18:41:47.932] } [18:41:47.932] Lazy evaluation: FALSE [18:41:47.932] Asynchronous evaluation: TRUE [18:41:47.932] Local evaluation: TRUE [18:41:47.932] Environment: R_GlobalEnv [18:41:47.932] Capture standard output: TRUE [18:41:47.932] Capture condition classes: 'condition' (excluding 'nothing') [18:41:47.932] Globals: 5 objects totaling 518 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:47.932] Packages: [18:41:47.932] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:47.932] Resolved: TRUE [18:41:47.932] Value: [18:41:47.932] Conditions captured: [18:41:47.932] Early signaling: FALSE [18:41:47.932] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:47.932] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.948] Chunk #1 of 2 ... DONE [18:41:47.948] Chunk #2 of 2 ... [18:41:47.948] - Finding globals in 'X' for chunk #2 ... [18:41:47.948] getGlobalsAndPackages() ... [18:41:47.949] Searching for globals... [18:41:47.949] [18:41:47.949] Searching for globals ... DONE [18:41:47.950] - globals: [0] [18:41:47.950] getGlobalsAndPackages() ... DONE [18:41:47.950] + additional globals found: [n=0] [18:41:47.950] + additional namespaces needed: [n=0] [18:41:47.951] - Finding globals in 'X' for chunk #2 ... DONE [18:41:47.951] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:47.951] - seeds: [18:41:47.951] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.952] getGlobalsAndPackages() ... [18:41:47.952] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.952] Resolving globals: FALSE [18:41:47.953] Tweak future expression to call with '...' arguments ... [18:41:47.953] { [18:41:47.953] do.call(function(...) { [18:41:47.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.953] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:47.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.953] on.exit(options(oopts), add = TRUE) [18:41:47.953] } [18:41:47.953] { [18:41:47.953] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:47.953] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.953] ...future.FUN(...future.X_jj, ...) [18:41:47.953] }) [18:41:47.953] } [18:41:47.953] }, args = future.call.arguments) [18:41:47.953] } [18:41:47.954] Tweak future expression to call with '...' arguments ... DONE [18:41:47.954] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:47.955] [18:41:47.955] getGlobalsAndPackages() ... DONE [18:41:47.955] run() for 'Future' ... [18:41:47.956] - state: 'created' [18:41:47.956] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:47.976] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:47.976] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:47.976] - Field: 'node' [18:41:47.976] - Field: 'label' [18:41:47.977] - Field: 'local' [18:41:47.977] - Field: 'owner' [18:41:47.977] - Field: 'envir' [18:41:47.978] - Field: 'workers' [18:41:47.978] - Field: 'packages' [18:41:47.978] - Field: 'gc' [18:41:47.978] - Field: 'conditions' [18:41:47.979] - Field: 'persistent' [18:41:47.979] - Field: 'expr' [18:41:47.979] - Field: 'uuid' [18:41:47.980] - Field: 'seed' [18:41:47.980] - Field: 'version' [18:41:47.980] - Field: 'result' [18:41:47.980] - Field: 'asynchronous' [18:41:47.981] - Field: 'calls' [18:41:47.981] - Field: 'globals' [18:41:47.981] - Field: 'stdout' [18:41:47.982] - Field: 'earlySignal' [18:41:47.982] - Field: 'lazy' [18:41:47.982] - Field: 'state' [18:41:47.982] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:47.983] - Launch lazy future ... [18:41:47.983] Packages needed by the future expression (n = 0): [18:41:47.984] Packages needed by future strategies (n = 0): [18:41:47.985] { [18:41:47.985] { [18:41:47.985] { [18:41:47.985] ...future.startTime <- base::Sys.time() [18:41:47.985] { [18:41:47.985] { [18:41:47.985] { [18:41:47.985] { [18:41:47.985] base::local({ [18:41:47.985] has_future <- base::requireNamespace("future", [18:41:47.985] quietly = TRUE) [18:41:47.985] if (has_future) { [18:41:47.985] ns <- base::getNamespace("future") [18:41:47.985] version <- ns[[".package"]][["version"]] [18:41:47.985] if (is.null(version)) [18:41:47.985] version <- utils::packageVersion("future") [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] version <- NULL [18:41:47.985] } [18:41:47.985] if (!has_future || version < "1.8.0") { [18:41:47.985] info <- base::c(r_version = base::gsub("R version ", [18:41:47.985] "", base::R.version$version.string), [18:41:47.985] platform = base::sprintf("%s (%s-bit)", [18:41:47.985] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:47.985] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:47.985] "release", "version")], collapse = " "), [18:41:47.985] hostname = base::Sys.info()[["nodename"]]) [18:41:47.985] info <- base::sprintf("%s: %s", base::names(info), [18:41:47.985] info) [18:41:47.985] info <- base::paste(info, collapse = "; ") [18:41:47.985] if (!has_future) { [18:41:47.985] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:47.985] info) [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:47.985] info, version) [18:41:47.985] } [18:41:47.985] base::stop(msg) [18:41:47.985] } [18:41:47.985] }) [18:41:47.985] } [18:41:47.985] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:47.985] base::options(mc.cores = 1L) [18:41:47.985] } [18:41:47.985] ...future.strategy.old <- future::plan("list") [18:41:47.985] options(future.plan = NULL) [18:41:47.985] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.985] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:47.985] } [18:41:47.985] ...future.workdir <- getwd() [18:41:47.985] } [18:41:47.985] ...future.oldOptions <- base::as.list(base::.Options) [18:41:47.985] ...future.oldEnvVars <- base::Sys.getenv() [18:41:47.985] } [18:41:47.985] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:47.985] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:47.985] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:47.985] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:47.985] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:47.985] future.stdout.windows.reencode = NULL, width = 80L) [18:41:47.985] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:47.985] base::names(...future.oldOptions)) [18:41:47.985] } [18:41:47.985] if (FALSE) { [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] if (TRUE) { [18:41:47.985] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:47.985] open = "w") [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:47.985] windows = "NUL", "/dev/null"), open = "w") [18:41:47.985] } [18:41:47.985] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:47.985] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:47.985] base::sink(type = "output", split = FALSE) [18:41:47.985] base::close(...future.stdout) [18:41:47.985] }, add = TRUE) [18:41:47.985] } [18:41:47.985] ...future.frame <- base::sys.nframe() [18:41:47.985] ...future.conditions <- base::list() [18:41:47.985] ...future.rng <- base::globalenv()$.Random.seed [18:41:47.985] if (FALSE) { [18:41:47.985] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:47.985] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:47.985] } [18:41:47.985] ...future.result <- base::tryCatch({ [18:41:47.985] base::withCallingHandlers({ [18:41:47.985] ...future.value <- base::withVisible(base::local({ [18:41:47.985] ...future.makeSendCondition <- base::local({ [18:41:47.985] sendCondition <- NULL [18:41:47.985] function(frame = 1L) { [18:41:47.985] if (is.function(sendCondition)) [18:41:47.985] return(sendCondition) [18:41:47.985] ns <- getNamespace("parallel") [18:41:47.985] if (exists("sendData", mode = "function", [18:41:47.985] envir = ns)) { [18:41:47.985] parallel_sendData <- get("sendData", mode = "function", [18:41:47.985] envir = ns) [18:41:47.985] envir <- sys.frame(frame) [18:41:47.985] master <- NULL [18:41:47.985] while (!identical(envir, .GlobalEnv) && [18:41:47.985] !identical(envir, emptyenv())) { [18:41:47.985] if (exists("master", mode = "list", envir = envir, [18:41:47.985] inherits = FALSE)) { [18:41:47.985] master <- get("master", mode = "list", [18:41:47.985] envir = envir, inherits = FALSE) [18:41:47.985] if (inherits(master, c("SOCKnode", [18:41:47.985] "SOCK0node"))) { [18:41:47.985] sendCondition <<- function(cond) { [18:41:47.985] data <- list(type = "VALUE", value = cond, [18:41:47.985] success = TRUE) [18:41:47.985] parallel_sendData(master, data) [18:41:47.985] } [18:41:47.985] return(sendCondition) [18:41:47.985] } [18:41:47.985] } [18:41:47.985] frame <- frame + 1L [18:41:47.985] envir <- sys.frame(frame) [18:41:47.985] } [18:41:47.985] } [18:41:47.985] sendCondition <<- function(cond) NULL [18:41:47.985] } [18:41:47.985] }) [18:41:47.985] withCallingHandlers({ [18:41:47.985] { [18:41:47.985] do.call(function(...) { [18:41:47.985] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:47.985] if (!identical(...future.globals.maxSize.org, [18:41:47.985] ...future.globals.maxSize)) { [18:41:47.985] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:47.985] on.exit(options(oopts), add = TRUE) [18:41:47.985] } [18:41:47.985] { [18:41:47.985] lapply(seq_along(...future.elements_ii), [18:41:47.985] FUN = function(jj) { [18:41:47.985] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:47.985] ...future.FUN(...future.X_jj, ...) [18:41:47.985] }) [18:41:47.985] } [18:41:47.985] }, args = future.call.arguments) [18:41:47.985] } [18:41:47.985] }, immediateCondition = function(cond) { [18:41:47.985] sendCondition <- ...future.makeSendCondition() [18:41:47.985] sendCondition(cond) [18:41:47.985] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.985] { [18:41:47.985] inherits <- base::inherits [18:41:47.985] invokeRestart <- base::invokeRestart [18:41:47.985] is.null <- base::is.null [18:41:47.985] muffled <- FALSE [18:41:47.985] if (inherits(cond, "message")) { [18:41:47.985] muffled <- grepl(pattern, "muffleMessage") [18:41:47.985] if (muffled) [18:41:47.985] invokeRestart("muffleMessage") [18:41:47.985] } [18:41:47.985] else if (inherits(cond, "warning")) { [18:41:47.985] muffled <- grepl(pattern, "muffleWarning") [18:41:47.985] if (muffled) [18:41:47.985] invokeRestart("muffleWarning") [18:41:47.985] } [18:41:47.985] else if (inherits(cond, "condition")) { [18:41:47.985] if (!is.null(pattern)) { [18:41:47.985] computeRestarts <- base::computeRestarts [18:41:47.985] grepl <- base::grepl [18:41:47.985] restarts <- computeRestarts(cond) [18:41:47.985] for (restart in restarts) { [18:41:47.985] name <- restart$name [18:41:47.985] if (is.null(name)) [18:41:47.985] next [18:41:47.985] if (!grepl(pattern, name)) [18:41:47.985] next [18:41:47.985] invokeRestart(restart) [18:41:47.985] muffled <- TRUE [18:41:47.985] break [18:41:47.985] } [18:41:47.985] } [18:41:47.985] } [18:41:47.985] invisible(muffled) [18:41:47.985] } [18:41:47.985] muffleCondition(cond) [18:41:47.985] }) [18:41:47.985] })) [18:41:47.985] future::FutureResult(value = ...future.value$value, [18:41:47.985] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.985] ...future.rng), globalenv = if (FALSE) [18:41:47.985] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:47.985] ...future.globalenv.names)) [18:41:47.985] else NULL, started = ...future.startTime, version = "1.8") [18:41:47.985] }, condition = base::local({ [18:41:47.985] c <- base::c [18:41:47.985] inherits <- base::inherits [18:41:47.985] invokeRestart <- base::invokeRestart [18:41:47.985] length <- base::length [18:41:47.985] list <- base::list [18:41:47.985] seq.int <- base::seq.int [18:41:47.985] signalCondition <- base::signalCondition [18:41:47.985] sys.calls <- base::sys.calls [18:41:47.985] `[[` <- base::`[[` [18:41:47.985] `+` <- base::`+` [18:41:47.985] `<<-` <- base::`<<-` [18:41:47.985] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:47.985] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:47.985] 3L)] [18:41:47.985] } [18:41:47.985] function(cond) { [18:41:47.985] is_error <- inherits(cond, "error") [18:41:47.985] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:47.985] NULL) [18:41:47.985] if (is_error) { [18:41:47.985] sessionInformation <- function() { [18:41:47.985] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:47.985] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:47.985] search = base::search(), system = base::Sys.info()) [18:41:47.985] } [18:41:47.985] ...future.conditions[[length(...future.conditions) + [18:41:47.985] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:47.985] cond$call), session = sessionInformation(), [18:41:47.985] timestamp = base::Sys.time(), signaled = 0L) [18:41:47.985] signalCondition(cond) [18:41:47.985] } [18:41:47.985] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:47.985] "immediateCondition"))) { [18:41:47.985] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:47.985] ...future.conditions[[length(...future.conditions) + [18:41:47.985] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:47.985] if (TRUE && !signal) { [18:41:47.985] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.985] { [18:41:47.985] inherits <- base::inherits [18:41:47.985] invokeRestart <- base::invokeRestart [18:41:47.985] is.null <- base::is.null [18:41:47.985] muffled <- FALSE [18:41:47.985] if (inherits(cond, "message")) { [18:41:47.985] muffled <- grepl(pattern, "muffleMessage") [18:41:47.985] if (muffled) [18:41:47.985] invokeRestart("muffleMessage") [18:41:47.985] } [18:41:47.985] else if (inherits(cond, "warning")) { [18:41:47.985] muffled <- grepl(pattern, "muffleWarning") [18:41:47.985] if (muffled) [18:41:47.985] invokeRestart("muffleWarning") [18:41:47.985] } [18:41:47.985] else if (inherits(cond, "condition")) { [18:41:47.985] if (!is.null(pattern)) { [18:41:47.985] computeRestarts <- base::computeRestarts [18:41:47.985] grepl <- base::grepl [18:41:47.985] restarts <- computeRestarts(cond) [18:41:47.985] for (restart in restarts) { [18:41:47.985] name <- restart$name [18:41:47.985] if (is.null(name)) [18:41:47.985] next [18:41:47.985] if (!grepl(pattern, name)) [18:41:47.985] next [18:41:47.985] invokeRestart(restart) [18:41:47.985] muffled <- TRUE [18:41:47.985] break [18:41:47.985] } [18:41:47.985] } [18:41:47.985] } [18:41:47.985] invisible(muffled) [18:41:47.985] } [18:41:47.985] muffleCondition(cond, pattern = "^muffle") [18:41:47.985] } [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] if (TRUE) { [18:41:47.985] muffleCondition <- function (cond, pattern = "^muffle") [18:41:47.985] { [18:41:47.985] inherits <- base::inherits [18:41:47.985] invokeRestart <- base::invokeRestart [18:41:47.985] is.null <- base::is.null [18:41:47.985] muffled <- FALSE [18:41:47.985] if (inherits(cond, "message")) { [18:41:47.985] muffled <- grepl(pattern, "muffleMessage") [18:41:47.985] if (muffled) [18:41:47.985] invokeRestart("muffleMessage") [18:41:47.985] } [18:41:47.985] else if (inherits(cond, "warning")) { [18:41:47.985] muffled <- grepl(pattern, "muffleWarning") [18:41:47.985] if (muffled) [18:41:47.985] invokeRestart("muffleWarning") [18:41:47.985] } [18:41:47.985] else if (inherits(cond, "condition")) { [18:41:47.985] if (!is.null(pattern)) { [18:41:47.985] computeRestarts <- base::computeRestarts [18:41:47.985] grepl <- base::grepl [18:41:47.985] restarts <- computeRestarts(cond) [18:41:47.985] for (restart in restarts) { [18:41:47.985] name <- restart$name [18:41:47.985] if (is.null(name)) [18:41:47.985] next [18:41:47.985] if (!grepl(pattern, name)) [18:41:47.985] next [18:41:47.985] invokeRestart(restart) [18:41:47.985] muffled <- TRUE [18:41:47.985] break [18:41:47.985] } [18:41:47.985] } [18:41:47.985] } [18:41:47.985] invisible(muffled) [18:41:47.985] } [18:41:47.985] muffleCondition(cond, pattern = "^muffle") [18:41:47.985] } [18:41:47.985] } [18:41:47.985] } [18:41:47.985] })) [18:41:47.985] }, error = function(ex) { [18:41:47.985] base::structure(base::list(value = NULL, visible = NULL, [18:41:47.985] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:47.985] ...future.rng), started = ...future.startTime, [18:41:47.985] finished = Sys.time(), session_uuid = NA_character_, [18:41:47.985] version = "1.8"), class = "FutureResult") [18:41:47.985] }, finally = { [18:41:47.985] if (!identical(...future.workdir, getwd())) [18:41:47.985] setwd(...future.workdir) [18:41:47.985] { [18:41:47.985] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:47.985] ...future.oldOptions$nwarnings <- NULL [18:41:47.985] } [18:41:47.985] base::options(...future.oldOptions) [18:41:47.985] if (.Platform$OS.type == "windows") { [18:41:47.985] old_names <- names(...future.oldEnvVars) [18:41:47.985] envs <- base::Sys.getenv() [18:41:47.985] names <- names(envs) [18:41:47.985] common <- intersect(names, old_names) [18:41:47.985] added <- setdiff(names, old_names) [18:41:47.985] removed <- setdiff(old_names, names) [18:41:47.985] changed <- common[...future.oldEnvVars[common] != [18:41:47.985] envs[common]] [18:41:47.985] NAMES <- toupper(changed) [18:41:47.985] args <- list() [18:41:47.985] for (kk in seq_along(NAMES)) { [18:41:47.985] name <- changed[[kk]] [18:41:47.985] NAME <- NAMES[[kk]] [18:41:47.985] if (name != NAME && is.element(NAME, old_names)) [18:41:47.985] next [18:41:47.985] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.985] } [18:41:47.985] NAMES <- toupper(added) [18:41:47.985] for (kk in seq_along(NAMES)) { [18:41:47.985] name <- added[[kk]] [18:41:47.985] NAME <- NAMES[[kk]] [18:41:47.985] if (name != NAME && is.element(NAME, old_names)) [18:41:47.985] next [18:41:47.985] args[[name]] <- "" [18:41:47.985] } [18:41:47.985] NAMES <- toupper(removed) [18:41:47.985] for (kk in seq_along(NAMES)) { [18:41:47.985] name <- removed[[kk]] [18:41:47.985] NAME <- NAMES[[kk]] [18:41:47.985] if (name != NAME && is.element(NAME, old_names)) [18:41:47.985] next [18:41:47.985] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:47.985] } [18:41:47.985] if (length(args) > 0) [18:41:47.985] base::do.call(base::Sys.setenv, args = args) [18:41:47.985] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:47.985] } [18:41:47.985] { [18:41:47.985] if (base::length(...future.futureOptionsAdded) > [18:41:47.985] 0L) { [18:41:47.985] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:47.985] base::names(opts) <- ...future.futureOptionsAdded [18:41:47.985] base::options(opts) [18:41:47.985] } [18:41:47.985] { [18:41:47.985] { [18:41:47.985] base::options(mc.cores = ...future.mc.cores.old) [18:41:47.985] NULL [18:41:47.985] } [18:41:47.985] options(future.plan = NULL) [18:41:47.985] if (is.na(NA_character_)) [18:41:47.985] Sys.unsetenv("R_FUTURE_PLAN") [18:41:47.985] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:47.985] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:47.985] .init = FALSE) [18:41:47.985] } [18:41:47.985] } [18:41:47.985] } [18:41:47.985] }) [18:41:47.985] if (TRUE) { [18:41:47.985] base::sink(type = "output", split = FALSE) [18:41:47.985] if (TRUE) { [18:41:47.985] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:47.985] } [18:41:47.985] else { [18:41:47.985] ...future.result["stdout"] <- base::list(NULL) [18:41:47.985] } [18:41:47.985] base::close(...future.stdout) [18:41:47.985] ...future.stdout <- NULL [18:41:47.985] } [18:41:47.985] ...future.result$conditions <- ...future.conditions [18:41:47.985] ...future.result$finished <- base::Sys.time() [18:41:47.985] ...future.result [18:41:47.985] } [18:41:47.993] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:47.994] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:47.994] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:47.994] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:47.995] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:47.995] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:47.996] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:47.996] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:47.997] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:47.997] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:47.998] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:47.998] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:47.999] MultisessionFuture started [18:41:47.999] - Launch lazy future ... done [18:41:47.999] run() for 'MultisessionFuture' ... done [18:41:48.000] Created future: [18:41:48.012] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.012] - Validating connection of MultisessionFuture [18:41:48.013] - received message: FutureResult [18:41:48.013] - Received FutureResult [18:41:48.013] - Erased future from FutureRegistry [18:41:48.013] result() for ClusterFuture ... [18:41:48.014] - result already collected: FutureResult [18:41:48.014] result() for ClusterFuture ... done [18:41:48.014] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.000] MultisessionFuture: [18:41:48.000] Label: 'future_sapply-2' [18:41:48.000] Expression: [18:41:48.000] { [18:41:48.000] do.call(function(...) { [18:41:48.000] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.000] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.000] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.000] on.exit(options(oopts), add = TRUE) [18:41:48.000] } [18:41:48.000] { [18:41:48.000] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.000] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.000] ...future.FUN(...future.X_jj, ...) [18:41:48.000] }) [18:41:48.000] } [18:41:48.000] }, args = future.call.arguments) [18:41:48.000] } [18:41:48.000] Lazy evaluation: FALSE [18:41:48.000] Asynchronous evaluation: TRUE [18:41:48.000] Local evaluation: TRUE [18:41:48.000] Environment: R_GlobalEnv [18:41:48.000] Capture standard output: TRUE [18:41:48.000] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.000] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.000] Packages: [18:41:48.000] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.000] Resolved: TRUE [18:41:48.000] Value: [18:41:48.000] Conditions captured: [18:41:48.000] Early signaling: FALSE [18:41:48.000] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.000] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.015] Chunk #2 of 2 ... DONE [18:41:48.015] Launching 2 futures (chunks) ... DONE [18:41:48.015] Resolving 2 futures (chunks) ... [18:41:48.016] resolve() on list ... [18:41:48.016] recursive: 0 [18:41:48.016] length: 2 [18:41:48.016] [18:41:48.017] Future #1 [18:41:48.017] result() for ClusterFuture ... [18:41:48.017] - result already collected: FutureResult [18:41:48.017] result() for ClusterFuture ... done [18:41:48.018] result() for ClusterFuture ... [18:41:48.018] - result already collected: FutureResult [18:41:48.018] result() for ClusterFuture ... done [18:41:48.019] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:48.019] - nx: 2 [18:41:48.019] - relay: TRUE [18:41:48.019] - stdout: TRUE [18:41:48.020] - signal: TRUE [18:41:48.020] - resignal: FALSE [18:41:48.020] - force: TRUE [18:41:48.020] - relayed: [n=2] FALSE, FALSE [18:41:48.020] - queued futures: [n=2] FALSE, FALSE [18:41:48.021] - until=1 [18:41:48.021] - relaying element #1 [18:41:48.021] result() for ClusterFuture ... [18:41:48.022] - result already collected: FutureResult [18:41:48.022] result() for ClusterFuture ... done [18:41:48.022] result() for ClusterFuture ... [18:41:48.022] - result already collected: FutureResult [18:41:48.023] result() for ClusterFuture ... done [18:41:48.023] result() for ClusterFuture ... [18:41:48.023] - result already collected: FutureResult [18:41:48.023] result() for ClusterFuture ... done [18:41:48.024] result() for ClusterFuture ... [18:41:48.024] - result already collected: FutureResult [18:41:48.024] result() for ClusterFuture ... done [18:41:48.024] - relayed: [n=2] TRUE, FALSE [18:41:48.025] - queued futures: [n=2] TRUE, FALSE [18:41:48.025] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:48.025] length: 1 (resolved future 1) [18:41:48.025] Future #2 [18:41:48.026] result() for ClusterFuture ... [18:41:48.026] - result already collected: FutureResult [18:41:48.026] result() for ClusterFuture ... done [18:41:48.026] result() for ClusterFuture ... [18:41:48.027] - result already collected: FutureResult [18:41:48.027] result() for ClusterFuture ... done [18:41:48.027] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:48.028] - nx: 2 [18:41:48.028] - relay: TRUE [18:41:48.028] - stdout: TRUE [18:41:48.028] - signal: TRUE [18:41:48.028] - resignal: FALSE [18:41:48.029] - force: TRUE [18:41:48.029] - relayed: [n=2] TRUE, FALSE [18:41:48.029] - queued futures: [n=2] TRUE, FALSE [18:41:48.029] - until=2 [18:41:48.030] - relaying element #2 [18:41:48.030] result() for ClusterFuture ... [18:41:48.030] - result already collected: FutureResult [18:41:48.030] result() for ClusterFuture ... done [18:41:48.031] result() for ClusterFuture ... [18:41:48.031] - result already collected: FutureResult [18:41:48.031] result() for ClusterFuture ... done [18:41:48.032] result() for ClusterFuture ... [18:41:48.032] - result already collected: FutureResult [18:41:48.032] result() for ClusterFuture ... done [18:41:48.032] result() for ClusterFuture ... [18:41:48.033] - result already collected: FutureResult [18:41:48.033] result() for ClusterFuture ... done [18:41:48.033] - relayed: [n=2] TRUE, TRUE [18:41:48.033] - queued futures: [n=2] TRUE, TRUE [18:41:48.034] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:48.034] length: 0 (resolved future 2) [18:41:48.034] Relaying remaining futures [18:41:48.034] signalConditionsASAP(NULL, pos=0) ... [18:41:48.035] - nx: 2 [18:41:48.035] - relay: TRUE [18:41:48.035] - stdout: TRUE [18:41:48.035] - signal: TRUE [18:41:48.036] - resignal: FALSE [18:41:48.036] - force: TRUE [18:41:48.036] - relayed: [n=2] TRUE, TRUE [18:41:48.036] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:48.037] - relayed: [n=2] TRUE, TRUE [18:41:48.037] - queued futures: [n=2] TRUE, TRUE [18:41:48.037] signalConditionsASAP(NULL, pos=0) ... done [18:41:48.038] resolve() on list ... DONE [18:41:48.038] result() for ClusterFuture ... [18:41:48.038] - result already collected: FutureResult [18:41:48.038] result() for ClusterFuture ... done [18:41:48.039] result() for ClusterFuture ... [18:41:48.039] - result already collected: FutureResult [18:41:48.039] result() for ClusterFuture ... done [18:41:48.040] result() for ClusterFuture ... [18:41:48.040] - result already collected: FutureResult [18:41:48.040] result() for ClusterFuture ... done [18:41:48.040] result() for ClusterFuture ... [18:41:48.040] - result already collected: FutureResult [18:41:48.041] result() for ClusterFuture ... done [18:41:48.041] - Number of value chunks collected: 2 [18:41:48.041] Resolving 2 futures (chunks) ... DONE [18:41:48.042] Reducing values from 2 chunks ... [18:41:48.042] - Number of values collected after concatenation: 3 [18:41:48.042] - Number of values expected: 3 [18:41:48.042] Reducing values from 2 chunks ... DONE [18:41:48.043] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:48.046] future_lapply() ... [18:41:48.051] Number of chunks: 2 [18:41:48.052] getGlobalsAndPackagesXApply() ... [18:41:48.052] - future.globals: TRUE [18:41:48.052] getGlobalsAndPackages() ... [18:41:48.052] Searching for globals... [18:41:48.055] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:48.056] Searching for globals ... DONE [18:41:48.056] Resolving globals: FALSE [18:41:48.057] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:48.058] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:48.058] - globals: [1] 'FUN' [18:41:48.058] [18:41:48.058] getGlobalsAndPackages() ... DONE [18:41:48.059] - globals found/used: [n=1] 'FUN' [18:41:48.059] - needed namespaces: [n=0] [18:41:48.059] Finding globals ... DONE [18:41:48.059] - use_args: TRUE [18:41:48.060] - Getting '...' globals ... [18:41:48.060] resolve() on list ... [18:41:48.061] recursive: 0 [18:41:48.061] length: 1 [18:41:48.061] elements: '...' [18:41:48.062] length: 0 (resolved future 1) [18:41:48.062] resolve() on list ... DONE [18:41:48.062] - '...' content: [n=0] [18:41:48.062] List of 1 [18:41:48.062] $ ...: list() [18:41:48.062] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.062] - attr(*, "where")=List of 1 [18:41:48.062] ..$ ...: [18:41:48.062] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.062] - attr(*, "resolved")= logi TRUE [18:41:48.062] - attr(*, "total_size")= num NA [18:41:48.067] - Getting '...' globals ... DONE [18:41:48.067] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:48.068] List of 2 [18:41:48.068] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:48.068] $ ... : list() [18:41:48.068] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.068] - attr(*, "where")=List of 2 [18:41:48.068] ..$ ...future.FUN: [18:41:48.068] ..$ ... : [18:41:48.068] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.068] - attr(*, "resolved")= logi FALSE [18:41:48.068] - attr(*, "total_size")= int 6598 [18:41:48.073] Packages to be attached in all futures: [n=0] [18:41:48.073] getGlobalsAndPackagesXApply() ... DONE [18:41:48.074] Number of futures (= number of chunks): 2 [18:41:48.074] Launching 2 futures (chunks) ... [18:41:48.074] Chunk #1 of 2 ... [18:41:48.074] - Finding globals in 'X' for chunk #1 ... [18:41:48.075] getGlobalsAndPackages() ... [18:41:48.075] Searching for globals... [18:41:48.075] [18:41:48.076] Searching for globals ... DONE [18:41:48.076] - globals: [0] [18:41:48.076] getGlobalsAndPackages() ... DONE [18:41:48.076] + additional globals found: [n=0] [18:41:48.077] + additional namespaces needed: [n=0] [18:41:48.077] - Finding globals in 'X' for chunk #1 ... DONE [18:41:48.077] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.077] - seeds: [18:41:48.078] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.078] getGlobalsAndPackages() ... [18:41:48.078] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.079] Resolving globals: FALSE [18:41:48.079] Tweak future expression to call with '...' arguments ... [18:41:48.079] { [18:41:48.079] do.call(function(...) { [18:41:48.079] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.079] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.079] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.079] on.exit(options(oopts), add = TRUE) [18:41:48.079] } [18:41:48.079] { [18:41:48.079] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.079] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.079] ...future.FUN(...future.X_jj, ...) [18:41:48.079] }) [18:41:48.079] } [18:41:48.079] }, args = future.call.arguments) [18:41:48.079] } [18:41:48.080] Tweak future expression to call with '...' arguments ... DONE [18:41:48.081] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.081] [18:41:48.081] getGlobalsAndPackages() ... DONE [18:41:48.082] run() for 'Future' ... [18:41:48.082] - state: 'created' [18:41:48.082] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.107] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.108] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.108] - Field: 'node' [18:41:48.108] - Field: 'label' [18:41:48.109] - Field: 'local' [18:41:48.109] - Field: 'owner' [18:41:48.109] - Field: 'envir' [18:41:48.109] - Field: 'workers' [18:41:48.110] - Field: 'packages' [18:41:48.110] - Field: 'gc' [18:41:48.110] - Field: 'conditions' [18:41:48.110] - Field: 'persistent' [18:41:48.111] - Field: 'expr' [18:41:48.111] - Field: 'uuid' [18:41:48.111] - Field: 'seed' [18:41:48.112] - Field: 'version' [18:41:48.112] - Field: 'result' [18:41:48.112] - Field: 'asynchronous' [18:41:48.112] - Field: 'calls' [18:41:48.113] - Field: 'globals' [18:41:48.113] - Field: 'stdout' [18:41:48.113] - Field: 'earlySignal' [18:41:48.114] - Field: 'lazy' [18:41:48.114] - Field: 'state' [18:41:48.114] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.114] - Launch lazy future ... [18:41:48.115] Packages needed by the future expression (n = 0): [18:41:48.115] Packages needed by future strategies (n = 0): [18:41:48.116] { [18:41:48.116] { [18:41:48.116] { [18:41:48.116] ...future.startTime <- base::Sys.time() [18:41:48.116] { [18:41:48.116] { [18:41:48.116] { [18:41:48.116] { [18:41:48.116] base::local({ [18:41:48.116] has_future <- base::requireNamespace("future", [18:41:48.116] quietly = TRUE) [18:41:48.116] if (has_future) { [18:41:48.116] ns <- base::getNamespace("future") [18:41:48.116] version <- ns[[".package"]][["version"]] [18:41:48.116] if (is.null(version)) [18:41:48.116] version <- utils::packageVersion("future") [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] version <- NULL [18:41:48.116] } [18:41:48.116] if (!has_future || version < "1.8.0") { [18:41:48.116] info <- base::c(r_version = base::gsub("R version ", [18:41:48.116] "", base::R.version$version.string), [18:41:48.116] platform = base::sprintf("%s (%s-bit)", [18:41:48.116] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.116] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.116] "release", "version")], collapse = " "), [18:41:48.116] hostname = base::Sys.info()[["nodename"]]) [18:41:48.116] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.116] info) [18:41:48.116] info <- base::paste(info, collapse = "; ") [18:41:48.116] if (!has_future) { [18:41:48.116] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.116] info) [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.116] info, version) [18:41:48.116] } [18:41:48.116] base::stop(msg) [18:41:48.116] } [18:41:48.116] }) [18:41:48.116] } [18:41:48.116] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.116] base::options(mc.cores = 1L) [18:41:48.116] } [18:41:48.116] ...future.strategy.old <- future::plan("list") [18:41:48.116] options(future.plan = NULL) [18:41:48.116] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.116] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.116] } [18:41:48.116] ...future.workdir <- getwd() [18:41:48.116] } [18:41:48.116] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.116] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.116] } [18:41:48.116] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.116] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.116] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.116] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.116] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.116] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.116] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.116] base::names(...future.oldOptions)) [18:41:48.116] } [18:41:48.116] if (FALSE) { [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] if (TRUE) { [18:41:48.116] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.116] open = "w") [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.116] windows = "NUL", "/dev/null"), open = "w") [18:41:48.116] } [18:41:48.116] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.116] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.116] base::sink(type = "output", split = FALSE) [18:41:48.116] base::close(...future.stdout) [18:41:48.116] }, add = TRUE) [18:41:48.116] } [18:41:48.116] ...future.frame <- base::sys.nframe() [18:41:48.116] ...future.conditions <- base::list() [18:41:48.116] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.116] if (FALSE) { [18:41:48.116] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.116] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.116] } [18:41:48.116] ...future.result <- base::tryCatch({ [18:41:48.116] base::withCallingHandlers({ [18:41:48.116] ...future.value <- base::withVisible(base::local({ [18:41:48.116] ...future.makeSendCondition <- base::local({ [18:41:48.116] sendCondition <- NULL [18:41:48.116] function(frame = 1L) { [18:41:48.116] if (is.function(sendCondition)) [18:41:48.116] return(sendCondition) [18:41:48.116] ns <- getNamespace("parallel") [18:41:48.116] if (exists("sendData", mode = "function", [18:41:48.116] envir = ns)) { [18:41:48.116] parallel_sendData <- get("sendData", mode = "function", [18:41:48.116] envir = ns) [18:41:48.116] envir <- sys.frame(frame) [18:41:48.116] master <- NULL [18:41:48.116] while (!identical(envir, .GlobalEnv) && [18:41:48.116] !identical(envir, emptyenv())) { [18:41:48.116] if (exists("master", mode = "list", envir = envir, [18:41:48.116] inherits = FALSE)) { [18:41:48.116] master <- get("master", mode = "list", [18:41:48.116] envir = envir, inherits = FALSE) [18:41:48.116] if (inherits(master, c("SOCKnode", [18:41:48.116] "SOCK0node"))) { [18:41:48.116] sendCondition <<- function(cond) { [18:41:48.116] data <- list(type = "VALUE", value = cond, [18:41:48.116] success = TRUE) [18:41:48.116] parallel_sendData(master, data) [18:41:48.116] } [18:41:48.116] return(sendCondition) [18:41:48.116] } [18:41:48.116] } [18:41:48.116] frame <- frame + 1L [18:41:48.116] envir <- sys.frame(frame) [18:41:48.116] } [18:41:48.116] } [18:41:48.116] sendCondition <<- function(cond) NULL [18:41:48.116] } [18:41:48.116] }) [18:41:48.116] withCallingHandlers({ [18:41:48.116] { [18:41:48.116] do.call(function(...) { [18:41:48.116] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.116] if (!identical(...future.globals.maxSize.org, [18:41:48.116] ...future.globals.maxSize)) { [18:41:48.116] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.116] on.exit(options(oopts), add = TRUE) [18:41:48.116] } [18:41:48.116] { [18:41:48.116] lapply(seq_along(...future.elements_ii), [18:41:48.116] FUN = function(jj) { [18:41:48.116] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.116] ...future.FUN(...future.X_jj, ...) [18:41:48.116] }) [18:41:48.116] } [18:41:48.116] }, args = future.call.arguments) [18:41:48.116] } [18:41:48.116] }, immediateCondition = function(cond) { [18:41:48.116] sendCondition <- ...future.makeSendCondition() [18:41:48.116] sendCondition(cond) [18:41:48.116] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.116] { [18:41:48.116] inherits <- base::inherits [18:41:48.116] invokeRestart <- base::invokeRestart [18:41:48.116] is.null <- base::is.null [18:41:48.116] muffled <- FALSE [18:41:48.116] if (inherits(cond, "message")) { [18:41:48.116] muffled <- grepl(pattern, "muffleMessage") [18:41:48.116] if (muffled) [18:41:48.116] invokeRestart("muffleMessage") [18:41:48.116] } [18:41:48.116] else if (inherits(cond, "warning")) { [18:41:48.116] muffled <- grepl(pattern, "muffleWarning") [18:41:48.116] if (muffled) [18:41:48.116] invokeRestart("muffleWarning") [18:41:48.116] } [18:41:48.116] else if (inherits(cond, "condition")) { [18:41:48.116] if (!is.null(pattern)) { [18:41:48.116] computeRestarts <- base::computeRestarts [18:41:48.116] grepl <- base::grepl [18:41:48.116] restarts <- computeRestarts(cond) [18:41:48.116] for (restart in restarts) { [18:41:48.116] name <- restart$name [18:41:48.116] if (is.null(name)) [18:41:48.116] next [18:41:48.116] if (!grepl(pattern, name)) [18:41:48.116] next [18:41:48.116] invokeRestart(restart) [18:41:48.116] muffled <- TRUE [18:41:48.116] break [18:41:48.116] } [18:41:48.116] } [18:41:48.116] } [18:41:48.116] invisible(muffled) [18:41:48.116] } [18:41:48.116] muffleCondition(cond) [18:41:48.116] }) [18:41:48.116] })) [18:41:48.116] future::FutureResult(value = ...future.value$value, [18:41:48.116] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.116] ...future.rng), globalenv = if (FALSE) [18:41:48.116] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.116] ...future.globalenv.names)) [18:41:48.116] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.116] }, condition = base::local({ [18:41:48.116] c <- base::c [18:41:48.116] inherits <- base::inherits [18:41:48.116] invokeRestart <- base::invokeRestart [18:41:48.116] length <- base::length [18:41:48.116] list <- base::list [18:41:48.116] seq.int <- base::seq.int [18:41:48.116] signalCondition <- base::signalCondition [18:41:48.116] sys.calls <- base::sys.calls [18:41:48.116] `[[` <- base::`[[` [18:41:48.116] `+` <- base::`+` [18:41:48.116] `<<-` <- base::`<<-` [18:41:48.116] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.116] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.116] 3L)] [18:41:48.116] } [18:41:48.116] function(cond) { [18:41:48.116] is_error <- inherits(cond, "error") [18:41:48.116] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.116] NULL) [18:41:48.116] if (is_error) { [18:41:48.116] sessionInformation <- function() { [18:41:48.116] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.116] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.116] search = base::search(), system = base::Sys.info()) [18:41:48.116] } [18:41:48.116] ...future.conditions[[length(...future.conditions) + [18:41:48.116] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.116] cond$call), session = sessionInformation(), [18:41:48.116] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.116] signalCondition(cond) [18:41:48.116] } [18:41:48.116] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.116] "immediateCondition"))) { [18:41:48.116] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.116] ...future.conditions[[length(...future.conditions) + [18:41:48.116] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.116] if (TRUE && !signal) { [18:41:48.116] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.116] { [18:41:48.116] inherits <- base::inherits [18:41:48.116] invokeRestart <- base::invokeRestart [18:41:48.116] is.null <- base::is.null [18:41:48.116] muffled <- FALSE [18:41:48.116] if (inherits(cond, "message")) { [18:41:48.116] muffled <- grepl(pattern, "muffleMessage") [18:41:48.116] if (muffled) [18:41:48.116] invokeRestart("muffleMessage") [18:41:48.116] } [18:41:48.116] else if (inherits(cond, "warning")) { [18:41:48.116] muffled <- grepl(pattern, "muffleWarning") [18:41:48.116] if (muffled) [18:41:48.116] invokeRestart("muffleWarning") [18:41:48.116] } [18:41:48.116] else if (inherits(cond, "condition")) { [18:41:48.116] if (!is.null(pattern)) { [18:41:48.116] computeRestarts <- base::computeRestarts [18:41:48.116] grepl <- base::grepl [18:41:48.116] restarts <- computeRestarts(cond) [18:41:48.116] for (restart in restarts) { [18:41:48.116] name <- restart$name [18:41:48.116] if (is.null(name)) [18:41:48.116] next [18:41:48.116] if (!grepl(pattern, name)) [18:41:48.116] next [18:41:48.116] invokeRestart(restart) [18:41:48.116] muffled <- TRUE [18:41:48.116] break [18:41:48.116] } [18:41:48.116] } [18:41:48.116] } [18:41:48.116] invisible(muffled) [18:41:48.116] } [18:41:48.116] muffleCondition(cond, pattern = "^muffle") [18:41:48.116] } [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] if (TRUE) { [18:41:48.116] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.116] { [18:41:48.116] inherits <- base::inherits [18:41:48.116] invokeRestart <- base::invokeRestart [18:41:48.116] is.null <- base::is.null [18:41:48.116] muffled <- FALSE [18:41:48.116] if (inherits(cond, "message")) { [18:41:48.116] muffled <- grepl(pattern, "muffleMessage") [18:41:48.116] if (muffled) [18:41:48.116] invokeRestart("muffleMessage") [18:41:48.116] } [18:41:48.116] else if (inherits(cond, "warning")) { [18:41:48.116] muffled <- grepl(pattern, "muffleWarning") [18:41:48.116] if (muffled) [18:41:48.116] invokeRestart("muffleWarning") [18:41:48.116] } [18:41:48.116] else if (inherits(cond, "condition")) { [18:41:48.116] if (!is.null(pattern)) { [18:41:48.116] computeRestarts <- base::computeRestarts [18:41:48.116] grepl <- base::grepl [18:41:48.116] restarts <- computeRestarts(cond) [18:41:48.116] for (restart in restarts) { [18:41:48.116] name <- restart$name [18:41:48.116] if (is.null(name)) [18:41:48.116] next [18:41:48.116] if (!grepl(pattern, name)) [18:41:48.116] next [18:41:48.116] invokeRestart(restart) [18:41:48.116] muffled <- TRUE [18:41:48.116] break [18:41:48.116] } [18:41:48.116] } [18:41:48.116] } [18:41:48.116] invisible(muffled) [18:41:48.116] } [18:41:48.116] muffleCondition(cond, pattern = "^muffle") [18:41:48.116] } [18:41:48.116] } [18:41:48.116] } [18:41:48.116] })) [18:41:48.116] }, error = function(ex) { [18:41:48.116] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.116] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.116] ...future.rng), started = ...future.startTime, [18:41:48.116] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.116] version = "1.8"), class = "FutureResult") [18:41:48.116] }, finally = { [18:41:48.116] if (!identical(...future.workdir, getwd())) [18:41:48.116] setwd(...future.workdir) [18:41:48.116] { [18:41:48.116] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.116] ...future.oldOptions$nwarnings <- NULL [18:41:48.116] } [18:41:48.116] base::options(...future.oldOptions) [18:41:48.116] if (.Platform$OS.type == "windows") { [18:41:48.116] old_names <- names(...future.oldEnvVars) [18:41:48.116] envs <- base::Sys.getenv() [18:41:48.116] names <- names(envs) [18:41:48.116] common <- intersect(names, old_names) [18:41:48.116] added <- setdiff(names, old_names) [18:41:48.116] removed <- setdiff(old_names, names) [18:41:48.116] changed <- common[...future.oldEnvVars[common] != [18:41:48.116] envs[common]] [18:41:48.116] NAMES <- toupper(changed) [18:41:48.116] args <- list() [18:41:48.116] for (kk in seq_along(NAMES)) { [18:41:48.116] name <- changed[[kk]] [18:41:48.116] NAME <- NAMES[[kk]] [18:41:48.116] if (name != NAME && is.element(NAME, old_names)) [18:41:48.116] next [18:41:48.116] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.116] } [18:41:48.116] NAMES <- toupper(added) [18:41:48.116] for (kk in seq_along(NAMES)) { [18:41:48.116] name <- added[[kk]] [18:41:48.116] NAME <- NAMES[[kk]] [18:41:48.116] if (name != NAME && is.element(NAME, old_names)) [18:41:48.116] next [18:41:48.116] args[[name]] <- "" [18:41:48.116] } [18:41:48.116] NAMES <- toupper(removed) [18:41:48.116] for (kk in seq_along(NAMES)) { [18:41:48.116] name <- removed[[kk]] [18:41:48.116] NAME <- NAMES[[kk]] [18:41:48.116] if (name != NAME && is.element(NAME, old_names)) [18:41:48.116] next [18:41:48.116] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.116] } [18:41:48.116] if (length(args) > 0) [18:41:48.116] base::do.call(base::Sys.setenv, args = args) [18:41:48.116] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.116] } [18:41:48.116] { [18:41:48.116] if (base::length(...future.futureOptionsAdded) > [18:41:48.116] 0L) { [18:41:48.116] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.116] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.116] base::options(opts) [18:41:48.116] } [18:41:48.116] { [18:41:48.116] { [18:41:48.116] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.116] NULL [18:41:48.116] } [18:41:48.116] options(future.plan = NULL) [18:41:48.116] if (is.na(NA_character_)) [18:41:48.116] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.116] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.116] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.116] .init = FALSE) [18:41:48.116] } [18:41:48.116] } [18:41:48.116] } [18:41:48.116] }) [18:41:48.116] if (TRUE) { [18:41:48.116] base::sink(type = "output", split = FALSE) [18:41:48.116] if (TRUE) { [18:41:48.116] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.116] } [18:41:48.116] else { [18:41:48.116] ...future.result["stdout"] <- base::list(NULL) [18:41:48.116] } [18:41:48.116] base::close(...future.stdout) [18:41:48.116] ...future.stdout <- NULL [18:41:48.116] } [18:41:48.116] ...future.result$conditions <- ...future.conditions [18:41:48.116] ...future.result$finished <- base::Sys.time() [18:41:48.116] ...future.result [18:41:48.116] } [18:41:48.125] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... [18:41:48.125] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:48.126] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:48.126] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.127] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.127] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:48.128] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:48.128] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.128] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.129] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.129] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.130] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... DONE [18:41:48.131] MultisessionFuture started [18:41:48.131] - Launch lazy future ... done [18:41:48.131] run() for 'MultisessionFuture' ... done [18:41:48.132] Created future: [18:41:48.145] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.145] - Validating connection of MultisessionFuture [18:41:48.146] - received message: FutureResult [18:41:48.146] - Received FutureResult [18:41:48.146] - Erased future from FutureRegistry [18:41:48.147] result() for ClusterFuture ... [18:41:48.147] - result already collected: FutureResult [18:41:48.147] result() for ClusterFuture ... done [18:41:48.148] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.132] MultisessionFuture: [18:41:48.132] Label: 'future_sapply-1' [18:41:48.132] Expression: [18:41:48.132] { [18:41:48.132] do.call(function(...) { [18:41:48.132] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.132] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.132] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.132] on.exit(options(oopts), add = TRUE) [18:41:48.132] } [18:41:48.132] { [18:41:48.132] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.132] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.132] ...future.FUN(...future.X_jj, ...) [18:41:48.132] }) [18:41:48.132] } [18:41:48.132] }, args = future.call.arguments) [18:41:48.132] } [18:41:48.132] Lazy evaluation: FALSE [18:41:48.132] Asynchronous evaluation: TRUE [18:41:48.132] Local evaluation: TRUE [18:41:48.132] Environment: R_GlobalEnv [18:41:48.132] Capture standard output: TRUE [18:41:48.132] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.132] Globals: 5 objects totaling 1.00 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.132] Packages: [18:41:48.132] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.132] Resolved: TRUE [18:41:48.132] Value: [18:41:48.132] Conditions captured: [18:41:48.132] Early signaling: FALSE [18:41:48.132] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.132] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.148] Chunk #1 of 2 ... DONE [18:41:48.149] Chunk #2 of 2 ... [18:41:48.149] - Finding globals in 'X' for chunk #2 ... [18:41:48.149] getGlobalsAndPackages() ... [18:41:48.149] Searching for globals... [18:41:48.150] [18:41:48.150] Searching for globals ... DONE [18:41:48.150] - globals: [0] [18:41:48.151] getGlobalsAndPackages() ... DONE [18:41:48.151] + additional globals found: [n=0] [18:41:48.151] + additional namespaces needed: [n=0] [18:41:48.151] - Finding globals in 'X' for chunk #2 ... DONE [18:41:48.152] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.152] - seeds: [18:41:48.152] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.152] getGlobalsAndPackages() ... [18:41:48.153] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.153] Resolving globals: FALSE [18:41:48.153] Tweak future expression to call with '...' arguments ... [18:41:48.154] { [18:41:48.154] do.call(function(...) { [18:41:48.154] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.154] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.154] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.154] on.exit(options(oopts), add = TRUE) [18:41:48.154] } [18:41:48.154] { [18:41:48.154] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.154] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.154] ...future.FUN(...future.X_jj, ...) [18:41:48.154] }) [18:41:48.154] } [18:41:48.154] }, args = future.call.arguments) [18:41:48.154] } [18:41:48.154] Tweak future expression to call with '...' arguments ... DONE [18:41:48.155] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.155] [18:41:48.156] getGlobalsAndPackages() ... DONE [18:41:48.156] run() for 'Future' ... [18:41:48.156] - state: 'created' [18:41:48.157] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.177] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.177] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.178] - Field: 'node' [18:41:48.178] - Field: 'label' [18:41:48.178] - Field: 'local' [18:41:48.179] - Field: 'owner' [18:41:48.179] - Field: 'envir' [18:41:48.179] - Field: 'workers' [18:41:48.179] - Field: 'packages' [18:41:48.180] - Field: 'gc' [18:41:48.180] - Field: 'conditions' [18:41:48.180] - Field: 'persistent' [18:41:48.181] - Field: 'expr' [18:41:48.181] - Field: 'uuid' [18:41:48.181] - Field: 'seed' [18:41:48.181] - Field: 'version' [18:41:48.182] - Field: 'result' [18:41:48.182] - Field: 'asynchronous' [18:41:48.182] - Field: 'calls' [18:41:48.183] - Field: 'globals' [18:41:48.183] - Field: 'stdout' [18:41:48.183] - Field: 'earlySignal' [18:41:48.183] - Field: 'lazy' [18:41:48.184] - Field: 'state' [18:41:48.184] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.184] - Launch lazy future ... [18:41:48.185] Packages needed by the future expression (n = 0): [18:41:48.185] Packages needed by future strategies (n = 0): [18:41:48.186] { [18:41:48.186] { [18:41:48.186] { [18:41:48.186] ...future.startTime <- base::Sys.time() [18:41:48.186] { [18:41:48.186] { [18:41:48.186] { [18:41:48.186] { [18:41:48.186] base::local({ [18:41:48.186] has_future <- base::requireNamespace("future", [18:41:48.186] quietly = TRUE) [18:41:48.186] if (has_future) { [18:41:48.186] ns <- base::getNamespace("future") [18:41:48.186] version <- ns[[".package"]][["version"]] [18:41:48.186] if (is.null(version)) [18:41:48.186] version <- utils::packageVersion("future") [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] version <- NULL [18:41:48.186] } [18:41:48.186] if (!has_future || version < "1.8.0") { [18:41:48.186] info <- base::c(r_version = base::gsub("R version ", [18:41:48.186] "", base::R.version$version.string), [18:41:48.186] platform = base::sprintf("%s (%s-bit)", [18:41:48.186] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.186] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.186] "release", "version")], collapse = " "), [18:41:48.186] hostname = base::Sys.info()[["nodename"]]) [18:41:48.186] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.186] info) [18:41:48.186] info <- base::paste(info, collapse = "; ") [18:41:48.186] if (!has_future) { [18:41:48.186] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.186] info) [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.186] info, version) [18:41:48.186] } [18:41:48.186] base::stop(msg) [18:41:48.186] } [18:41:48.186] }) [18:41:48.186] } [18:41:48.186] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.186] base::options(mc.cores = 1L) [18:41:48.186] } [18:41:48.186] ...future.strategy.old <- future::plan("list") [18:41:48.186] options(future.plan = NULL) [18:41:48.186] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.186] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.186] } [18:41:48.186] ...future.workdir <- getwd() [18:41:48.186] } [18:41:48.186] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.186] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.186] } [18:41:48.186] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.186] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.186] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.186] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.186] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.186] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.186] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.186] base::names(...future.oldOptions)) [18:41:48.186] } [18:41:48.186] if (FALSE) { [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] if (TRUE) { [18:41:48.186] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.186] open = "w") [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.186] windows = "NUL", "/dev/null"), open = "w") [18:41:48.186] } [18:41:48.186] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.186] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.186] base::sink(type = "output", split = FALSE) [18:41:48.186] base::close(...future.stdout) [18:41:48.186] }, add = TRUE) [18:41:48.186] } [18:41:48.186] ...future.frame <- base::sys.nframe() [18:41:48.186] ...future.conditions <- base::list() [18:41:48.186] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.186] if (FALSE) { [18:41:48.186] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.186] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.186] } [18:41:48.186] ...future.result <- base::tryCatch({ [18:41:48.186] base::withCallingHandlers({ [18:41:48.186] ...future.value <- base::withVisible(base::local({ [18:41:48.186] ...future.makeSendCondition <- base::local({ [18:41:48.186] sendCondition <- NULL [18:41:48.186] function(frame = 1L) { [18:41:48.186] if (is.function(sendCondition)) [18:41:48.186] return(sendCondition) [18:41:48.186] ns <- getNamespace("parallel") [18:41:48.186] if (exists("sendData", mode = "function", [18:41:48.186] envir = ns)) { [18:41:48.186] parallel_sendData <- get("sendData", mode = "function", [18:41:48.186] envir = ns) [18:41:48.186] envir <- sys.frame(frame) [18:41:48.186] master <- NULL [18:41:48.186] while (!identical(envir, .GlobalEnv) && [18:41:48.186] !identical(envir, emptyenv())) { [18:41:48.186] if (exists("master", mode = "list", envir = envir, [18:41:48.186] inherits = FALSE)) { [18:41:48.186] master <- get("master", mode = "list", [18:41:48.186] envir = envir, inherits = FALSE) [18:41:48.186] if (inherits(master, c("SOCKnode", [18:41:48.186] "SOCK0node"))) { [18:41:48.186] sendCondition <<- function(cond) { [18:41:48.186] data <- list(type = "VALUE", value = cond, [18:41:48.186] success = TRUE) [18:41:48.186] parallel_sendData(master, data) [18:41:48.186] } [18:41:48.186] return(sendCondition) [18:41:48.186] } [18:41:48.186] } [18:41:48.186] frame <- frame + 1L [18:41:48.186] envir <- sys.frame(frame) [18:41:48.186] } [18:41:48.186] } [18:41:48.186] sendCondition <<- function(cond) NULL [18:41:48.186] } [18:41:48.186] }) [18:41:48.186] withCallingHandlers({ [18:41:48.186] { [18:41:48.186] do.call(function(...) { [18:41:48.186] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.186] if (!identical(...future.globals.maxSize.org, [18:41:48.186] ...future.globals.maxSize)) { [18:41:48.186] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.186] on.exit(options(oopts), add = TRUE) [18:41:48.186] } [18:41:48.186] { [18:41:48.186] lapply(seq_along(...future.elements_ii), [18:41:48.186] FUN = function(jj) { [18:41:48.186] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.186] ...future.FUN(...future.X_jj, ...) [18:41:48.186] }) [18:41:48.186] } [18:41:48.186] }, args = future.call.arguments) [18:41:48.186] } [18:41:48.186] }, immediateCondition = function(cond) { [18:41:48.186] sendCondition <- ...future.makeSendCondition() [18:41:48.186] sendCondition(cond) [18:41:48.186] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.186] { [18:41:48.186] inherits <- base::inherits [18:41:48.186] invokeRestart <- base::invokeRestart [18:41:48.186] is.null <- base::is.null [18:41:48.186] muffled <- FALSE [18:41:48.186] if (inherits(cond, "message")) { [18:41:48.186] muffled <- grepl(pattern, "muffleMessage") [18:41:48.186] if (muffled) [18:41:48.186] invokeRestart("muffleMessage") [18:41:48.186] } [18:41:48.186] else if (inherits(cond, "warning")) { [18:41:48.186] muffled <- grepl(pattern, "muffleWarning") [18:41:48.186] if (muffled) [18:41:48.186] invokeRestart("muffleWarning") [18:41:48.186] } [18:41:48.186] else if (inherits(cond, "condition")) { [18:41:48.186] if (!is.null(pattern)) { [18:41:48.186] computeRestarts <- base::computeRestarts [18:41:48.186] grepl <- base::grepl [18:41:48.186] restarts <- computeRestarts(cond) [18:41:48.186] for (restart in restarts) { [18:41:48.186] name <- restart$name [18:41:48.186] if (is.null(name)) [18:41:48.186] next [18:41:48.186] if (!grepl(pattern, name)) [18:41:48.186] next [18:41:48.186] invokeRestart(restart) [18:41:48.186] muffled <- TRUE [18:41:48.186] break [18:41:48.186] } [18:41:48.186] } [18:41:48.186] } [18:41:48.186] invisible(muffled) [18:41:48.186] } [18:41:48.186] muffleCondition(cond) [18:41:48.186] }) [18:41:48.186] })) [18:41:48.186] future::FutureResult(value = ...future.value$value, [18:41:48.186] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.186] ...future.rng), globalenv = if (FALSE) [18:41:48.186] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.186] ...future.globalenv.names)) [18:41:48.186] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.186] }, condition = base::local({ [18:41:48.186] c <- base::c [18:41:48.186] inherits <- base::inherits [18:41:48.186] invokeRestart <- base::invokeRestart [18:41:48.186] length <- base::length [18:41:48.186] list <- base::list [18:41:48.186] seq.int <- base::seq.int [18:41:48.186] signalCondition <- base::signalCondition [18:41:48.186] sys.calls <- base::sys.calls [18:41:48.186] `[[` <- base::`[[` [18:41:48.186] `+` <- base::`+` [18:41:48.186] `<<-` <- base::`<<-` [18:41:48.186] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.186] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.186] 3L)] [18:41:48.186] } [18:41:48.186] function(cond) { [18:41:48.186] is_error <- inherits(cond, "error") [18:41:48.186] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.186] NULL) [18:41:48.186] if (is_error) { [18:41:48.186] sessionInformation <- function() { [18:41:48.186] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.186] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.186] search = base::search(), system = base::Sys.info()) [18:41:48.186] } [18:41:48.186] ...future.conditions[[length(...future.conditions) + [18:41:48.186] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.186] cond$call), session = sessionInformation(), [18:41:48.186] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.186] signalCondition(cond) [18:41:48.186] } [18:41:48.186] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.186] "immediateCondition"))) { [18:41:48.186] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.186] ...future.conditions[[length(...future.conditions) + [18:41:48.186] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.186] if (TRUE && !signal) { [18:41:48.186] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.186] { [18:41:48.186] inherits <- base::inherits [18:41:48.186] invokeRestart <- base::invokeRestart [18:41:48.186] is.null <- base::is.null [18:41:48.186] muffled <- FALSE [18:41:48.186] if (inherits(cond, "message")) { [18:41:48.186] muffled <- grepl(pattern, "muffleMessage") [18:41:48.186] if (muffled) [18:41:48.186] invokeRestart("muffleMessage") [18:41:48.186] } [18:41:48.186] else if (inherits(cond, "warning")) { [18:41:48.186] muffled <- grepl(pattern, "muffleWarning") [18:41:48.186] if (muffled) [18:41:48.186] invokeRestart("muffleWarning") [18:41:48.186] } [18:41:48.186] else if (inherits(cond, "condition")) { [18:41:48.186] if (!is.null(pattern)) { [18:41:48.186] computeRestarts <- base::computeRestarts [18:41:48.186] grepl <- base::grepl [18:41:48.186] restarts <- computeRestarts(cond) [18:41:48.186] for (restart in restarts) { [18:41:48.186] name <- restart$name [18:41:48.186] if (is.null(name)) [18:41:48.186] next [18:41:48.186] if (!grepl(pattern, name)) [18:41:48.186] next [18:41:48.186] invokeRestart(restart) [18:41:48.186] muffled <- TRUE [18:41:48.186] break [18:41:48.186] } [18:41:48.186] } [18:41:48.186] } [18:41:48.186] invisible(muffled) [18:41:48.186] } [18:41:48.186] muffleCondition(cond, pattern = "^muffle") [18:41:48.186] } [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] if (TRUE) { [18:41:48.186] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.186] { [18:41:48.186] inherits <- base::inherits [18:41:48.186] invokeRestart <- base::invokeRestart [18:41:48.186] is.null <- base::is.null [18:41:48.186] muffled <- FALSE [18:41:48.186] if (inherits(cond, "message")) { [18:41:48.186] muffled <- grepl(pattern, "muffleMessage") [18:41:48.186] if (muffled) [18:41:48.186] invokeRestart("muffleMessage") [18:41:48.186] } [18:41:48.186] else if (inherits(cond, "warning")) { [18:41:48.186] muffled <- grepl(pattern, "muffleWarning") [18:41:48.186] if (muffled) [18:41:48.186] invokeRestart("muffleWarning") [18:41:48.186] } [18:41:48.186] else if (inherits(cond, "condition")) { [18:41:48.186] if (!is.null(pattern)) { [18:41:48.186] computeRestarts <- base::computeRestarts [18:41:48.186] grepl <- base::grepl [18:41:48.186] restarts <- computeRestarts(cond) [18:41:48.186] for (restart in restarts) { [18:41:48.186] name <- restart$name [18:41:48.186] if (is.null(name)) [18:41:48.186] next [18:41:48.186] if (!grepl(pattern, name)) [18:41:48.186] next [18:41:48.186] invokeRestart(restart) [18:41:48.186] muffled <- TRUE [18:41:48.186] break [18:41:48.186] } [18:41:48.186] } [18:41:48.186] } [18:41:48.186] invisible(muffled) [18:41:48.186] } [18:41:48.186] muffleCondition(cond, pattern = "^muffle") [18:41:48.186] } [18:41:48.186] } [18:41:48.186] } [18:41:48.186] })) [18:41:48.186] }, error = function(ex) { [18:41:48.186] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.186] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.186] ...future.rng), started = ...future.startTime, [18:41:48.186] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.186] version = "1.8"), class = "FutureResult") [18:41:48.186] }, finally = { [18:41:48.186] if (!identical(...future.workdir, getwd())) [18:41:48.186] setwd(...future.workdir) [18:41:48.186] { [18:41:48.186] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.186] ...future.oldOptions$nwarnings <- NULL [18:41:48.186] } [18:41:48.186] base::options(...future.oldOptions) [18:41:48.186] if (.Platform$OS.type == "windows") { [18:41:48.186] old_names <- names(...future.oldEnvVars) [18:41:48.186] envs <- base::Sys.getenv() [18:41:48.186] names <- names(envs) [18:41:48.186] common <- intersect(names, old_names) [18:41:48.186] added <- setdiff(names, old_names) [18:41:48.186] removed <- setdiff(old_names, names) [18:41:48.186] changed <- common[...future.oldEnvVars[common] != [18:41:48.186] envs[common]] [18:41:48.186] NAMES <- toupper(changed) [18:41:48.186] args <- list() [18:41:48.186] for (kk in seq_along(NAMES)) { [18:41:48.186] name <- changed[[kk]] [18:41:48.186] NAME <- NAMES[[kk]] [18:41:48.186] if (name != NAME && is.element(NAME, old_names)) [18:41:48.186] next [18:41:48.186] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.186] } [18:41:48.186] NAMES <- toupper(added) [18:41:48.186] for (kk in seq_along(NAMES)) { [18:41:48.186] name <- added[[kk]] [18:41:48.186] NAME <- NAMES[[kk]] [18:41:48.186] if (name != NAME && is.element(NAME, old_names)) [18:41:48.186] next [18:41:48.186] args[[name]] <- "" [18:41:48.186] } [18:41:48.186] NAMES <- toupper(removed) [18:41:48.186] for (kk in seq_along(NAMES)) { [18:41:48.186] name <- removed[[kk]] [18:41:48.186] NAME <- NAMES[[kk]] [18:41:48.186] if (name != NAME && is.element(NAME, old_names)) [18:41:48.186] next [18:41:48.186] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.186] } [18:41:48.186] if (length(args) > 0) [18:41:48.186] base::do.call(base::Sys.setenv, args = args) [18:41:48.186] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.186] } [18:41:48.186] { [18:41:48.186] if (base::length(...future.futureOptionsAdded) > [18:41:48.186] 0L) { [18:41:48.186] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.186] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.186] base::options(opts) [18:41:48.186] } [18:41:48.186] { [18:41:48.186] { [18:41:48.186] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.186] NULL [18:41:48.186] } [18:41:48.186] options(future.plan = NULL) [18:41:48.186] if (is.na(NA_character_)) [18:41:48.186] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.186] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.186] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.186] .init = FALSE) [18:41:48.186] } [18:41:48.186] } [18:41:48.186] } [18:41:48.186] }) [18:41:48.186] if (TRUE) { [18:41:48.186] base::sink(type = "output", split = FALSE) [18:41:48.186] if (TRUE) { [18:41:48.186] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.186] } [18:41:48.186] else { [18:41:48.186] ...future.result["stdout"] <- base::list(NULL) [18:41:48.186] } [18:41:48.186] base::close(...future.stdout) [18:41:48.186] ...future.stdout <- NULL [18:41:48.186] } [18:41:48.186] ...future.result$conditions <- ...future.conditions [18:41:48.186] ...future.result$finished <- base::Sys.time() [18:41:48.186] ...future.result [18:41:48.186] } [18:41:48.195] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:48.195] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:48.196] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:48.196] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.197] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.197] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:48.198] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:48.198] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.198] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.199] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.199] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.200] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:48.201] MultisessionFuture started [18:41:48.201] - Launch lazy future ... done [18:41:48.201] run() for 'MultisessionFuture' ... done [18:41:48.201] Created future: [18:41:48.214] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.215] - Validating connection of MultisessionFuture [18:41:48.216] - received message: FutureResult [18:41:48.216] - Received FutureResult [18:41:48.216] - Erased future from FutureRegistry [18:41:48.216] result() for ClusterFuture ... [18:41:48.217] - result already collected: FutureResult [18:41:48.217] result() for ClusterFuture ... done [18:41:48.217] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.202] MultisessionFuture: [18:41:48.202] Label: 'future_sapply-2' [18:41:48.202] Expression: [18:41:48.202] { [18:41:48.202] do.call(function(...) { [18:41:48.202] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.202] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.202] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.202] on.exit(options(oopts), add = TRUE) [18:41:48.202] } [18:41:48.202] { [18:41:48.202] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.202] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.202] ...future.FUN(...future.X_jj, ...) [18:41:48.202] }) [18:41:48.202] } [18:41:48.202] }, args = future.call.arguments) [18:41:48.202] } [18:41:48.202] Lazy evaluation: FALSE [18:41:48.202] Asynchronous evaluation: TRUE [18:41:48.202] Local evaluation: TRUE [18:41:48.202] Environment: R_GlobalEnv [18:41:48.202] Capture standard output: TRUE [18:41:48.202] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.202] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.202] Packages: [18:41:48.202] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.202] Resolved: TRUE [18:41:48.202] Value: [18:41:48.202] Conditions captured: [18:41:48.202] Early signaling: FALSE [18:41:48.202] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.202] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.218] Chunk #2 of 2 ... DONE [18:41:48.218] Launching 2 futures (chunks) ... DONE [18:41:48.218] Resolving 2 futures (chunks) ... [18:41:48.219] resolve() on list ... [18:41:48.219] recursive: 0 [18:41:48.219] length: 2 [18:41:48.219] [18:41:48.220] Future #1 [18:41:48.220] result() for ClusterFuture ... [18:41:48.220] - result already collected: FutureResult [18:41:48.220] result() for ClusterFuture ... done [18:41:48.221] result() for ClusterFuture ... [18:41:48.221] - result already collected: FutureResult [18:41:48.221] result() for ClusterFuture ... done [18:41:48.221] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:48.222] - nx: 2 [18:41:48.222] - relay: TRUE [18:41:48.222] - stdout: TRUE [18:41:48.222] - signal: TRUE [18:41:48.223] - resignal: FALSE [18:41:48.223] - force: TRUE [18:41:48.223] - relayed: [n=2] FALSE, FALSE [18:41:48.223] - queued futures: [n=2] FALSE, FALSE [18:41:48.224] - until=1 [18:41:48.224] - relaying element #1 [18:41:48.224] result() for ClusterFuture ... [18:41:48.224] - result already collected: FutureResult [18:41:48.225] result() for ClusterFuture ... done [18:41:48.225] result() for ClusterFuture ... [18:41:48.225] - result already collected: FutureResult [18:41:48.225] result() for ClusterFuture ... done [18:41:48.226] result() for ClusterFuture ... [18:41:48.226] - result already collected: FutureResult [18:41:48.226] result() for ClusterFuture ... done [18:41:48.227] result() for ClusterFuture ... [18:41:48.227] - result already collected: FutureResult [18:41:48.227] result() for ClusterFuture ... done [18:41:48.227] - relayed: [n=2] TRUE, FALSE [18:41:48.227] - queued futures: [n=2] TRUE, FALSE [18:41:48.228] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:48.228] length: 1 (resolved future 1) [18:41:48.228] Future #2 [18:41:48.229] result() for ClusterFuture ... [18:41:48.229] - result already collected: FutureResult [18:41:48.229] result() for ClusterFuture ... done [18:41:48.229] result() for ClusterFuture ... [18:41:48.230] - result already collected: FutureResult [18:41:48.230] result() for ClusterFuture ... done [18:41:48.230] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:48.230] - nx: 2 [18:41:48.231] - relay: TRUE [18:41:48.231] - stdout: TRUE [18:41:48.231] - signal: TRUE [18:41:48.231] - resignal: FALSE [18:41:48.232] - force: TRUE [18:41:48.232] - relayed: [n=2] TRUE, FALSE [18:41:48.232] - queued futures: [n=2] TRUE, FALSE [18:41:48.232] - until=2 [18:41:48.233] - relaying element #2 [18:41:48.233] result() for ClusterFuture ... [18:41:48.233] - result already collected: FutureResult [18:41:48.233] result() for ClusterFuture ... done [18:41:48.234] result() for ClusterFuture ... [18:41:48.234] - result already collected: FutureResult [18:41:48.234] result() for ClusterFuture ... done [18:41:48.234] result() for ClusterFuture ... [18:41:48.235] - result already collected: FutureResult [18:41:48.235] result() for ClusterFuture ... done [18:41:48.235] result() for ClusterFuture ... [18:41:48.235] - result already collected: FutureResult [18:41:48.236] result() for ClusterFuture ... done [18:41:48.236] - relayed: [n=2] TRUE, TRUE [18:41:48.236] - queued futures: [n=2] TRUE, TRUE [18:41:48.236] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:48.237] length: 0 (resolved future 2) [18:41:48.237] Relaying remaining futures [18:41:48.237] signalConditionsASAP(NULL, pos=0) ... [18:41:48.237] - nx: 2 [18:41:48.238] - relay: TRUE [18:41:48.238] - stdout: TRUE [18:41:48.238] - signal: TRUE [18:41:48.238] - resignal: FALSE [18:41:48.239] - force: TRUE [18:41:48.239] - relayed: [n=2] TRUE, TRUE [18:41:48.239] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:48.240] - relayed: [n=2] TRUE, TRUE [18:41:48.240] - queued futures: [n=2] TRUE, TRUE [18:41:48.240] signalConditionsASAP(NULL, pos=0) ... done [18:41:48.240] resolve() on list ... DONE [18:41:48.241] result() for ClusterFuture ... [18:41:48.241] - result already collected: FutureResult [18:41:48.241] result() for ClusterFuture ... done [18:41:48.241] result() for ClusterFuture ... [18:41:48.242] - result already collected: FutureResult [18:41:48.242] result() for ClusterFuture ... done [18:41:48.242] result() for ClusterFuture ... [18:41:48.243] - result already collected: FutureResult [18:41:48.243] result() for ClusterFuture ... done [18:41:48.243] result() for ClusterFuture ... [18:41:48.243] - result already collected: FutureResult [18:41:48.244] result() for ClusterFuture ... done [18:41:48.244] - Number of value chunks collected: 2 [18:41:48.244] Resolving 2 futures (chunks) ... DONE [18:41:48.244] Reducing values from 2 chunks ... [18:41:48.245] - Number of values collected after concatenation: 3 [18:41:48.245] - Number of values expected: 3 [18:41:48.245] Reducing values from 2 chunks ... DONE [18:41:48.245] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:48.251] future_lapply() ... [18:41:48.256] Number of chunks: 2 [18:41:48.256] getGlobalsAndPackagesXApply() ... [18:41:48.256] - future.globals: TRUE [18:41:48.257] getGlobalsAndPackages() ... [18:41:48.257] Searching for globals... [18:41:48.259] - globals found: [1] 'FUN' [18:41:48.259] Searching for globals ... DONE [18:41:48.259] Resolving globals: FALSE [18:41:48.260] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:48.261] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:48.261] - globals: [1] 'FUN' [18:41:48.261] [18:41:48.262] getGlobalsAndPackages() ... DONE [18:41:48.262] - globals found/used: [n=1] 'FUN' [18:41:48.262] - needed namespaces: [n=0] [18:41:48.262] Finding globals ... DONE [18:41:48.263] - use_args: TRUE [18:41:48.263] - Getting '...' globals ... [18:41:48.264] resolve() on list ... [18:41:48.264] recursive: 0 [18:41:48.264] length: 1 [18:41:48.264] elements: '...' [18:41:48.265] length: 0 (resolved future 1) [18:41:48.265] resolve() on list ... DONE [18:41:48.265] - '...' content: [n=0] [18:41:48.265] List of 1 [18:41:48.265] $ ...: list() [18:41:48.265] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.265] - attr(*, "where")=List of 1 [18:41:48.265] ..$ ...: [18:41:48.265] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.265] - attr(*, "resolved")= logi TRUE [18:41:48.265] - attr(*, "total_size")= num NA [18:41:48.270] - Getting '...' globals ... DONE [18:41:48.270] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:48.271] List of 2 [18:41:48.271] $ ...future.FUN:function (x) [18:41:48.271] $ ... : list() [18:41:48.271] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.271] - attr(*, "where")=List of 2 [18:41:48.271] ..$ ...future.FUN: [18:41:48.271] ..$ ... : [18:41:48.271] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.271] - attr(*, "resolved")= logi FALSE [18:41:48.271] - attr(*, "total_size")= int 4876 [18:41:48.276] Packages to be attached in all futures: [n=0] [18:41:48.276] getGlobalsAndPackagesXApply() ... DONE [18:41:48.277] Number of futures (= number of chunks): 2 [18:41:48.277] Launching 2 futures (chunks) ... [18:41:48.277] Chunk #1 of 2 ... [18:41:48.277] - Finding globals in 'X' for chunk #1 ... [18:41:48.278] getGlobalsAndPackages() ... [18:41:48.278] Searching for globals... [18:41:48.278] [18:41:48.279] Searching for globals ... DONE [18:41:48.279] - globals: [0] [18:41:48.279] getGlobalsAndPackages() ... DONE [18:41:48.279] + additional globals found: [n=0] [18:41:48.280] + additional namespaces needed: [n=0] [18:41:48.280] - Finding globals in 'X' for chunk #1 ... DONE [18:41:48.280] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.280] - seeds: [18:41:48.281] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.281] getGlobalsAndPackages() ... [18:41:48.281] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.282] Resolving globals: FALSE [18:41:48.282] Tweak future expression to call with '...' arguments ... [18:41:48.282] { [18:41:48.282] do.call(function(...) { [18:41:48.282] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.282] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.282] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.282] on.exit(options(oopts), add = TRUE) [18:41:48.282] } [18:41:48.282] { [18:41:48.282] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.282] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.282] ...future.FUN(...future.X_jj, ...) [18:41:48.282] }) [18:41:48.282] } [18:41:48.282] }, args = future.call.arguments) [18:41:48.282] } [18:41:48.283] Tweak future expression to call with '...' arguments ... DONE [18:41:48.284] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.284] [18:41:48.284] getGlobalsAndPackages() ... DONE [18:41:48.285] run() for 'Future' ... [18:41:48.285] - state: 'created' [18:41:48.286] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.306] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.306] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.306] - Field: 'node' [18:41:48.306] - Field: 'label' [18:41:48.307] - Field: 'local' [18:41:48.307] - Field: 'owner' [18:41:48.307] - Field: 'envir' [18:41:48.308] - Field: 'workers' [18:41:48.308] - Field: 'packages' [18:41:48.308] - Field: 'gc' [18:41:48.309] - Field: 'conditions' [18:41:48.309] - Field: 'persistent' [18:41:48.309] - Field: 'expr' [18:41:48.309] - Field: 'uuid' [18:41:48.310] - Field: 'seed' [18:41:48.310] - Field: 'version' [18:41:48.310] - Field: 'result' [18:41:48.310] - Field: 'asynchronous' [18:41:48.311] - Field: 'calls' [18:41:48.311] - Field: 'globals' [18:41:48.311] - Field: 'stdout' [18:41:48.312] - Field: 'earlySignal' [18:41:48.312] - Field: 'lazy' [18:41:48.312] - Field: 'state' [18:41:48.312] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.313] - Launch lazy future ... [18:41:48.313] Packages needed by the future expression (n = 0): [18:41:48.314] Packages needed by future strategies (n = 0): [18:41:48.315] { [18:41:48.315] { [18:41:48.315] { [18:41:48.315] ...future.startTime <- base::Sys.time() [18:41:48.315] { [18:41:48.315] { [18:41:48.315] { [18:41:48.315] { [18:41:48.315] base::local({ [18:41:48.315] has_future <- base::requireNamespace("future", [18:41:48.315] quietly = TRUE) [18:41:48.315] if (has_future) { [18:41:48.315] ns <- base::getNamespace("future") [18:41:48.315] version <- ns[[".package"]][["version"]] [18:41:48.315] if (is.null(version)) [18:41:48.315] version <- utils::packageVersion("future") [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] version <- NULL [18:41:48.315] } [18:41:48.315] if (!has_future || version < "1.8.0") { [18:41:48.315] info <- base::c(r_version = base::gsub("R version ", [18:41:48.315] "", base::R.version$version.string), [18:41:48.315] platform = base::sprintf("%s (%s-bit)", [18:41:48.315] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.315] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.315] "release", "version")], collapse = " "), [18:41:48.315] hostname = base::Sys.info()[["nodename"]]) [18:41:48.315] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.315] info) [18:41:48.315] info <- base::paste(info, collapse = "; ") [18:41:48.315] if (!has_future) { [18:41:48.315] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.315] info) [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.315] info, version) [18:41:48.315] } [18:41:48.315] base::stop(msg) [18:41:48.315] } [18:41:48.315] }) [18:41:48.315] } [18:41:48.315] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.315] base::options(mc.cores = 1L) [18:41:48.315] } [18:41:48.315] ...future.strategy.old <- future::plan("list") [18:41:48.315] options(future.plan = NULL) [18:41:48.315] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.315] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.315] } [18:41:48.315] ...future.workdir <- getwd() [18:41:48.315] } [18:41:48.315] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.315] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.315] } [18:41:48.315] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.315] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.315] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.315] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.315] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.315] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.315] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.315] base::names(...future.oldOptions)) [18:41:48.315] } [18:41:48.315] if (FALSE) { [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] if (TRUE) { [18:41:48.315] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.315] open = "w") [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.315] windows = "NUL", "/dev/null"), open = "w") [18:41:48.315] } [18:41:48.315] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.315] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.315] base::sink(type = "output", split = FALSE) [18:41:48.315] base::close(...future.stdout) [18:41:48.315] }, add = TRUE) [18:41:48.315] } [18:41:48.315] ...future.frame <- base::sys.nframe() [18:41:48.315] ...future.conditions <- base::list() [18:41:48.315] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.315] if (FALSE) { [18:41:48.315] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.315] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.315] } [18:41:48.315] ...future.result <- base::tryCatch({ [18:41:48.315] base::withCallingHandlers({ [18:41:48.315] ...future.value <- base::withVisible(base::local({ [18:41:48.315] ...future.makeSendCondition <- base::local({ [18:41:48.315] sendCondition <- NULL [18:41:48.315] function(frame = 1L) { [18:41:48.315] if (is.function(sendCondition)) [18:41:48.315] return(sendCondition) [18:41:48.315] ns <- getNamespace("parallel") [18:41:48.315] if (exists("sendData", mode = "function", [18:41:48.315] envir = ns)) { [18:41:48.315] parallel_sendData <- get("sendData", mode = "function", [18:41:48.315] envir = ns) [18:41:48.315] envir <- sys.frame(frame) [18:41:48.315] master <- NULL [18:41:48.315] while (!identical(envir, .GlobalEnv) && [18:41:48.315] !identical(envir, emptyenv())) { [18:41:48.315] if (exists("master", mode = "list", envir = envir, [18:41:48.315] inherits = FALSE)) { [18:41:48.315] master <- get("master", mode = "list", [18:41:48.315] envir = envir, inherits = FALSE) [18:41:48.315] if (inherits(master, c("SOCKnode", [18:41:48.315] "SOCK0node"))) { [18:41:48.315] sendCondition <<- function(cond) { [18:41:48.315] data <- list(type = "VALUE", value = cond, [18:41:48.315] success = TRUE) [18:41:48.315] parallel_sendData(master, data) [18:41:48.315] } [18:41:48.315] return(sendCondition) [18:41:48.315] } [18:41:48.315] } [18:41:48.315] frame <- frame + 1L [18:41:48.315] envir <- sys.frame(frame) [18:41:48.315] } [18:41:48.315] } [18:41:48.315] sendCondition <<- function(cond) NULL [18:41:48.315] } [18:41:48.315] }) [18:41:48.315] withCallingHandlers({ [18:41:48.315] { [18:41:48.315] do.call(function(...) { [18:41:48.315] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.315] if (!identical(...future.globals.maxSize.org, [18:41:48.315] ...future.globals.maxSize)) { [18:41:48.315] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.315] on.exit(options(oopts), add = TRUE) [18:41:48.315] } [18:41:48.315] { [18:41:48.315] lapply(seq_along(...future.elements_ii), [18:41:48.315] FUN = function(jj) { [18:41:48.315] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.315] ...future.FUN(...future.X_jj, ...) [18:41:48.315] }) [18:41:48.315] } [18:41:48.315] }, args = future.call.arguments) [18:41:48.315] } [18:41:48.315] }, immediateCondition = function(cond) { [18:41:48.315] sendCondition <- ...future.makeSendCondition() [18:41:48.315] sendCondition(cond) [18:41:48.315] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.315] { [18:41:48.315] inherits <- base::inherits [18:41:48.315] invokeRestart <- base::invokeRestart [18:41:48.315] is.null <- base::is.null [18:41:48.315] muffled <- FALSE [18:41:48.315] if (inherits(cond, "message")) { [18:41:48.315] muffled <- grepl(pattern, "muffleMessage") [18:41:48.315] if (muffled) [18:41:48.315] invokeRestart("muffleMessage") [18:41:48.315] } [18:41:48.315] else if (inherits(cond, "warning")) { [18:41:48.315] muffled <- grepl(pattern, "muffleWarning") [18:41:48.315] if (muffled) [18:41:48.315] invokeRestart("muffleWarning") [18:41:48.315] } [18:41:48.315] else if (inherits(cond, "condition")) { [18:41:48.315] if (!is.null(pattern)) { [18:41:48.315] computeRestarts <- base::computeRestarts [18:41:48.315] grepl <- base::grepl [18:41:48.315] restarts <- computeRestarts(cond) [18:41:48.315] for (restart in restarts) { [18:41:48.315] name <- restart$name [18:41:48.315] if (is.null(name)) [18:41:48.315] next [18:41:48.315] if (!grepl(pattern, name)) [18:41:48.315] next [18:41:48.315] invokeRestart(restart) [18:41:48.315] muffled <- TRUE [18:41:48.315] break [18:41:48.315] } [18:41:48.315] } [18:41:48.315] } [18:41:48.315] invisible(muffled) [18:41:48.315] } [18:41:48.315] muffleCondition(cond) [18:41:48.315] }) [18:41:48.315] })) [18:41:48.315] future::FutureResult(value = ...future.value$value, [18:41:48.315] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.315] ...future.rng), globalenv = if (FALSE) [18:41:48.315] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.315] ...future.globalenv.names)) [18:41:48.315] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.315] }, condition = base::local({ [18:41:48.315] c <- base::c [18:41:48.315] inherits <- base::inherits [18:41:48.315] invokeRestart <- base::invokeRestart [18:41:48.315] length <- base::length [18:41:48.315] list <- base::list [18:41:48.315] seq.int <- base::seq.int [18:41:48.315] signalCondition <- base::signalCondition [18:41:48.315] sys.calls <- base::sys.calls [18:41:48.315] `[[` <- base::`[[` [18:41:48.315] `+` <- base::`+` [18:41:48.315] `<<-` <- base::`<<-` [18:41:48.315] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.315] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.315] 3L)] [18:41:48.315] } [18:41:48.315] function(cond) { [18:41:48.315] is_error <- inherits(cond, "error") [18:41:48.315] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.315] NULL) [18:41:48.315] if (is_error) { [18:41:48.315] sessionInformation <- function() { [18:41:48.315] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.315] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.315] search = base::search(), system = base::Sys.info()) [18:41:48.315] } [18:41:48.315] ...future.conditions[[length(...future.conditions) + [18:41:48.315] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.315] cond$call), session = sessionInformation(), [18:41:48.315] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.315] signalCondition(cond) [18:41:48.315] } [18:41:48.315] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.315] "immediateCondition"))) { [18:41:48.315] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.315] ...future.conditions[[length(...future.conditions) + [18:41:48.315] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.315] if (TRUE && !signal) { [18:41:48.315] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.315] { [18:41:48.315] inherits <- base::inherits [18:41:48.315] invokeRestart <- base::invokeRestart [18:41:48.315] is.null <- base::is.null [18:41:48.315] muffled <- FALSE [18:41:48.315] if (inherits(cond, "message")) { [18:41:48.315] muffled <- grepl(pattern, "muffleMessage") [18:41:48.315] if (muffled) [18:41:48.315] invokeRestart("muffleMessage") [18:41:48.315] } [18:41:48.315] else if (inherits(cond, "warning")) { [18:41:48.315] muffled <- grepl(pattern, "muffleWarning") [18:41:48.315] if (muffled) [18:41:48.315] invokeRestart("muffleWarning") [18:41:48.315] } [18:41:48.315] else if (inherits(cond, "condition")) { [18:41:48.315] if (!is.null(pattern)) { [18:41:48.315] computeRestarts <- base::computeRestarts [18:41:48.315] grepl <- base::grepl [18:41:48.315] restarts <- computeRestarts(cond) [18:41:48.315] for (restart in restarts) { [18:41:48.315] name <- restart$name [18:41:48.315] if (is.null(name)) [18:41:48.315] next [18:41:48.315] if (!grepl(pattern, name)) [18:41:48.315] next [18:41:48.315] invokeRestart(restart) [18:41:48.315] muffled <- TRUE [18:41:48.315] break [18:41:48.315] } [18:41:48.315] } [18:41:48.315] } [18:41:48.315] invisible(muffled) [18:41:48.315] } [18:41:48.315] muffleCondition(cond, pattern = "^muffle") [18:41:48.315] } [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] if (TRUE) { [18:41:48.315] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.315] { [18:41:48.315] inherits <- base::inherits [18:41:48.315] invokeRestart <- base::invokeRestart [18:41:48.315] is.null <- base::is.null [18:41:48.315] muffled <- FALSE [18:41:48.315] if (inherits(cond, "message")) { [18:41:48.315] muffled <- grepl(pattern, "muffleMessage") [18:41:48.315] if (muffled) [18:41:48.315] invokeRestart("muffleMessage") [18:41:48.315] } [18:41:48.315] else if (inherits(cond, "warning")) { [18:41:48.315] muffled <- grepl(pattern, "muffleWarning") [18:41:48.315] if (muffled) [18:41:48.315] invokeRestart("muffleWarning") [18:41:48.315] } [18:41:48.315] else if (inherits(cond, "condition")) { [18:41:48.315] if (!is.null(pattern)) { [18:41:48.315] computeRestarts <- base::computeRestarts [18:41:48.315] grepl <- base::grepl [18:41:48.315] restarts <- computeRestarts(cond) [18:41:48.315] for (restart in restarts) { [18:41:48.315] name <- restart$name [18:41:48.315] if (is.null(name)) [18:41:48.315] next [18:41:48.315] if (!grepl(pattern, name)) [18:41:48.315] next [18:41:48.315] invokeRestart(restart) [18:41:48.315] muffled <- TRUE [18:41:48.315] break [18:41:48.315] } [18:41:48.315] } [18:41:48.315] } [18:41:48.315] invisible(muffled) [18:41:48.315] } [18:41:48.315] muffleCondition(cond, pattern = "^muffle") [18:41:48.315] } [18:41:48.315] } [18:41:48.315] } [18:41:48.315] })) [18:41:48.315] }, error = function(ex) { [18:41:48.315] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.315] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.315] ...future.rng), started = ...future.startTime, [18:41:48.315] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.315] version = "1.8"), class = "FutureResult") [18:41:48.315] }, finally = { [18:41:48.315] if (!identical(...future.workdir, getwd())) [18:41:48.315] setwd(...future.workdir) [18:41:48.315] { [18:41:48.315] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.315] ...future.oldOptions$nwarnings <- NULL [18:41:48.315] } [18:41:48.315] base::options(...future.oldOptions) [18:41:48.315] if (.Platform$OS.type == "windows") { [18:41:48.315] old_names <- names(...future.oldEnvVars) [18:41:48.315] envs <- base::Sys.getenv() [18:41:48.315] names <- names(envs) [18:41:48.315] common <- intersect(names, old_names) [18:41:48.315] added <- setdiff(names, old_names) [18:41:48.315] removed <- setdiff(old_names, names) [18:41:48.315] changed <- common[...future.oldEnvVars[common] != [18:41:48.315] envs[common]] [18:41:48.315] NAMES <- toupper(changed) [18:41:48.315] args <- list() [18:41:48.315] for (kk in seq_along(NAMES)) { [18:41:48.315] name <- changed[[kk]] [18:41:48.315] NAME <- NAMES[[kk]] [18:41:48.315] if (name != NAME && is.element(NAME, old_names)) [18:41:48.315] next [18:41:48.315] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.315] } [18:41:48.315] NAMES <- toupper(added) [18:41:48.315] for (kk in seq_along(NAMES)) { [18:41:48.315] name <- added[[kk]] [18:41:48.315] NAME <- NAMES[[kk]] [18:41:48.315] if (name != NAME && is.element(NAME, old_names)) [18:41:48.315] next [18:41:48.315] args[[name]] <- "" [18:41:48.315] } [18:41:48.315] NAMES <- toupper(removed) [18:41:48.315] for (kk in seq_along(NAMES)) { [18:41:48.315] name <- removed[[kk]] [18:41:48.315] NAME <- NAMES[[kk]] [18:41:48.315] if (name != NAME && is.element(NAME, old_names)) [18:41:48.315] next [18:41:48.315] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.315] } [18:41:48.315] if (length(args) > 0) [18:41:48.315] base::do.call(base::Sys.setenv, args = args) [18:41:48.315] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.315] } [18:41:48.315] { [18:41:48.315] if (base::length(...future.futureOptionsAdded) > [18:41:48.315] 0L) { [18:41:48.315] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.315] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.315] base::options(opts) [18:41:48.315] } [18:41:48.315] { [18:41:48.315] { [18:41:48.315] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.315] NULL [18:41:48.315] } [18:41:48.315] options(future.plan = NULL) [18:41:48.315] if (is.na(NA_character_)) [18:41:48.315] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.315] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.315] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.315] .init = FALSE) [18:41:48.315] } [18:41:48.315] } [18:41:48.315] } [18:41:48.315] }) [18:41:48.315] if (TRUE) { [18:41:48.315] base::sink(type = "output", split = FALSE) [18:41:48.315] if (TRUE) { [18:41:48.315] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.315] } [18:41:48.315] else { [18:41:48.315] ...future.result["stdout"] <- base::list(NULL) [18:41:48.315] } [18:41:48.315] base::close(...future.stdout) [18:41:48.315] ...future.stdout <- NULL [18:41:48.315] } [18:41:48.315] ...future.result$conditions <- ...future.conditions [18:41:48.315] ...future.result$finished <- base::Sys.time() [18:41:48.315] ...future.result [18:41:48.315] } [18:41:48.324] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:48.324] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:48.324] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:48.324] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.325] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.325] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:48.326] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:48.326] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.326] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.326] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.327] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.327] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:48.328] MultisessionFuture started [18:41:48.328] - Launch lazy future ... done [18:41:48.328] run() for 'MultisessionFuture' ... done [18:41:48.328] Created future: [18:41:48.342] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.342] - Validating connection of MultisessionFuture [18:41:48.342] - received message: FutureResult [18:41:48.342] - Received FutureResult [18:41:48.343] - Erased future from FutureRegistry [18:41:48.343] result() for ClusterFuture ... [18:41:48.343] - result already collected: FutureResult [18:41:48.343] result() for ClusterFuture ... done [18:41:48.343] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.328] MultisessionFuture: [18:41:48.328] Label: 'future_sapply-1' [18:41:48.328] Expression: [18:41:48.328] { [18:41:48.328] do.call(function(...) { [18:41:48.328] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.328] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.328] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.328] on.exit(options(oopts), add = TRUE) [18:41:48.328] } [18:41:48.328] { [18:41:48.328] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.328] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.328] ...future.FUN(...future.X_jj, ...) [18:41:48.328] }) [18:41:48.328] } [18:41:48.328] }, args = future.call.arguments) [18:41:48.328] } [18:41:48.328] Lazy evaluation: FALSE [18:41:48.328] Asynchronous evaluation: TRUE [18:41:48.328] Local evaluation: TRUE [18:41:48.328] Environment: R_GlobalEnv [18:41:48.328] Capture standard output: TRUE [18:41:48.328] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.328] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.328] Packages: [18:41:48.328] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.328] Resolved: TRUE [18:41:48.328] Value: [18:41:48.328] Conditions captured: [18:41:48.328] Early signaling: FALSE [18:41:48.328] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.328] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.344] Chunk #1 of 2 ... DONE [18:41:48.344] Chunk #2 of 2 ... [18:41:48.344] - Finding globals in 'X' for chunk #2 ... [18:41:48.344] getGlobalsAndPackages() ... [18:41:48.344] Searching for globals... [18:41:48.345] [18:41:48.345] Searching for globals ... DONE [18:41:48.345] - globals: [0] [18:41:48.345] getGlobalsAndPackages() ... DONE [18:41:48.345] + additional globals found: [n=0] [18:41:48.346] + additional namespaces needed: [n=0] [18:41:48.346] - Finding globals in 'X' for chunk #2 ... DONE [18:41:48.346] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.346] - seeds: [18:41:48.346] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.346] getGlobalsAndPackages() ... [18:41:48.347] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.347] Resolving globals: FALSE [18:41:48.347] Tweak future expression to call with '...' arguments ... [18:41:48.347] { [18:41:48.347] do.call(function(...) { [18:41:48.347] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.347] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.347] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.347] on.exit(options(oopts), add = TRUE) [18:41:48.347] } [18:41:48.347] { [18:41:48.347] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.347] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.347] ...future.FUN(...future.X_jj, ...) [18:41:48.347] }) [18:41:48.347] } [18:41:48.347] }, args = future.call.arguments) [18:41:48.347] } [18:41:48.348] Tweak future expression to call with '...' arguments ... DONE [18:41:48.348] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.348] [18:41:48.349] getGlobalsAndPackages() ... DONE [18:41:48.349] run() for 'Future' ... [18:41:48.349] - state: 'created' [18:41:48.349] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.366] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.366] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.366] - Field: 'node' [18:41:48.366] - Field: 'label' [18:41:48.366] - Field: 'local' [18:41:48.367] - Field: 'owner' [18:41:48.367] - Field: 'envir' [18:41:48.367] - Field: 'workers' [18:41:48.367] - Field: 'packages' [18:41:48.367] - Field: 'gc' [18:41:48.375] - Field: 'conditions' [18:41:48.375] - Field: 'persistent' [18:41:48.375] - Field: 'expr' [18:41:48.376] - Field: 'uuid' [18:41:48.376] - Field: 'seed' [18:41:48.376] - Field: 'version' [18:41:48.376] - Field: 'result' [18:41:48.376] - Field: 'asynchronous' [18:41:48.377] - Field: 'calls' [18:41:48.377] - Field: 'globals' [18:41:48.377] - Field: 'stdout' [18:41:48.377] - Field: 'earlySignal' [18:41:48.377] - Field: 'lazy' [18:41:48.377] - Field: 'state' [18:41:48.378] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.378] - Launch lazy future ... [18:41:48.378] Packages needed by the future expression (n = 0): [18:41:48.378] Packages needed by future strategies (n = 0): [18:41:48.379] { [18:41:48.379] { [18:41:48.379] { [18:41:48.379] ...future.startTime <- base::Sys.time() [18:41:48.379] { [18:41:48.379] { [18:41:48.379] { [18:41:48.379] { [18:41:48.379] base::local({ [18:41:48.379] has_future <- base::requireNamespace("future", [18:41:48.379] quietly = TRUE) [18:41:48.379] if (has_future) { [18:41:48.379] ns <- base::getNamespace("future") [18:41:48.379] version <- ns[[".package"]][["version"]] [18:41:48.379] if (is.null(version)) [18:41:48.379] version <- utils::packageVersion("future") [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] version <- NULL [18:41:48.379] } [18:41:48.379] if (!has_future || version < "1.8.0") { [18:41:48.379] info <- base::c(r_version = base::gsub("R version ", [18:41:48.379] "", base::R.version$version.string), [18:41:48.379] platform = base::sprintf("%s (%s-bit)", [18:41:48.379] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.379] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.379] "release", "version")], collapse = " "), [18:41:48.379] hostname = base::Sys.info()[["nodename"]]) [18:41:48.379] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.379] info) [18:41:48.379] info <- base::paste(info, collapse = "; ") [18:41:48.379] if (!has_future) { [18:41:48.379] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.379] info) [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.379] info, version) [18:41:48.379] } [18:41:48.379] base::stop(msg) [18:41:48.379] } [18:41:48.379] }) [18:41:48.379] } [18:41:48.379] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.379] base::options(mc.cores = 1L) [18:41:48.379] } [18:41:48.379] ...future.strategy.old <- future::plan("list") [18:41:48.379] options(future.plan = NULL) [18:41:48.379] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.379] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.379] } [18:41:48.379] ...future.workdir <- getwd() [18:41:48.379] } [18:41:48.379] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.379] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.379] } [18:41:48.379] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.379] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.379] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.379] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.379] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.379] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.379] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.379] base::names(...future.oldOptions)) [18:41:48.379] } [18:41:48.379] if (FALSE) { [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] if (TRUE) { [18:41:48.379] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.379] open = "w") [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.379] windows = "NUL", "/dev/null"), open = "w") [18:41:48.379] } [18:41:48.379] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.379] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.379] base::sink(type = "output", split = FALSE) [18:41:48.379] base::close(...future.stdout) [18:41:48.379] }, add = TRUE) [18:41:48.379] } [18:41:48.379] ...future.frame <- base::sys.nframe() [18:41:48.379] ...future.conditions <- base::list() [18:41:48.379] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.379] if (FALSE) { [18:41:48.379] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.379] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.379] } [18:41:48.379] ...future.result <- base::tryCatch({ [18:41:48.379] base::withCallingHandlers({ [18:41:48.379] ...future.value <- base::withVisible(base::local({ [18:41:48.379] ...future.makeSendCondition <- base::local({ [18:41:48.379] sendCondition <- NULL [18:41:48.379] function(frame = 1L) { [18:41:48.379] if (is.function(sendCondition)) [18:41:48.379] return(sendCondition) [18:41:48.379] ns <- getNamespace("parallel") [18:41:48.379] if (exists("sendData", mode = "function", [18:41:48.379] envir = ns)) { [18:41:48.379] parallel_sendData <- get("sendData", mode = "function", [18:41:48.379] envir = ns) [18:41:48.379] envir <- sys.frame(frame) [18:41:48.379] master <- NULL [18:41:48.379] while (!identical(envir, .GlobalEnv) && [18:41:48.379] !identical(envir, emptyenv())) { [18:41:48.379] if (exists("master", mode = "list", envir = envir, [18:41:48.379] inherits = FALSE)) { [18:41:48.379] master <- get("master", mode = "list", [18:41:48.379] envir = envir, inherits = FALSE) [18:41:48.379] if (inherits(master, c("SOCKnode", [18:41:48.379] "SOCK0node"))) { [18:41:48.379] sendCondition <<- function(cond) { [18:41:48.379] data <- list(type = "VALUE", value = cond, [18:41:48.379] success = TRUE) [18:41:48.379] parallel_sendData(master, data) [18:41:48.379] } [18:41:48.379] return(sendCondition) [18:41:48.379] } [18:41:48.379] } [18:41:48.379] frame <- frame + 1L [18:41:48.379] envir <- sys.frame(frame) [18:41:48.379] } [18:41:48.379] } [18:41:48.379] sendCondition <<- function(cond) NULL [18:41:48.379] } [18:41:48.379] }) [18:41:48.379] withCallingHandlers({ [18:41:48.379] { [18:41:48.379] do.call(function(...) { [18:41:48.379] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.379] if (!identical(...future.globals.maxSize.org, [18:41:48.379] ...future.globals.maxSize)) { [18:41:48.379] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.379] on.exit(options(oopts), add = TRUE) [18:41:48.379] } [18:41:48.379] { [18:41:48.379] lapply(seq_along(...future.elements_ii), [18:41:48.379] FUN = function(jj) { [18:41:48.379] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.379] ...future.FUN(...future.X_jj, ...) [18:41:48.379] }) [18:41:48.379] } [18:41:48.379] }, args = future.call.arguments) [18:41:48.379] } [18:41:48.379] }, immediateCondition = function(cond) { [18:41:48.379] sendCondition <- ...future.makeSendCondition() [18:41:48.379] sendCondition(cond) [18:41:48.379] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.379] { [18:41:48.379] inherits <- base::inherits [18:41:48.379] invokeRestart <- base::invokeRestart [18:41:48.379] is.null <- base::is.null [18:41:48.379] muffled <- FALSE [18:41:48.379] if (inherits(cond, "message")) { [18:41:48.379] muffled <- grepl(pattern, "muffleMessage") [18:41:48.379] if (muffled) [18:41:48.379] invokeRestart("muffleMessage") [18:41:48.379] } [18:41:48.379] else if (inherits(cond, "warning")) { [18:41:48.379] muffled <- grepl(pattern, "muffleWarning") [18:41:48.379] if (muffled) [18:41:48.379] invokeRestart("muffleWarning") [18:41:48.379] } [18:41:48.379] else if (inherits(cond, "condition")) { [18:41:48.379] if (!is.null(pattern)) { [18:41:48.379] computeRestarts <- base::computeRestarts [18:41:48.379] grepl <- base::grepl [18:41:48.379] restarts <- computeRestarts(cond) [18:41:48.379] for (restart in restarts) { [18:41:48.379] name <- restart$name [18:41:48.379] if (is.null(name)) [18:41:48.379] next [18:41:48.379] if (!grepl(pattern, name)) [18:41:48.379] next [18:41:48.379] invokeRestart(restart) [18:41:48.379] muffled <- TRUE [18:41:48.379] break [18:41:48.379] } [18:41:48.379] } [18:41:48.379] } [18:41:48.379] invisible(muffled) [18:41:48.379] } [18:41:48.379] muffleCondition(cond) [18:41:48.379] }) [18:41:48.379] })) [18:41:48.379] future::FutureResult(value = ...future.value$value, [18:41:48.379] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.379] ...future.rng), globalenv = if (FALSE) [18:41:48.379] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.379] ...future.globalenv.names)) [18:41:48.379] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.379] }, condition = base::local({ [18:41:48.379] c <- base::c [18:41:48.379] inherits <- base::inherits [18:41:48.379] invokeRestart <- base::invokeRestart [18:41:48.379] length <- base::length [18:41:48.379] list <- base::list [18:41:48.379] seq.int <- base::seq.int [18:41:48.379] signalCondition <- base::signalCondition [18:41:48.379] sys.calls <- base::sys.calls [18:41:48.379] `[[` <- base::`[[` [18:41:48.379] `+` <- base::`+` [18:41:48.379] `<<-` <- base::`<<-` [18:41:48.379] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.379] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.379] 3L)] [18:41:48.379] } [18:41:48.379] function(cond) { [18:41:48.379] is_error <- inherits(cond, "error") [18:41:48.379] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.379] NULL) [18:41:48.379] if (is_error) { [18:41:48.379] sessionInformation <- function() { [18:41:48.379] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.379] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.379] search = base::search(), system = base::Sys.info()) [18:41:48.379] } [18:41:48.379] ...future.conditions[[length(...future.conditions) + [18:41:48.379] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.379] cond$call), session = sessionInformation(), [18:41:48.379] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.379] signalCondition(cond) [18:41:48.379] } [18:41:48.379] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.379] "immediateCondition"))) { [18:41:48.379] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.379] ...future.conditions[[length(...future.conditions) + [18:41:48.379] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.379] if (TRUE && !signal) { [18:41:48.379] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.379] { [18:41:48.379] inherits <- base::inherits [18:41:48.379] invokeRestart <- base::invokeRestart [18:41:48.379] is.null <- base::is.null [18:41:48.379] muffled <- FALSE [18:41:48.379] if (inherits(cond, "message")) { [18:41:48.379] muffled <- grepl(pattern, "muffleMessage") [18:41:48.379] if (muffled) [18:41:48.379] invokeRestart("muffleMessage") [18:41:48.379] } [18:41:48.379] else if (inherits(cond, "warning")) { [18:41:48.379] muffled <- grepl(pattern, "muffleWarning") [18:41:48.379] if (muffled) [18:41:48.379] invokeRestart("muffleWarning") [18:41:48.379] } [18:41:48.379] else if (inherits(cond, "condition")) { [18:41:48.379] if (!is.null(pattern)) { [18:41:48.379] computeRestarts <- base::computeRestarts [18:41:48.379] grepl <- base::grepl [18:41:48.379] restarts <- computeRestarts(cond) [18:41:48.379] for (restart in restarts) { [18:41:48.379] name <- restart$name [18:41:48.379] if (is.null(name)) [18:41:48.379] next [18:41:48.379] if (!grepl(pattern, name)) [18:41:48.379] next [18:41:48.379] invokeRestart(restart) [18:41:48.379] muffled <- TRUE [18:41:48.379] break [18:41:48.379] } [18:41:48.379] } [18:41:48.379] } [18:41:48.379] invisible(muffled) [18:41:48.379] } [18:41:48.379] muffleCondition(cond, pattern = "^muffle") [18:41:48.379] } [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] if (TRUE) { [18:41:48.379] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.379] { [18:41:48.379] inherits <- base::inherits [18:41:48.379] invokeRestart <- base::invokeRestart [18:41:48.379] is.null <- base::is.null [18:41:48.379] muffled <- FALSE [18:41:48.379] if (inherits(cond, "message")) { [18:41:48.379] muffled <- grepl(pattern, "muffleMessage") [18:41:48.379] if (muffled) [18:41:48.379] invokeRestart("muffleMessage") [18:41:48.379] } [18:41:48.379] else if (inherits(cond, "warning")) { [18:41:48.379] muffled <- grepl(pattern, "muffleWarning") [18:41:48.379] if (muffled) [18:41:48.379] invokeRestart("muffleWarning") [18:41:48.379] } [18:41:48.379] else if (inherits(cond, "condition")) { [18:41:48.379] if (!is.null(pattern)) { [18:41:48.379] computeRestarts <- base::computeRestarts [18:41:48.379] grepl <- base::grepl [18:41:48.379] restarts <- computeRestarts(cond) [18:41:48.379] for (restart in restarts) { [18:41:48.379] name <- restart$name [18:41:48.379] if (is.null(name)) [18:41:48.379] next [18:41:48.379] if (!grepl(pattern, name)) [18:41:48.379] next [18:41:48.379] invokeRestart(restart) [18:41:48.379] muffled <- TRUE [18:41:48.379] break [18:41:48.379] } [18:41:48.379] } [18:41:48.379] } [18:41:48.379] invisible(muffled) [18:41:48.379] } [18:41:48.379] muffleCondition(cond, pattern = "^muffle") [18:41:48.379] } [18:41:48.379] } [18:41:48.379] } [18:41:48.379] })) [18:41:48.379] }, error = function(ex) { [18:41:48.379] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.379] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.379] ...future.rng), started = ...future.startTime, [18:41:48.379] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.379] version = "1.8"), class = "FutureResult") [18:41:48.379] }, finally = { [18:41:48.379] if (!identical(...future.workdir, getwd())) [18:41:48.379] setwd(...future.workdir) [18:41:48.379] { [18:41:48.379] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.379] ...future.oldOptions$nwarnings <- NULL [18:41:48.379] } [18:41:48.379] base::options(...future.oldOptions) [18:41:48.379] if (.Platform$OS.type == "windows") { [18:41:48.379] old_names <- names(...future.oldEnvVars) [18:41:48.379] envs <- base::Sys.getenv() [18:41:48.379] names <- names(envs) [18:41:48.379] common <- intersect(names, old_names) [18:41:48.379] added <- setdiff(names, old_names) [18:41:48.379] removed <- setdiff(old_names, names) [18:41:48.379] changed <- common[...future.oldEnvVars[common] != [18:41:48.379] envs[common]] [18:41:48.379] NAMES <- toupper(changed) [18:41:48.379] args <- list() [18:41:48.379] for (kk in seq_along(NAMES)) { [18:41:48.379] name <- changed[[kk]] [18:41:48.379] NAME <- NAMES[[kk]] [18:41:48.379] if (name != NAME && is.element(NAME, old_names)) [18:41:48.379] next [18:41:48.379] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.379] } [18:41:48.379] NAMES <- toupper(added) [18:41:48.379] for (kk in seq_along(NAMES)) { [18:41:48.379] name <- added[[kk]] [18:41:48.379] NAME <- NAMES[[kk]] [18:41:48.379] if (name != NAME && is.element(NAME, old_names)) [18:41:48.379] next [18:41:48.379] args[[name]] <- "" [18:41:48.379] } [18:41:48.379] NAMES <- toupper(removed) [18:41:48.379] for (kk in seq_along(NAMES)) { [18:41:48.379] name <- removed[[kk]] [18:41:48.379] NAME <- NAMES[[kk]] [18:41:48.379] if (name != NAME && is.element(NAME, old_names)) [18:41:48.379] next [18:41:48.379] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.379] } [18:41:48.379] if (length(args) > 0) [18:41:48.379] base::do.call(base::Sys.setenv, args = args) [18:41:48.379] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.379] } [18:41:48.379] { [18:41:48.379] if (base::length(...future.futureOptionsAdded) > [18:41:48.379] 0L) { [18:41:48.379] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.379] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.379] base::options(opts) [18:41:48.379] } [18:41:48.379] { [18:41:48.379] { [18:41:48.379] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.379] NULL [18:41:48.379] } [18:41:48.379] options(future.plan = NULL) [18:41:48.379] if (is.na(NA_character_)) [18:41:48.379] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.379] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.379] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.379] .init = FALSE) [18:41:48.379] } [18:41:48.379] } [18:41:48.379] } [18:41:48.379] }) [18:41:48.379] if (TRUE) { [18:41:48.379] base::sink(type = "output", split = FALSE) [18:41:48.379] if (TRUE) { [18:41:48.379] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.379] } [18:41:48.379] else { [18:41:48.379] ...future.result["stdout"] <- base::list(NULL) [18:41:48.379] } [18:41:48.379] base::close(...future.stdout) [18:41:48.379] ...future.stdout <- NULL [18:41:48.379] } [18:41:48.379] ...future.result$conditions <- ...future.conditions [18:41:48.379] ...future.result$finished <- base::Sys.time() [18:41:48.379] ...future.result [18:41:48.379] } [18:41:48.385] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:48.385] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:48.385] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:48.385] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.386] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.386] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:48.386] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:48.387] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.387] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.387] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.388] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.388] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:48.389] MultisessionFuture started [18:41:48.389] - Launch lazy future ... done [18:41:48.389] run() for 'MultisessionFuture' ... done [18:41:48.389] Created future: [18:41:48.402] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.402] - Validating connection of MultisessionFuture [18:41:48.402] - received message: FutureResult [18:41:48.402] - Received FutureResult [18:41:48.403] - Erased future from FutureRegistry [18:41:48.403] result() for ClusterFuture ... [18:41:48.403] - result already collected: FutureResult [18:41:48.403] result() for ClusterFuture ... done [18:41:48.403] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.389] MultisessionFuture: [18:41:48.389] Label: 'future_sapply-2' [18:41:48.389] Expression: [18:41:48.389] { [18:41:48.389] do.call(function(...) { [18:41:48.389] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.389] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.389] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.389] on.exit(options(oopts), add = TRUE) [18:41:48.389] } [18:41:48.389] { [18:41:48.389] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.389] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.389] ...future.FUN(...future.X_jj, ...) [18:41:48.389] }) [18:41:48.389] } [18:41:48.389] }, args = future.call.arguments) [18:41:48.389] } [18:41:48.389] Lazy evaluation: FALSE [18:41:48.389] Asynchronous evaluation: TRUE [18:41:48.389] Local evaluation: TRUE [18:41:48.389] Environment: R_GlobalEnv [18:41:48.389] Capture standard output: TRUE [18:41:48.389] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.389] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.389] Packages: [18:41:48.389] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.389] Resolved: TRUE [18:41:48.389] Value: [18:41:48.389] Conditions captured: [18:41:48.389] Early signaling: FALSE [18:41:48.389] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.389] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.404] Chunk #2 of 2 ... DONE [18:41:48.404] Launching 2 futures (chunks) ... DONE [18:41:48.404] Resolving 2 futures (chunks) ... [18:41:48.404] resolve() on list ... [18:41:48.404] recursive: 0 [18:41:48.405] length: 2 [18:41:48.405] [18:41:48.405] Future #1 [18:41:48.405] result() for ClusterFuture ... [18:41:48.405] - result already collected: FutureResult [18:41:48.405] result() for ClusterFuture ... done [18:41:48.406] result() for ClusterFuture ... [18:41:48.406] - result already collected: FutureResult [18:41:48.406] result() for ClusterFuture ... done [18:41:48.406] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:48.406] - nx: 2 [18:41:48.406] - relay: TRUE [18:41:48.407] - stdout: TRUE [18:41:48.407] - signal: TRUE [18:41:48.407] - resignal: FALSE [18:41:48.407] - force: TRUE [18:41:48.407] - relayed: [n=2] FALSE, FALSE [18:41:48.407] - queued futures: [n=2] FALSE, FALSE [18:41:48.407] - until=1 [18:41:48.408] - relaying element #1 [18:41:48.408] result() for ClusterFuture ... [18:41:48.408] - result already collected: FutureResult [18:41:48.408] result() for ClusterFuture ... done [18:41:48.408] result() for ClusterFuture ... [18:41:48.408] - result already collected: FutureResult [18:41:48.408] result() for ClusterFuture ... done [18:41:48.409] result() for ClusterFuture ... [18:41:48.409] - result already collected: FutureResult [18:41:48.409] result() for ClusterFuture ... done [18:41:48.409] result() for ClusterFuture ... [18:41:48.409] - result already collected: FutureResult [18:41:48.409] result() for ClusterFuture ... done [18:41:48.410] - relayed: [n=2] TRUE, FALSE [18:41:48.410] - queued futures: [n=2] TRUE, FALSE [18:41:48.410] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:48.410] length: 1 (resolved future 1) [18:41:48.410] Future #2 [18:41:48.411] result() for ClusterFuture ... [18:41:48.411] - result already collected: FutureResult [18:41:48.411] result() for ClusterFuture ... done [18:41:48.411] result() for ClusterFuture ... [18:41:48.411] - result already collected: FutureResult [18:41:48.411] result() for ClusterFuture ... done [18:41:48.411] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:48.412] - nx: 2 [18:41:48.412] - relay: TRUE [18:41:48.412] - stdout: TRUE [18:41:48.412] - signal: TRUE [18:41:48.412] - resignal: FALSE [18:41:48.412] - force: TRUE [18:41:48.413] - relayed: [n=2] TRUE, FALSE [18:41:48.413] - queued futures: [n=2] TRUE, FALSE [18:41:48.413] - until=2 [18:41:48.413] - relaying element #2 [18:41:48.413] result() for ClusterFuture ... [18:41:48.413] - result already collected: FutureResult [18:41:48.413] result() for ClusterFuture ... done [18:41:48.414] result() for ClusterFuture ... [18:41:48.414] - result already collected: FutureResult [18:41:48.414] result() for ClusterFuture ... done [18:41:48.414] result() for ClusterFuture ... [18:41:48.414] - result already collected: FutureResult [18:41:48.414] result() for ClusterFuture ... done [18:41:48.415] result() for ClusterFuture ... [18:41:48.415] - result already collected: FutureResult [18:41:48.415] result() for ClusterFuture ... done [18:41:48.415] - relayed: [n=2] TRUE, TRUE [18:41:48.415] - queued futures: [n=2] TRUE, TRUE [18:41:48.415] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:48.416] length: 0 (resolved future 2) [18:41:48.416] Relaying remaining futures [18:41:48.416] signalConditionsASAP(NULL, pos=0) ... [18:41:48.416] - nx: 2 [18:41:48.416] - relay: TRUE [18:41:48.416] - stdout: TRUE [18:41:48.416] - signal: TRUE [18:41:48.417] - resignal: FALSE [18:41:48.417] - force: TRUE [18:41:48.417] - relayed: [n=2] TRUE, TRUE [18:41:48.417] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:48.417] - relayed: [n=2] TRUE, TRUE [18:41:48.417] - queued futures: [n=2] TRUE, TRUE [18:41:48.418] signalConditionsASAP(NULL, pos=0) ... done [18:41:48.418] resolve() on list ... DONE [18:41:48.418] result() for ClusterFuture ... [18:41:48.418] - result already collected: FutureResult [18:41:48.418] result() for ClusterFuture ... done [18:41:48.418] result() for ClusterFuture ... [18:41:48.419] - result already collected: FutureResult [18:41:48.419] result() for ClusterFuture ... done [18:41:48.419] result() for ClusterFuture ... [18:41:48.419] - result already collected: FutureResult [18:41:48.419] result() for ClusterFuture ... done [18:41:48.419] result() for ClusterFuture ... [18:41:48.419] - result already collected: FutureResult [18:41:48.420] result() for ClusterFuture ... done [18:41:48.420] - Number of value chunks collected: 2 [18:41:48.420] Resolving 2 futures (chunks) ... DONE [18:41:48.420] Reducing values from 2 chunks ... [18:41:48.420] - Number of values collected after concatenation: 3 [18:41:48.420] - Number of values expected: 3 [18:41:48.421] Reducing values from 2 chunks ... DONE [18:41:48.421] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y1:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 List of 2 $ y0:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 $ y2:List of 3 ..$ a: num 1 ..$ b: num 2 ..$ c: num 3 [18:41:48.428] future_lapply() ... [18:41:48.431] Number of chunks: 2 [18:41:48.431] getGlobalsAndPackagesXApply() ... [18:41:48.431] - future.globals: TRUE [18:41:48.432] getGlobalsAndPackages() ... [18:41:48.432] Searching for globals... [18:41:48.433] - globals found: [2] 'FUN', 'UseMethod' [18:41:48.433] Searching for globals ... DONE [18:41:48.434] Resolving globals: FALSE [18:41:48.434] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:48.434] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:48.435] - globals: [1] 'FUN' [18:41:48.435] [18:41:48.435] getGlobalsAndPackages() ... DONE [18:41:48.435] - globals found/used: [n=1] 'FUN' [18:41:48.435] - needed namespaces: [n=0] [18:41:48.436] Finding globals ... DONE [18:41:48.436] - use_args: TRUE [18:41:48.436] - Getting '...' globals ... [18:41:48.436] resolve() on list ... [18:41:48.436] recursive: 0 [18:41:48.437] length: 1 [18:41:48.437] elements: '...' [18:41:48.437] length: 0 (resolved future 1) [18:41:48.437] resolve() on list ... DONE [18:41:48.437] - '...' content: [n=0] [18:41:48.438] List of 1 [18:41:48.438] $ ...: list() [18:41:48.438] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.438] - attr(*, "where")=List of 1 [18:41:48.438] ..$ ...: [18:41:48.438] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.438] - attr(*, "resolved")= logi TRUE [18:41:48.438] - attr(*, "total_size")= num NA [18:41:48.440] - Getting '...' globals ... DONE [18:41:48.441] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:48.441] List of 2 [18:41:48.441] $ ...future.FUN:function (x, ...) [18:41:48.441] $ ... : list() [18:41:48.441] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.441] - attr(*, "where")=List of 2 [18:41:48.441] ..$ ...future.FUN: [18:41:48.441] ..$ ... : [18:41:48.441] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.441] - attr(*, "resolved")= logi FALSE [18:41:48.441] - attr(*, "total_size")= int 5116 [18:41:48.444] Packages to be attached in all futures: [n=0] [18:41:48.445] getGlobalsAndPackagesXApply() ... DONE [18:41:48.445] Number of futures (= number of chunks): 2 [18:41:48.445] Launching 2 futures (chunks) ... [18:41:48.445] Chunk #1 of 2 ... [18:41:48.445] - Finding globals in 'X' for chunk #1 ... [18:41:48.446] getGlobalsAndPackages() ... [18:41:48.446] Searching for globals... [18:41:48.446] [18:41:48.446] Searching for globals ... DONE [18:41:48.446] - globals: [0] [18:41:48.447] getGlobalsAndPackages() ... DONE [18:41:48.447] + additional globals found: [n=0] [18:41:48.447] + additional namespaces needed: [n=0] [18:41:48.447] - Finding globals in 'X' for chunk #1 ... DONE [18:41:48.447] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.447] - seeds: [18:41:48.448] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.448] getGlobalsAndPackages() ... [18:41:48.448] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.448] Resolving globals: FALSE [18:41:48.448] Tweak future expression to call with '...' arguments ... [18:41:48.448] { [18:41:48.448] do.call(function(...) { [18:41:48.448] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.448] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.448] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.448] on.exit(options(oopts), add = TRUE) [18:41:48.448] } [18:41:48.448] { [18:41:48.448] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.448] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.448] ...future.FUN(...future.X_jj, ...) [18:41:48.448] }) [18:41:48.448] } [18:41:48.448] }, args = future.call.arguments) [18:41:48.448] } [18:41:48.449] Tweak future expression to call with '...' arguments ... DONE [18:41:48.449] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.450] [18:41:48.450] getGlobalsAndPackages() ... DONE [18:41:48.450] run() for 'Future' ... [18:41:48.450] - state: 'created' [18:41:48.451] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.467] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.467] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.467] - Field: 'node' [18:41:48.468] - Field: 'label' [18:41:48.468] - Field: 'local' [18:41:48.468] - Field: 'owner' [18:41:48.468] - Field: 'envir' [18:41:48.468] - Field: 'workers' [18:41:48.469] - Field: 'packages' [18:41:48.469] - Field: 'gc' [18:41:48.469] - Field: 'conditions' [18:41:48.469] - Field: 'persistent' [18:41:48.469] - Field: 'expr' [18:41:48.469] - Field: 'uuid' [18:41:48.470] - Field: 'seed' [18:41:48.470] - Field: 'version' [18:41:48.470] - Field: 'result' [18:41:48.470] - Field: 'asynchronous' [18:41:48.470] - Field: 'calls' [18:41:48.470] - Field: 'globals' [18:41:48.471] - Field: 'stdout' [18:41:48.471] - Field: 'earlySignal' [18:41:48.471] - Field: 'lazy' [18:41:48.471] - Field: 'state' [18:41:48.471] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.472] - Launch lazy future ... [18:41:48.472] Packages needed by the future expression (n = 0): [18:41:48.472] Packages needed by future strategies (n = 0): [18:41:48.473] { [18:41:48.473] { [18:41:48.473] { [18:41:48.473] ...future.startTime <- base::Sys.time() [18:41:48.473] { [18:41:48.473] { [18:41:48.473] { [18:41:48.473] { [18:41:48.473] base::local({ [18:41:48.473] has_future <- base::requireNamespace("future", [18:41:48.473] quietly = TRUE) [18:41:48.473] if (has_future) { [18:41:48.473] ns <- base::getNamespace("future") [18:41:48.473] version <- ns[[".package"]][["version"]] [18:41:48.473] if (is.null(version)) [18:41:48.473] version <- utils::packageVersion("future") [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] version <- NULL [18:41:48.473] } [18:41:48.473] if (!has_future || version < "1.8.0") { [18:41:48.473] info <- base::c(r_version = base::gsub("R version ", [18:41:48.473] "", base::R.version$version.string), [18:41:48.473] platform = base::sprintf("%s (%s-bit)", [18:41:48.473] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.473] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.473] "release", "version")], collapse = " "), [18:41:48.473] hostname = base::Sys.info()[["nodename"]]) [18:41:48.473] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.473] info) [18:41:48.473] info <- base::paste(info, collapse = "; ") [18:41:48.473] if (!has_future) { [18:41:48.473] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.473] info) [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.473] info, version) [18:41:48.473] } [18:41:48.473] base::stop(msg) [18:41:48.473] } [18:41:48.473] }) [18:41:48.473] } [18:41:48.473] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.473] base::options(mc.cores = 1L) [18:41:48.473] } [18:41:48.473] ...future.strategy.old <- future::plan("list") [18:41:48.473] options(future.plan = NULL) [18:41:48.473] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.473] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.473] } [18:41:48.473] ...future.workdir <- getwd() [18:41:48.473] } [18:41:48.473] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.473] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.473] } [18:41:48.473] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.473] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.473] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.473] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.473] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.473] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.473] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.473] base::names(...future.oldOptions)) [18:41:48.473] } [18:41:48.473] if (FALSE) { [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] if (TRUE) { [18:41:48.473] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.473] open = "w") [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.473] windows = "NUL", "/dev/null"), open = "w") [18:41:48.473] } [18:41:48.473] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.473] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.473] base::sink(type = "output", split = FALSE) [18:41:48.473] base::close(...future.stdout) [18:41:48.473] }, add = TRUE) [18:41:48.473] } [18:41:48.473] ...future.frame <- base::sys.nframe() [18:41:48.473] ...future.conditions <- base::list() [18:41:48.473] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.473] if (FALSE) { [18:41:48.473] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.473] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.473] } [18:41:48.473] ...future.result <- base::tryCatch({ [18:41:48.473] base::withCallingHandlers({ [18:41:48.473] ...future.value <- base::withVisible(base::local({ [18:41:48.473] ...future.makeSendCondition <- base::local({ [18:41:48.473] sendCondition <- NULL [18:41:48.473] function(frame = 1L) { [18:41:48.473] if (is.function(sendCondition)) [18:41:48.473] return(sendCondition) [18:41:48.473] ns <- getNamespace("parallel") [18:41:48.473] if (exists("sendData", mode = "function", [18:41:48.473] envir = ns)) { [18:41:48.473] parallel_sendData <- get("sendData", mode = "function", [18:41:48.473] envir = ns) [18:41:48.473] envir <- sys.frame(frame) [18:41:48.473] master <- NULL [18:41:48.473] while (!identical(envir, .GlobalEnv) && [18:41:48.473] !identical(envir, emptyenv())) { [18:41:48.473] if (exists("master", mode = "list", envir = envir, [18:41:48.473] inherits = FALSE)) { [18:41:48.473] master <- get("master", mode = "list", [18:41:48.473] envir = envir, inherits = FALSE) [18:41:48.473] if (inherits(master, c("SOCKnode", [18:41:48.473] "SOCK0node"))) { [18:41:48.473] sendCondition <<- function(cond) { [18:41:48.473] data <- list(type = "VALUE", value = cond, [18:41:48.473] success = TRUE) [18:41:48.473] parallel_sendData(master, data) [18:41:48.473] } [18:41:48.473] return(sendCondition) [18:41:48.473] } [18:41:48.473] } [18:41:48.473] frame <- frame + 1L [18:41:48.473] envir <- sys.frame(frame) [18:41:48.473] } [18:41:48.473] } [18:41:48.473] sendCondition <<- function(cond) NULL [18:41:48.473] } [18:41:48.473] }) [18:41:48.473] withCallingHandlers({ [18:41:48.473] { [18:41:48.473] do.call(function(...) { [18:41:48.473] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.473] if (!identical(...future.globals.maxSize.org, [18:41:48.473] ...future.globals.maxSize)) { [18:41:48.473] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.473] on.exit(options(oopts), add = TRUE) [18:41:48.473] } [18:41:48.473] { [18:41:48.473] lapply(seq_along(...future.elements_ii), [18:41:48.473] FUN = function(jj) { [18:41:48.473] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.473] ...future.FUN(...future.X_jj, ...) [18:41:48.473] }) [18:41:48.473] } [18:41:48.473] }, args = future.call.arguments) [18:41:48.473] } [18:41:48.473] }, immediateCondition = function(cond) { [18:41:48.473] sendCondition <- ...future.makeSendCondition() [18:41:48.473] sendCondition(cond) [18:41:48.473] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.473] { [18:41:48.473] inherits <- base::inherits [18:41:48.473] invokeRestart <- base::invokeRestart [18:41:48.473] is.null <- base::is.null [18:41:48.473] muffled <- FALSE [18:41:48.473] if (inherits(cond, "message")) { [18:41:48.473] muffled <- grepl(pattern, "muffleMessage") [18:41:48.473] if (muffled) [18:41:48.473] invokeRestart("muffleMessage") [18:41:48.473] } [18:41:48.473] else if (inherits(cond, "warning")) { [18:41:48.473] muffled <- grepl(pattern, "muffleWarning") [18:41:48.473] if (muffled) [18:41:48.473] invokeRestart("muffleWarning") [18:41:48.473] } [18:41:48.473] else if (inherits(cond, "condition")) { [18:41:48.473] if (!is.null(pattern)) { [18:41:48.473] computeRestarts <- base::computeRestarts [18:41:48.473] grepl <- base::grepl [18:41:48.473] restarts <- computeRestarts(cond) [18:41:48.473] for (restart in restarts) { [18:41:48.473] name <- restart$name [18:41:48.473] if (is.null(name)) [18:41:48.473] next [18:41:48.473] if (!grepl(pattern, name)) [18:41:48.473] next [18:41:48.473] invokeRestart(restart) [18:41:48.473] muffled <- TRUE [18:41:48.473] break [18:41:48.473] } [18:41:48.473] } [18:41:48.473] } [18:41:48.473] invisible(muffled) [18:41:48.473] } [18:41:48.473] muffleCondition(cond) [18:41:48.473] }) [18:41:48.473] })) [18:41:48.473] future::FutureResult(value = ...future.value$value, [18:41:48.473] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.473] ...future.rng), globalenv = if (FALSE) [18:41:48.473] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.473] ...future.globalenv.names)) [18:41:48.473] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.473] }, condition = base::local({ [18:41:48.473] c <- base::c [18:41:48.473] inherits <- base::inherits [18:41:48.473] invokeRestart <- base::invokeRestart [18:41:48.473] length <- base::length [18:41:48.473] list <- base::list [18:41:48.473] seq.int <- base::seq.int [18:41:48.473] signalCondition <- base::signalCondition [18:41:48.473] sys.calls <- base::sys.calls [18:41:48.473] `[[` <- base::`[[` [18:41:48.473] `+` <- base::`+` [18:41:48.473] `<<-` <- base::`<<-` [18:41:48.473] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.473] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.473] 3L)] [18:41:48.473] } [18:41:48.473] function(cond) { [18:41:48.473] is_error <- inherits(cond, "error") [18:41:48.473] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.473] NULL) [18:41:48.473] if (is_error) { [18:41:48.473] sessionInformation <- function() { [18:41:48.473] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.473] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.473] search = base::search(), system = base::Sys.info()) [18:41:48.473] } [18:41:48.473] ...future.conditions[[length(...future.conditions) + [18:41:48.473] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.473] cond$call), session = sessionInformation(), [18:41:48.473] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.473] signalCondition(cond) [18:41:48.473] } [18:41:48.473] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.473] "immediateCondition"))) { [18:41:48.473] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.473] ...future.conditions[[length(...future.conditions) + [18:41:48.473] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.473] if (TRUE && !signal) { [18:41:48.473] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.473] { [18:41:48.473] inherits <- base::inherits [18:41:48.473] invokeRestart <- base::invokeRestart [18:41:48.473] is.null <- base::is.null [18:41:48.473] muffled <- FALSE [18:41:48.473] if (inherits(cond, "message")) { [18:41:48.473] muffled <- grepl(pattern, "muffleMessage") [18:41:48.473] if (muffled) [18:41:48.473] invokeRestart("muffleMessage") [18:41:48.473] } [18:41:48.473] else if (inherits(cond, "warning")) { [18:41:48.473] muffled <- grepl(pattern, "muffleWarning") [18:41:48.473] if (muffled) [18:41:48.473] invokeRestart("muffleWarning") [18:41:48.473] } [18:41:48.473] else if (inherits(cond, "condition")) { [18:41:48.473] if (!is.null(pattern)) { [18:41:48.473] computeRestarts <- base::computeRestarts [18:41:48.473] grepl <- base::grepl [18:41:48.473] restarts <- computeRestarts(cond) [18:41:48.473] for (restart in restarts) { [18:41:48.473] name <- restart$name [18:41:48.473] if (is.null(name)) [18:41:48.473] next [18:41:48.473] if (!grepl(pattern, name)) [18:41:48.473] next [18:41:48.473] invokeRestart(restart) [18:41:48.473] muffled <- TRUE [18:41:48.473] break [18:41:48.473] } [18:41:48.473] } [18:41:48.473] } [18:41:48.473] invisible(muffled) [18:41:48.473] } [18:41:48.473] muffleCondition(cond, pattern = "^muffle") [18:41:48.473] } [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] if (TRUE) { [18:41:48.473] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.473] { [18:41:48.473] inherits <- base::inherits [18:41:48.473] invokeRestart <- base::invokeRestart [18:41:48.473] is.null <- base::is.null [18:41:48.473] muffled <- FALSE [18:41:48.473] if (inherits(cond, "message")) { [18:41:48.473] muffled <- grepl(pattern, "muffleMessage") [18:41:48.473] if (muffled) [18:41:48.473] invokeRestart("muffleMessage") [18:41:48.473] } [18:41:48.473] else if (inherits(cond, "warning")) { [18:41:48.473] muffled <- grepl(pattern, "muffleWarning") [18:41:48.473] if (muffled) [18:41:48.473] invokeRestart("muffleWarning") [18:41:48.473] } [18:41:48.473] else if (inherits(cond, "condition")) { [18:41:48.473] if (!is.null(pattern)) { [18:41:48.473] computeRestarts <- base::computeRestarts [18:41:48.473] grepl <- base::grepl [18:41:48.473] restarts <- computeRestarts(cond) [18:41:48.473] for (restart in restarts) { [18:41:48.473] name <- restart$name [18:41:48.473] if (is.null(name)) [18:41:48.473] next [18:41:48.473] if (!grepl(pattern, name)) [18:41:48.473] next [18:41:48.473] invokeRestart(restart) [18:41:48.473] muffled <- TRUE [18:41:48.473] break [18:41:48.473] } [18:41:48.473] } [18:41:48.473] } [18:41:48.473] invisible(muffled) [18:41:48.473] } [18:41:48.473] muffleCondition(cond, pattern = "^muffle") [18:41:48.473] } [18:41:48.473] } [18:41:48.473] } [18:41:48.473] })) [18:41:48.473] }, error = function(ex) { [18:41:48.473] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.473] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.473] ...future.rng), started = ...future.startTime, [18:41:48.473] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.473] version = "1.8"), class = "FutureResult") [18:41:48.473] }, finally = { [18:41:48.473] if (!identical(...future.workdir, getwd())) [18:41:48.473] setwd(...future.workdir) [18:41:48.473] { [18:41:48.473] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.473] ...future.oldOptions$nwarnings <- NULL [18:41:48.473] } [18:41:48.473] base::options(...future.oldOptions) [18:41:48.473] if (.Platform$OS.type == "windows") { [18:41:48.473] old_names <- names(...future.oldEnvVars) [18:41:48.473] envs <- base::Sys.getenv() [18:41:48.473] names <- names(envs) [18:41:48.473] common <- intersect(names, old_names) [18:41:48.473] added <- setdiff(names, old_names) [18:41:48.473] removed <- setdiff(old_names, names) [18:41:48.473] changed <- common[...future.oldEnvVars[common] != [18:41:48.473] envs[common]] [18:41:48.473] NAMES <- toupper(changed) [18:41:48.473] args <- list() [18:41:48.473] for (kk in seq_along(NAMES)) { [18:41:48.473] name <- changed[[kk]] [18:41:48.473] NAME <- NAMES[[kk]] [18:41:48.473] if (name != NAME && is.element(NAME, old_names)) [18:41:48.473] next [18:41:48.473] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.473] } [18:41:48.473] NAMES <- toupper(added) [18:41:48.473] for (kk in seq_along(NAMES)) { [18:41:48.473] name <- added[[kk]] [18:41:48.473] NAME <- NAMES[[kk]] [18:41:48.473] if (name != NAME && is.element(NAME, old_names)) [18:41:48.473] next [18:41:48.473] args[[name]] <- "" [18:41:48.473] } [18:41:48.473] NAMES <- toupper(removed) [18:41:48.473] for (kk in seq_along(NAMES)) { [18:41:48.473] name <- removed[[kk]] [18:41:48.473] NAME <- NAMES[[kk]] [18:41:48.473] if (name != NAME && is.element(NAME, old_names)) [18:41:48.473] next [18:41:48.473] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.473] } [18:41:48.473] if (length(args) > 0) [18:41:48.473] base::do.call(base::Sys.setenv, args = args) [18:41:48.473] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.473] } [18:41:48.473] { [18:41:48.473] if (base::length(...future.futureOptionsAdded) > [18:41:48.473] 0L) { [18:41:48.473] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.473] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.473] base::options(opts) [18:41:48.473] } [18:41:48.473] { [18:41:48.473] { [18:41:48.473] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.473] NULL [18:41:48.473] } [18:41:48.473] options(future.plan = NULL) [18:41:48.473] if (is.na(NA_character_)) [18:41:48.473] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.473] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.473] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.473] .init = FALSE) [18:41:48.473] } [18:41:48.473] } [18:41:48.473] } [18:41:48.473] }) [18:41:48.473] if (TRUE) { [18:41:48.473] base::sink(type = "output", split = FALSE) [18:41:48.473] if (TRUE) { [18:41:48.473] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.473] } [18:41:48.473] else { [18:41:48.473] ...future.result["stdout"] <- base::list(NULL) [18:41:48.473] } [18:41:48.473] base::close(...future.stdout) [18:41:48.473] ...future.stdout <- NULL [18:41:48.473] } [18:41:48.473] ...future.result$conditions <- ...future.conditions [18:41:48.473] ...future.result$finished <- base::Sys.time() [18:41:48.473] ...future.result [18:41:48.473] } [18:41:48.479] Exporting 5 global objects (968 bytes) to cluster node #1 ... [18:41:48.479] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:48.479] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:48.480] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.480] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.480] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:48.481] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:48.481] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.481] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.481] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.482] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.482] Exporting 5 global objects (968 bytes) to cluster node #1 ... DONE [18:41:48.483] MultisessionFuture started [18:41:48.483] - Launch lazy future ... done [18:41:48.483] run() for 'MultisessionFuture' ... done [18:41:48.483] Created future: [18:41:48.497] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.497] - Validating connection of MultisessionFuture [18:41:48.497] - received message: FutureResult [18:41:48.498] - Received FutureResult [18:41:48.498] - Erased future from FutureRegistry [18:41:48.498] result() for ClusterFuture ... [18:41:48.498] - result already collected: FutureResult [18:41:48.498] result() for ClusterFuture ... done [18:41:48.498] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.483] MultisessionFuture: [18:41:48.483] Label: 'future_sapply-1' [18:41:48.483] Expression: [18:41:48.483] { [18:41:48.483] do.call(function(...) { [18:41:48.483] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.483] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.483] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.483] on.exit(options(oopts), add = TRUE) [18:41:48.483] } [18:41:48.483] { [18:41:48.483] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.483] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.483] ...future.FUN(...future.X_jj, ...) [18:41:48.483] }) [18:41:48.483] } [18:41:48.483] }, args = future.call.arguments) [18:41:48.483] } [18:41:48.483] Lazy evaluation: FALSE [18:41:48.483] Asynchronous evaluation: TRUE [18:41:48.483] Local evaluation: TRUE [18:41:48.483] Environment: R_GlobalEnv [18:41:48.483] Capture standard output: TRUE [18:41:48.483] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.483] Globals: 5 objects totaling 518 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.483] Packages: [18:41:48.483] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.483] Resolved: TRUE [18:41:48.483] Value: [18:41:48.483] Conditions captured: [18:41:48.483] Early signaling: FALSE [18:41:48.483] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.483] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.499] Chunk #1 of 2 ... DONE [18:41:48.499] Chunk #2 of 2 ... [18:41:48.499] - Finding globals in 'X' for chunk #2 ... [18:41:48.499] getGlobalsAndPackages() ... [18:41:48.500] Searching for globals... [18:41:48.500] [18:41:48.500] Searching for globals ... DONE [18:41:48.500] - globals: [0] [18:41:48.500] getGlobalsAndPackages() ... DONE [18:41:48.501] + additional globals found: [n=0] [18:41:48.501] + additional namespaces needed: [n=0] [18:41:48.501] - Finding globals in 'X' for chunk #2 ... DONE [18:41:48.501] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.501] - seeds: [18:41:48.501] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.502] getGlobalsAndPackages() ... [18:41:48.502] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.502] Resolving globals: FALSE [18:41:48.502] Tweak future expression to call with '...' arguments ... [18:41:48.502] { [18:41:48.502] do.call(function(...) { [18:41:48.502] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.502] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.502] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.502] on.exit(options(oopts), add = TRUE) [18:41:48.502] } [18:41:48.502] { [18:41:48.502] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.502] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.502] ...future.FUN(...future.X_jj, ...) [18:41:48.502] }) [18:41:48.502] } [18:41:48.502] }, args = future.call.arguments) [18:41:48.502] } [18:41:48.503] Tweak future expression to call with '...' arguments ... DONE [18:41:48.503] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.504] [18:41:48.504] getGlobalsAndPackages() ... DONE [18:41:48.504] run() for 'Future' ... [18:41:48.504] - state: 'created' [18:41:48.505] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.520] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.520] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.520] - Field: 'node' [18:41:48.521] - Field: 'label' [18:41:48.521] - Field: 'local' [18:41:48.521] - Field: 'owner' [18:41:48.521] - Field: 'envir' [18:41:48.521] - Field: 'workers' [18:41:48.522] - Field: 'packages' [18:41:48.522] - Field: 'gc' [18:41:48.522] - Field: 'conditions' [18:41:48.522] - Field: 'persistent' [18:41:48.522] - Field: 'expr' [18:41:48.522] - Field: 'uuid' [18:41:48.523] - Field: 'seed' [18:41:48.523] - Field: 'version' [18:41:48.523] - Field: 'result' [18:41:48.523] - Field: 'asynchronous' [18:41:48.523] - Field: 'calls' [18:41:48.523] - Field: 'globals' [18:41:48.524] - Field: 'stdout' [18:41:48.524] - Field: 'earlySignal' [18:41:48.524] - Field: 'lazy' [18:41:48.524] - Field: 'state' [18:41:48.524] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.524] - Launch lazy future ... [18:41:48.525] Packages needed by the future expression (n = 0): [18:41:48.525] Packages needed by future strategies (n = 0): [18:41:48.526] { [18:41:48.526] { [18:41:48.526] { [18:41:48.526] ...future.startTime <- base::Sys.time() [18:41:48.526] { [18:41:48.526] { [18:41:48.526] { [18:41:48.526] { [18:41:48.526] base::local({ [18:41:48.526] has_future <- base::requireNamespace("future", [18:41:48.526] quietly = TRUE) [18:41:48.526] if (has_future) { [18:41:48.526] ns <- base::getNamespace("future") [18:41:48.526] version <- ns[[".package"]][["version"]] [18:41:48.526] if (is.null(version)) [18:41:48.526] version <- utils::packageVersion("future") [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] version <- NULL [18:41:48.526] } [18:41:48.526] if (!has_future || version < "1.8.0") { [18:41:48.526] info <- base::c(r_version = base::gsub("R version ", [18:41:48.526] "", base::R.version$version.string), [18:41:48.526] platform = base::sprintf("%s (%s-bit)", [18:41:48.526] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.526] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.526] "release", "version")], collapse = " "), [18:41:48.526] hostname = base::Sys.info()[["nodename"]]) [18:41:48.526] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.526] info) [18:41:48.526] info <- base::paste(info, collapse = "; ") [18:41:48.526] if (!has_future) { [18:41:48.526] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.526] info) [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.526] info, version) [18:41:48.526] } [18:41:48.526] base::stop(msg) [18:41:48.526] } [18:41:48.526] }) [18:41:48.526] } [18:41:48.526] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.526] base::options(mc.cores = 1L) [18:41:48.526] } [18:41:48.526] ...future.strategy.old <- future::plan("list") [18:41:48.526] options(future.plan = NULL) [18:41:48.526] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.526] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.526] } [18:41:48.526] ...future.workdir <- getwd() [18:41:48.526] } [18:41:48.526] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.526] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.526] } [18:41:48.526] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.526] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.526] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.526] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.526] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.526] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.526] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.526] base::names(...future.oldOptions)) [18:41:48.526] } [18:41:48.526] if (FALSE) { [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] if (TRUE) { [18:41:48.526] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.526] open = "w") [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.526] windows = "NUL", "/dev/null"), open = "w") [18:41:48.526] } [18:41:48.526] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.526] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.526] base::sink(type = "output", split = FALSE) [18:41:48.526] base::close(...future.stdout) [18:41:48.526] }, add = TRUE) [18:41:48.526] } [18:41:48.526] ...future.frame <- base::sys.nframe() [18:41:48.526] ...future.conditions <- base::list() [18:41:48.526] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.526] if (FALSE) { [18:41:48.526] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.526] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.526] } [18:41:48.526] ...future.result <- base::tryCatch({ [18:41:48.526] base::withCallingHandlers({ [18:41:48.526] ...future.value <- base::withVisible(base::local({ [18:41:48.526] ...future.makeSendCondition <- base::local({ [18:41:48.526] sendCondition <- NULL [18:41:48.526] function(frame = 1L) { [18:41:48.526] if (is.function(sendCondition)) [18:41:48.526] return(sendCondition) [18:41:48.526] ns <- getNamespace("parallel") [18:41:48.526] if (exists("sendData", mode = "function", [18:41:48.526] envir = ns)) { [18:41:48.526] parallel_sendData <- get("sendData", mode = "function", [18:41:48.526] envir = ns) [18:41:48.526] envir <- sys.frame(frame) [18:41:48.526] master <- NULL [18:41:48.526] while (!identical(envir, .GlobalEnv) && [18:41:48.526] !identical(envir, emptyenv())) { [18:41:48.526] if (exists("master", mode = "list", envir = envir, [18:41:48.526] inherits = FALSE)) { [18:41:48.526] master <- get("master", mode = "list", [18:41:48.526] envir = envir, inherits = FALSE) [18:41:48.526] if (inherits(master, c("SOCKnode", [18:41:48.526] "SOCK0node"))) { [18:41:48.526] sendCondition <<- function(cond) { [18:41:48.526] data <- list(type = "VALUE", value = cond, [18:41:48.526] success = TRUE) [18:41:48.526] parallel_sendData(master, data) [18:41:48.526] } [18:41:48.526] return(sendCondition) [18:41:48.526] } [18:41:48.526] } [18:41:48.526] frame <- frame + 1L [18:41:48.526] envir <- sys.frame(frame) [18:41:48.526] } [18:41:48.526] } [18:41:48.526] sendCondition <<- function(cond) NULL [18:41:48.526] } [18:41:48.526] }) [18:41:48.526] withCallingHandlers({ [18:41:48.526] { [18:41:48.526] do.call(function(...) { [18:41:48.526] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.526] if (!identical(...future.globals.maxSize.org, [18:41:48.526] ...future.globals.maxSize)) { [18:41:48.526] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.526] on.exit(options(oopts), add = TRUE) [18:41:48.526] } [18:41:48.526] { [18:41:48.526] lapply(seq_along(...future.elements_ii), [18:41:48.526] FUN = function(jj) { [18:41:48.526] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.526] ...future.FUN(...future.X_jj, ...) [18:41:48.526] }) [18:41:48.526] } [18:41:48.526] }, args = future.call.arguments) [18:41:48.526] } [18:41:48.526] }, immediateCondition = function(cond) { [18:41:48.526] sendCondition <- ...future.makeSendCondition() [18:41:48.526] sendCondition(cond) [18:41:48.526] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.526] { [18:41:48.526] inherits <- base::inherits [18:41:48.526] invokeRestart <- base::invokeRestart [18:41:48.526] is.null <- base::is.null [18:41:48.526] muffled <- FALSE [18:41:48.526] if (inherits(cond, "message")) { [18:41:48.526] muffled <- grepl(pattern, "muffleMessage") [18:41:48.526] if (muffled) [18:41:48.526] invokeRestart("muffleMessage") [18:41:48.526] } [18:41:48.526] else if (inherits(cond, "warning")) { [18:41:48.526] muffled <- grepl(pattern, "muffleWarning") [18:41:48.526] if (muffled) [18:41:48.526] invokeRestart("muffleWarning") [18:41:48.526] } [18:41:48.526] else if (inherits(cond, "condition")) { [18:41:48.526] if (!is.null(pattern)) { [18:41:48.526] computeRestarts <- base::computeRestarts [18:41:48.526] grepl <- base::grepl [18:41:48.526] restarts <- computeRestarts(cond) [18:41:48.526] for (restart in restarts) { [18:41:48.526] name <- restart$name [18:41:48.526] if (is.null(name)) [18:41:48.526] next [18:41:48.526] if (!grepl(pattern, name)) [18:41:48.526] next [18:41:48.526] invokeRestart(restart) [18:41:48.526] muffled <- TRUE [18:41:48.526] break [18:41:48.526] } [18:41:48.526] } [18:41:48.526] } [18:41:48.526] invisible(muffled) [18:41:48.526] } [18:41:48.526] muffleCondition(cond) [18:41:48.526] }) [18:41:48.526] })) [18:41:48.526] future::FutureResult(value = ...future.value$value, [18:41:48.526] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.526] ...future.rng), globalenv = if (FALSE) [18:41:48.526] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.526] ...future.globalenv.names)) [18:41:48.526] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.526] }, condition = base::local({ [18:41:48.526] c <- base::c [18:41:48.526] inherits <- base::inherits [18:41:48.526] invokeRestart <- base::invokeRestart [18:41:48.526] length <- base::length [18:41:48.526] list <- base::list [18:41:48.526] seq.int <- base::seq.int [18:41:48.526] signalCondition <- base::signalCondition [18:41:48.526] sys.calls <- base::sys.calls [18:41:48.526] `[[` <- base::`[[` [18:41:48.526] `+` <- base::`+` [18:41:48.526] `<<-` <- base::`<<-` [18:41:48.526] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.526] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.526] 3L)] [18:41:48.526] } [18:41:48.526] function(cond) { [18:41:48.526] is_error <- inherits(cond, "error") [18:41:48.526] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.526] NULL) [18:41:48.526] if (is_error) { [18:41:48.526] sessionInformation <- function() { [18:41:48.526] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.526] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.526] search = base::search(), system = base::Sys.info()) [18:41:48.526] } [18:41:48.526] ...future.conditions[[length(...future.conditions) + [18:41:48.526] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.526] cond$call), session = sessionInformation(), [18:41:48.526] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.526] signalCondition(cond) [18:41:48.526] } [18:41:48.526] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.526] "immediateCondition"))) { [18:41:48.526] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.526] ...future.conditions[[length(...future.conditions) + [18:41:48.526] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.526] if (TRUE && !signal) { [18:41:48.526] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.526] { [18:41:48.526] inherits <- base::inherits [18:41:48.526] invokeRestart <- base::invokeRestart [18:41:48.526] is.null <- base::is.null [18:41:48.526] muffled <- FALSE [18:41:48.526] if (inherits(cond, "message")) { [18:41:48.526] muffled <- grepl(pattern, "muffleMessage") [18:41:48.526] if (muffled) [18:41:48.526] invokeRestart("muffleMessage") [18:41:48.526] } [18:41:48.526] else if (inherits(cond, "warning")) { [18:41:48.526] muffled <- grepl(pattern, "muffleWarning") [18:41:48.526] if (muffled) [18:41:48.526] invokeRestart("muffleWarning") [18:41:48.526] } [18:41:48.526] else if (inherits(cond, "condition")) { [18:41:48.526] if (!is.null(pattern)) { [18:41:48.526] computeRestarts <- base::computeRestarts [18:41:48.526] grepl <- base::grepl [18:41:48.526] restarts <- computeRestarts(cond) [18:41:48.526] for (restart in restarts) { [18:41:48.526] name <- restart$name [18:41:48.526] if (is.null(name)) [18:41:48.526] next [18:41:48.526] if (!grepl(pattern, name)) [18:41:48.526] next [18:41:48.526] invokeRestart(restart) [18:41:48.526] muffled <- TRUE [18:41:48.526] break [18:41:48.526] } [18:41:48.526] } [18:41:48.526] } [18:41:48.526] invisible(muffled) [18:41:48.526] } [18:41:48.526] muffleCondition(cond, pattern = "^muffle") [18:41:48.526] } [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] if (TRUE) { [18:41:48.526] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.526] { [18:41:48.526] inherits <- base::inherits [18:41:48.526] invokeRestart <- base::invokeRestart [18:41:48.526] is.null <- base::is.null [18:41:48.526] muffled <- FALSE [18:41:48.526] if (inherits(cond, "message")) { [18:41:48.526] muffled <- grepl(pattern, "muffleMessage") [18:41:48.526] if (muffled) [18:41:48.526] invokeRestart("muffleMessage") [18:41:48.526] } [18:41:48.526] else if (inherits(cond, "warning")) { [18:41:48.526] muffled <- grepl(pattern, "muffleWarning") [18:41:48.526] if (muffled) [18:41:48.526] invokeRestart("muffleWarning") [18:41:48.526] } [18:41:48.526] else if (inherits(cond, "condition")) { [18:41:48.526] if (!is.null(pattern)) { [18:41:48.526] computeRestarts <- base::computeRestarts [18:41:48.526] grepl <- base::grepl [18:41:48.526] restarts <- computeRestarts(cond) [18:41:48.526] for (restart in restarts) { [18:41:48.526] name <- restart$name [18:41:48.526] if (is.null(name)) [18:41:48.526] next [18:41:48.526] if (!grepl(pattern, name)) [18:41:48.526] next [18:41:48.526] invokeRestart(restart) [18:41:48.526] muffled <- TRUE [18:41:48.526] break [18:41:48.526] } [18:41:48.526] } [18:41:48.526] } [18:41:48.526] invisible(muffled) [18:41:48.526] } [18:41:48.526] muffleCondition(cond, pattern = "^muffle") [18:41:48.526] } [18:41:48.526] } [18:41:48.526] } [18:41:48.526] })) [18:41:48.526] }, error = function(ex) { [18:41:48.526] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.526] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.526] ...future.rng), started = ...future.startTime, [18:41:48.526] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.526] version = "1.8"), class = "FutureResult") [18:41:48.526] }, finally = { [18:41:48.526] if (!identical(...future.workdir, getwd())) [18:41:48.526] setwd(...future.workdir) [18:41:48.526] { [18:41:48.526] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.526] ...future.oldOptions$nwarnings <- NULL [18:41:48.526] } [18:41:48.526] base::options(...future.oldOptions) [18:41:48.526] if (.Platform$OS.type == "windows") { [18:41:48.526] old_names <- names(...future.oldEnvVars) [18:41:48.526] envs <- base::Sys.getenv() [18:41:48.526] names <- names(envs) [18:41:48.526] common <- intersect(names, old_names) [18:41:48.526] added <- setdiff(names, old_names) [18:41:48.526] removed <- setdiff(old_names, names) [18:41:48.526] changed <- common[...future.oldEnvVars[common] != [18:41:48.526] envs[common]] [18:41:48.526] NAMES <- toupper(changed) [18:41:48.526] args <- list() [18:41:48.526] for (kk in seq_along(NAMES)) { [18:41:48.526] name <- changed[[kk]] [18:41:48.526] NAME <- NAMES[[kk]] [18:41:48.526] if (name != NAME && is.element(NAME, old_names)) [18:41:48.526] next [18:41:48.526] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.526] } [18:41:48.526] NAMES <- toupper(added) [18:41:48.526] for (kk in seq_along(NAMES)) { [18:41:48.526] name <- added[[kk]] [18:41:48.526] NAME <- NAMES[[kk]] [18:41:48.526] if (name != NAME && is.element(NAME, old_names)) [18:41:48.526] next [18:41:48.526] args[[name]] <- "" [18:41:48.526] } [18:41:48.526] NAMES <- toupper(removed) [18:41:48.526] for (kk in seq_along(NAMES)) { [18:41:48.526] name <- removed[[kk]] [18:41:48.526] NAME <- NAMES[[kk]] [18:41:48.526] if (name != NAME && is.element(NAME, old_names)) [18:41:48.526] next [18:41:48.526] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.526] } [18:41:48.526] if (length(args) > 0) [18:41:48.526] base::do.call(base::Sys.setenv, args = args) [18:41:48.526] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.526] } [18:41:48.526] { [18:41:48.526] if (base::length(...future.futureOptionsAdded) > [18:41:48.526] 0L) { [18:41:48.526] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.526] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.526] base::options(opts) [18:41:48.526] } [18:41:48.526] { [18:41:48.526] { [18:41:48.526] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.526] NULL [18:41:48.526] } [18:41:48.526] options(future.plan = NULL) [18:41:48.526] if (is.na(NA_character_)) [18:41:48.526] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.526] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.526] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.526] .init = FALSE) [18:41:48.526] } [18:41:48.526] } [18:41:48.526] } [18:41:48.526] }) [18:41:48.526] if (TRUE) { [18:41:48.526] base::sink(type = "output", split = FALSE) [18:41:48.526] if (TRUE) { [18:41:48.526] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.526] } [18:41:48.526] else { [18:41:48.526] ...future.result["stdout"] <- base::list(NULL) [18:41:48.526] } [18:41:48.526] base::close(...future.stdout) [18:41:48.526] ...future.stdout <- NULL [18:41:48.526] } [18:41:48.526] ...future.result$conditions <- ...future.conditions [18:41:48.526] ...future.result$finished <- base::Sys.time() [18:41:48.526] ...future.result [18:41:48.526] } [18:41:48.531] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:48.531] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:48.532] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:48.532] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.532] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.533] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:48.533] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:48.533] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.534] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.534] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.534] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.534] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:48.535] MultisessionFuture started [18:41:48.535] - Launch lazy future ... done [18:41:48.536] run() for 'MultisessionFuture' ... done [18:41:48.536] Created future: [18:41:48.549] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.549] - Validating connection of MultisessionFuture [18:41:48.550] - received message: FutureResult [18:41:48.550] - Received FutureResult [18:41:48.550] - Erased future from FutureRegistry [18:41:48.550] result() for ClusterFuture ... [18:41:48.550] - result already collected: FutureResult [18:41:48.551] result() for ClusterFuture ... done [18:41:48.551] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.536] MultisessionFuture: [18:41:48.536] Label: 'future_sapply-2' [18:41:48.536] Expression: [18:41:48.536] { [18:41:48.536] do.call(function(...) { [18:41:48.536] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.536] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.536] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.536] on.exit(options(oopts), add = TRUE) [18:41:48.536] } [18:41:48.536] { [18:41:48.536] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.536] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.536] ...future.FUN(...future.X_jj, ...) [18:41:48.536] }) [18:41:48.536] } [18:41:48.536] }, args = future.call.arguments) [18:41:48.536] } [18:41:48.536] Lazy evaluation: FALSE [18:41:48.536] Asynchronous evaluation: TRUE [18:41:48.536] Local evaluation: TRUE [18:41:48.536] Environment: R_GlobalEnv [18:41:48.536] Capture standard output: TRUE [18:41:48.536] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.536] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.536] Packages: [18:41:48.536] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.536] Resolved: TRUE [18:41:48.536] Value: [18:41:48.536] Conditions captured: [18:41:48.536] Early signaling: FALSE [18:41:48.536] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.536] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.552] Chunk #2 of 2 ... DONE [18:41:48.552] Launching 2 futures (chunks) ... DONE [18:41:48.552] Resolving 2 futures (chunks) ... [18:41:48.553] resolve() on list ... [18:41:48.553] recursive: 0 [18:41:48.553] length: 2 [18:41:48.554] [18:41:48.554] Future #1 [18:41:48.554] result() for ClusterFuture ... [18:41:48.555] - result already collected: FutureResult [18:41:48.555] result() for ClusterFuture ... done [18:41:48.555] result() for ClusterFuture ... [18:41:48.555] - result already collected: FutureResult [18:41:48.555] result() for ClusterFuture ... done [18:41:48.556] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:48.556] - nx: 2 [18:41:48.556] - relay: TRUE [18:41:48.556] - stdout: TRUE [18:41:48.556] - signal: TRUE [18:41:48.556] - resignal: FALSE [18:41:48.556] - force: TRUE [18:41:48.557] - relayed: [n=2] FALSE, FALSE [18:41:48.557] - queued futures: [n=2] FALSE, FALSE [18:41:48.557] - until=1 [18:41:48.557] - relaying element #1 [18:41:48.557] result() for ClusterFuture ... [18:41:48.557] - result already collected: FutureResult [18:41:48.558] result() for ClusterFuture ... done [18:41:48.558] result() for ClusterFuture ... [18:41:48.558] - result already collected: FutureResult [18:41:48.558] result() for ClusterFuture ... done [18:41:48.558] result() for ClusterFuture ... [18:41:48.559] - result already collected: FutureResult [18:41:48.559] result() for ClusterFuture ... done [18:41:48.559] result() for ClusterFuture ... [18:41:48.559] - result already collected: FutureResult [18:41:48.559] result() for ClusterFuture ... done [18:41:48.559] - relayed: [n=2] TRUE, FALSE [18:41:48.559] - queued futures: [n=2] TRUE, FALSE [18:41:48.560] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:48.560] length: 1 (resolved future 1) [18:41:48.560] Future #2 [18:41:48.560] result() for ClusterFuture ... [18:41:48.560] - result already collected: FutureResult [18:41:48.560] result() for ClusterFuture ... done [18:41:48.561] result() for ClusterFuture ... [18:41:48.561] - result already collected: FutureResult [18:41:48.561] result() for ClusterFuture ... done [18:41:48.561] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:48.561] - nx: 2 [18:41:48.561] - relay: TRUE [18:41:48.562] - stdout: TRUE [18:41:48.562] - signal: TRUE [18:41:48.562] - resignal: FALSE [18:41:48.562] - force: TRUE [18:41:48.562] - relayed: [n=2] TRUE, FALSE [18:41:48.562] - queued futures: [n=2] TRUE, FALSE [18:41:48.563] - until=2 [18:41:48.563] - relaying element #2 [18:41:48.563] result() for ClusterFuture ... [18:41:48.566] - result already collected: FutureResult [18:41:48.567] result() for ClusterFuture ... done [18:41:48.567] result() for ClusterFuture ... [18:41:48.567] - result already collected: FutureResult [18:41:48.568] result() for ClusterFuture ... done [18:41:48.568] result() for ClusterFuture ... [18:41:48.569] - result already collected: FutureResult [18:41:48.569] result() for ClusterFuture ... done [18:41:48.569] result() for ClusterFuture ... [18:41:48.569] - result already collected: FutureResult [18:41:48.570] result() for ClusterFuture ... done [18:41:48.570] - relayed: [n=2] TRUE, TRUE [18:41:48.570] - queued futures: [n=2] TRUE, TRUE [18:41:48.570] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:48.570] length: 0 (resolved future 2) [18:41:48.570] Relaying remaining futures [18:41:48.571] signalConditionsASAP(NULL, pos=0) ... [18:41:48.571] - nx: 2 [18:41:48.571] - relay: TRUE [18:41:48.571] - stdout: TRUE [18:41:48.571] - signal: TRUE [18:41:48.571] - resignal: FALSE [18:41:48.572] - force: TRUE [18:41:48.572] - relayed: [n=2] TRUE, TRUE [18:41:48.572] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:48.572] - relayed: [n=2] TRUE, TRUE [18:41:48.572] - queued futures: [n=2] TRUE, TRUE [18:41:48.572] signalConditionsASAP(NULL, pos=0) ... done [18:41:48.573] resolve() on list ... DONE [18:41:48.573] result() for ClusterFuture ... [18:41:48.573] - result already collected: FutureResult [18:41:48.573] result() for ClusterFuture ... done [18:41:48.573] result() for ClusterFuture ... [18:41:48.573] - result already collected: FutureResult [18:41:48.574] result() for ClusterFuture ... done [18:41:48.574] result() for ClusterFuture ... [18:41:48.574] - result already collected: FutureResult [18:41:48.574] result() for ClusterFuture ... done [18:41:48.574] result() for ClusterFuture ... [18:41:48.574] - result already collected: FutureResult [18:41:48.575] result() for ClusterFuture ... done [18:41:48.575] - Number of value chunks collected: 2 [18:41:48.575] Resolving 2 futures (chunks) ... DONE [18:41:48.575] Reducing values from 2 chunks ... [18:41:48.575] - Number of values collected after concatenation: 3 [18:41:48.575] - Number of values expected: 3 [18:41:48.576] Reducing values from 2 chunks ... DONE [18:41:48.576] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y1:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 List of 2 $ y0:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 $ y2:List of 3 ..$ a: num [1, 1] 1 ..$ b: num [1, 1] 2 ..$ c: num [1, 1] 3 [18:41:48.583] future_lapply() ... [18:41:48.587] Number of chunks: 2 [18:41:48.587] getGlobalsAndPackagesXApply() ... [18:41:48.587] - future.globals: TRUE [18:41:48.587] getGlobalsAndPackages() ... [18:41:48.587] Searching for globals... [18:41:48.589] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:48.590] Searching for globals ... DONE [18:41:48.590] Resolving globals: FALSE [18:41:48.590] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:48.591] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:48.591] - globals: [1] 'FUN' [18:41:48.591] [18:41:48.591] getGlobalsAndPackages() ... DONE [18:41:48.591] - globals found/used: [n=1] 'FUN' [18:41:48.592] - needed namespaces: [n=0] [18:41:48.592] Finding globals ... DONE [18:41:48.592] - use_args: TRUE [18:41:48.592] - Getting '...' globals ... [18:41:48.593] resolve() on list ... [18:41:48.593] recursive: 0 [18:41:48.593] length: 1 [18:41:48.593] elements: '...' [18:41:48.593] length: 0 (resolved future 1) [18:41:48.594] resolve() on list ... DONE [18:41:48.594] - '...' content: [n=0] [18:41:48.594] List of 1 [18:41:48.594] $ ...: list() [18:41:48.594] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.594] - attr(*, "where")=List of 1 [18:41:48.594] ..$ ...: [18:41:48.594] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.594] - attr(*, "resolved")= logi TRUE [18:41:48.594] - attr(*, "total_size")= num NA [18:41:48.597] - Getting '...' globals ... DONE [18:41:48.597] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:48.597] List of 2 [18:41:48.597] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:48.597] $ ... : list() [18:41:48.597] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.597] - attr(*, "where")=List of 2 [18:41:48.597] ..$ ...future.FUN: [18:41:48.597] ..$ ... : [18:41:48.597] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.597] - attr(*, "resolved")= logi FALSE [18:41:48.597] - attr(*, "total_size")= int 6598 [18:41:48.601] Packages to be attached in all futures: [n=0] [18:41:48.601] getGlobalsAndPackagesXApply() ... DONE [18:41:48.601] Number of futures (= number of chunks): 2 [18:41:48.601] Launching 2 futures (chunks) ... [18:41:48.602] Chunk #1 of 2 ... [18:41:48.602] - Finding globals in 'X' for chunk #1 ... [18:41:48.602] getGlobalsAndPackages() ... [18:41:48.602] Searching for globals... [18:41:48.603] [18:41:48.603] Searching for globals ... DONE [18:41:48.603] - globals: [0] [18:41:48.603] getGlobalsAndPackages() ... DONE [18:41:48.603] + additional globals found: [n=0] [18:41:48.603] + additional namespaces needed: [n=0] [18:41:48.604] - Finding globals in 'X' for chunk #1 ... DONE [18:41:48.604] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.604] - seeds: [18:41:48.604] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.604] getGlobalsAndPackages() ... [18:41:48.604] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.605] Resolving globals: FALSE [18:41:48.605] Tweak future expression to call with '...' arguments ... [18:41:48.605] { [18:41:48.605] do.call(function(...) { [18:41:48.605] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.605] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.605] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.605] on.exit(options(oopts), add = TRUE) [18:41:48.605] } [18:41:48.605] { [18:41:48.605] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.605] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.605] ...future.FUN(...future.X_jj, ...) [18:41:48.605] }) [18:41:48.605] } [18:41:48.605] }, args = future.call.arguments) [18:41:48.605] } [18:41:48.605] Tweak future expression to call with '...' arguments ... DONE [18:41:48.606] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.606] [18:41:48.606] getGlobalsAndPackages() ... DONE [18:41:48.607] run() for 'Future' ... [18:41:48.607] - state: 'created' [18:41:48.607] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.623] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.623] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.624] - Field: 'node' [18:41:48.624] - Field: 'label' [18:41:48.624] - Field: 'local' [18:41:48.624] - Field: 'owner' [18:41:48.624] - Field: 'envir' [18:41:48.625] - Field: 'workers' [18:41:48.625] - Field: 'packages' [18:41:48.625] - Field: 'gc' [18:41:48.625] - Field: 'conditions' [18:41:48.625] - Field: 'persistent' [18:41:48.625] - Field: 'expr' [18:41:48.626] - Field: 'uuid' [18:41:48.626] - Field: 'seed' [18:41:48.626] - Field: 'version' [18:41:48.626] - Field: 'result' [18:41:48.626] - Field: 'asynchronous' [18:41:48.626] - Field: 'calls' [18:41:48.627] - Field: 'globals' [18:41:48.627] - Field: 'stdout' [18:41:48.627] - Field: 'earlySignal' [18:41:48.627] - Field: 'lazy' [18:41:48.627] - Field: 'state' [18:41:48.627] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.628] - Launch lazy future ... [18:41:48.628] Packages needed by the future expression (n = 0): [18:41:48.628] Packages needed by future strategies (n = 0): [18:41:48.629] { [18:41:48.629] { [18:41:48.629] { [18:41:48.629] ...future.startTime <- base::Sys.time() [18:41:48.629] { [18:41:48.629] { [18:41:48.629] { [18:41:48.629] { [18:41:48.629] base::local({ [18:41:48.629] has_future <- base::requireNamespace("future", [18:41:48.629] quietly = TRUE) [18:41:48.629] if (has_future) { [18:41:48.629] ns <- base::getNamespace("future") [18:41:48.629] version <- ns[[".package"]][["version"]] [18:41:48.629] if (is.null(version)) [18:41:48.629] version <- utils::packageVersion("future") [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] version <- NULL [18:41:48.629] } [18:41:48.629] if (!has_future || version < "1.8.0") { [18:41:48.629] info <- base::c(r_version = base::gsub("R version ", [18:41:48.629] "", base::R.version$version.string), [18:41:48.629] platform = base::sprintf("%s (%s-bit)", [18:41:48.629] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.629] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.629] "release", "version")], collapse = " "), [18:41:48.629] hostname = base::Sys.info()[["nodename"]]) [18:41:48.629] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.629] info) [18:41:48.629] info <- base::paste(info, collapse = "; ") [18:41:48.629] if (!has_future) { [18:41:48.629] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.629] info) [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.629] info, version) [18:41:48.629] } [18:41:48.629] base::stop(msg) [18:41:48.629] } [18:41:48.629] }) [18:41:48.629] } [18:41:48.629] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.629] base::options(mc.cores = 1L) [18:41:48.629] } [18:41:48.629] ...future.strategy.old <- future::plan("list") [18:41:48.629] options(future.plan = NULL) [18:41:48.629] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.629] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.629] } [18:41:48.629] ...future.workdir <- getwd() [18:41:48.629] } [18:41:48.629] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.629] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.629] } [18:41:48.629] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.629] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.629] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.629] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.629] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.629] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.629] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.629] base::names(...future.oldOptions)) [18:41:48.629] } [18:41:48.629] if (FALSE) { [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] if (TRUE) { [18:41:48.629] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.629] open = "w") [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.629] windows = "NUL", "/dev/null"), open = "w") [18:41:48.629] } [18:41:48.629] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.629] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.629] base::sink(type = "output", split = FALSE) [18:41:48.629] base::close(...future.stdout) [18:41:48.629] }, add = TRUE) [18:41:48.629] } [18:41:48.629] ...future.frame <- base::sys.nframe() [18:41:48.629] ...future.conditions <- base::list() [18:41:48.629] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.629] if (FALSE) { [18:41:48.629] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.629] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.629] } [18:41:48.629] ...future.result <- base::tryCatch({ [18:41:48.629] base::withCallingHandlers({ [18:41:48.629] ...future.value <- base::withVisible(base::local({ [18:41:48.629] ...future.makeSendCondition <- base::local({ [18:41:48.629] sendCondition <- NULL [18:41:48.629] function(frame = 1L) { [18:41:48.629] if (is.function(sendCondition)) [18:41:48.629] return(sendCondition) [18:41:48.629] ns <- getNamespace("parallel") [18:41:48.629] if (exists("sendData", mode = "function", [18:41:48.629] envir = ns)) { [18:41:48.629] parallel_sendData <- get("sendData", mode = "function", [18:41:48.629] envir = ns) [18:41:48.629] envir <- sys.frame(frame) [18:41:48.629] master <- NULL [18:41:48.629] while (!identical(envir, .GlobalEnv) && [18:41:48.629] !identical(envir, emptyenv())) { [18:41:48.629] if (exists("master", mode = "list", envir = envir, [18:41:48.629] inherits = FALSE)) { [18:41:48.629] master <- get("master", mode = "list", [18:41:48.629] envir = envir, inherits = FALSE) [18:41:48.629] if (inherits(master, c("SOCKnode", [18:41:48.629] "SOCK0node"))) { [18:41:48.629] sendCondition <<- function(cond) { [18:41:48.629] data <- list(type = "VALUE", value = cond, [18:41:48.629] success = TRUE) [18:41:48.629] parallel_sendData(master, data) [18:41:48.629] } [18:41:48.629] return(sendCondition) [18:41:48.629] } [18:41:48.629] } [18:41:48.629] frame <- frame + 1L [18:41:48.629] envir <- sys.frame(frame) [18:41:48.629] } [18:41:48.629] } [18:41:48.629] sendCondition <<- function(cond) NULL [18:41:48.629] } [18:41:48.629] }) [18:41:48.629] withCallingHandlers({ [18:41:48.629] { [18:41:48.629] do.call(function(...) { [18:41:48.629] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.629] if (!identical(...future.globals.maxSize.org, [18:41:48.629] ...future.globals.maxSize)) { [18:41:48.629] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.629] on.exit(options(oopts), add = TRUE) [18:41:48.629] } [18:41:48.629] { [18:41:48.629] lapply(seq_along(...future.elements_ii), [18:41:48.629] FUN = function(jj) { [18:41:48.629] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.629] ...future.FUN(...future.X_jj, ...) [18:41:48.629] }) [18:41:48.629] } [18:41:48.629] }, args = future.call.arguments) [18:41:48.629] } [18:41:48.629] }, immediateCondition = function(cond) { [18:41:48.629] sendCondition <- ...future.makeSendCondition() [18:41:48.629] sendCondition(cond) [18:41:48.629] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.629] { [18:41:48.629] inherits <- base::inherits [18:41:48.629] invokeRestart <- base::invokeRestart [18:41:48.629] is.null <- base::is.null [18:41:48.629] muffled <- FALSE [18:41:48.629] if (inherits(cond, "message")) { [18:41:48.629] muffled <- grepl(pattern, "muffleMessage") [18:41:48.629] if (muffled) [18:41:48.629] invokeRestart("muffleMessage") [18:41:48.629] } [18:41:48.629] else if (inherits(cond, "warning")) { [18:41:48.629] muffled <- grepl(pattern, "muffleWarning") [18:41:48.629] if (muffled) [18:41:48.629] invokeRestart("muffleWarning") [18:41:48.629] } [18:41:48.629] else if (inherits(cond, "condition")) { [18:41:48.629] if (!is.null(pattern)) { [18:41:48.629] computeRestarts <- base::computeRestarts [18:41:48.629] grepl <- base::grepl [18:41:48.629] restarts <- computeRestarts(cond) [18:41:48.629] for (restart in restarts) { [18:41:48.629] name <- restart$name [18:41:48.629] if (is.null(name)) [18:41:48.629] next [18:41:48.629] if (!grepl(pattern, name)) [18:41:48.629] next [18:41:48.629] invokeRestart(restart) [18:41:48.629] muffled <- TRUE [18:41:48.629] break [18:41:48.629] } [18:41:48.629] } [18:41:48.629] } [18:41:48.629] invisible(muffled) [18:41:48.629] } [18:41:48.629] muffleCondition(cond) [18:41:48.629] }) [18:41:48.629] })) [18:41:48.629] future::FutureResult(value = ...future.value$value, [18:41:48.629] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.629] ...future.rng), globalenv = if (FALSE) [18:41:48.629] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.629] ...future.globalenv.names)) [18:41:48.629] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.629] }, condition = base::local({ [18:41:48.629] c <- base::c [18:41:48.629] inherits <- base::inherits [18:41:48.629] invokeRestart <- base::invokeRestart [18:41:48.629] length <- base::length [18:41:48.629] list <- base::list [18:41:48.629] seq.int <- base::seq.int [18:41:48.629] signalCondition <- base::signalCondition [18:41:48.629] sys.calls <- base::sys.calls [18:41:48.629] `[[` <- base::`[[` [18:41:48.629] `+` <- base::`+` [18:41:48.629] `<<-` <- base::`<<-` [18:41:48.629] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.629] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.629] 3L)] [18:41:48.629] } [18:41:48.629] function(cond) { [18:41:48.629] is_error <- inherits(cond, "error") [18:41:48.629] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.629] NULL) [18:41:48.629] if (is_error) { [18:41:48.629] sessionInformation <- function() { [18:41:48.629] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.629] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.629] search = base::search(), system = base::Sys.info()) [18:41:48.629] } [18:41:48.629] ...future.conditions[[length(...future.conditions) + [18:41:48.629] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.629] cond$call), session = sessionInformation(), [18:41:48.629] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.629] signalCondition(cond) [18:41:48.629] } [18:41:48.629] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.629] "immediateCondition"))) { [18:41:48.629] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.629] ...future.conditions[[length(...future.conditions) + [18:41:48.629] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.629] if (TRUE && !signal) { [18:41:48.629] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.629] { [18:41:48.629] inherits <- base::inherits [18:41:48.629] invokeRestart <- base::invokeRestart [18:41:48.629] is.null <- base::is.null [18:41:48.629] muffled <- FALSE [18:41:48.629] if (inherits(cond, "message")) { [18:41:48.629] muffled <- grepl(pattern, "muffleMessage") [18:41:48.629] if (muffled) [18:41:48.629] invokeRestart("muffleMessage") [18:41:48.629] } [18:41:48.629] else if (inherits(cond, "warning")) { [18:41:48.629] muffled <- grepl(pattern, "muffleWarning") [18:41:48.629] if (muffled) [18:41:48.629] invokeRestart("muffleWarning") [18:41:48.629] } [18:41:48.629] else if (inherits(cond, "condition")) { [18:41:48.629] if (!is.null(pattern)) { [18:41:48.629] computeRestarts <- base::computeRestarts [18:41:48.629] grepl <- base::grepl [18:41:48.629] restarts <- computeRestarts(cond) [18:41:48.629] for (restart in restarts) { [18:41:48.629] name <- restart$name [18:41:48.629] if (is.null(name)) [18:41:48.629] next [18:41:48.629] if (!grepl(pattern, name)) [18:41:48.629] next [18:41:48.629] invokeRestart(restart) [18:41:48.629] muffled <- TRUE [18:41:48.629] break [18:41:48.629] } [18:41:48.629] } [18:41:48.629] } [18:41:48.629] invisible(muffled) [18:41:48.629] } [18:41:48.629] muffleCondition(cond, pattern = "^muffle") [18:41:48.629] } [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] if (TRUE) { [18:41:48.629] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.629] { [18:41:48.629] inherits <- base::inherits [18:41:48.629] invokeRestart <- base::invokeRestart [18:41:48.629] is.null <- base::is.null [18:41:48.629] muffled <- FALSE [18:41:48.629] if (inherits(cond, "message")) { [18:41:48.629] muffled <- grepl(pattern, "muffleMessage") [18:41:48.629] if (muffled) [18:41:48.629] invokeRestart("muffleMessage") [18:41:48.629] } [18:41:48.629] else if (inherits(cond, "warning")) { [18:41:48.629] muffled <- grepl(pattern, "muffleWarning") [18:41:48.629] if (muffled) [18:41:48.629] invokeRestart("muffleWarning") [18:41:48.629] } [18:41:48.629] else if (inherits(cond, "condition")) { [18:41:48.629] if (!is.null(pattern)) { [18:41:48.629] computeRestarts <- base::computeRestarts [18:41:48.629] grepl <- base::grepl [18:41:48.629] restarts <- computeRestarts(cond) [18:41:48.629] for (restart in restarts) { [18:41:48.629] name <- restart$name [18:41:48.629] if (is.null(name)) [18:41:48.629] next [18:41:48.629] if (!grepl(pattern, name)) [18:41:48.629] next [18:41:48.629] invokeRestart(restart) [18:41:48.629] muffled <- TRUE [18:41:48.629] break [18:41:48.629] } [18:41:48.629] } [18:41:48.629] } [18:41:48.629] invisible(muffled) [18:41:48.629] } [18:41:48.629] muffleCondition(cond, pattern = "^muffle") [18:41:48.629] } [18:41:48.629] } [18:41:48.629] } [18:41:48.629] })) [18:41:48.629] }, error = function(ex) { [18:41:48.629] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.629] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.629] ...future.rng), started = ...future.startTime, [18:41:48.629] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.629] version = "1.8"), class = "FutureResult") [18:41:48.629] }, finally = { [18:41:48.629] if (!identical(...future.workdir, getwd())) [18:41:48.629] setwd(...future.workdir) [18:41:48.629] { [18:41:48.629] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.629] ...future.oldOptions$nwarnings <- NULL [18:41:48.629] } [18:41:48.629] base::options(...future.oldOptions) [18:41:48.629] if (.Platform$OS.type == "windows") { [18:41:48.629] old_names <- names(...future.oldEnvVars) [18:41:48.629] envs <- base::Sys.getenv() [18:41:48.629] names <- names(envs) [18:41:48.629] common <- intersect(names, old_names) [18:41:48.629] added <- setdiff(names, old_names) [18:41:48.629] removed <- setdiff(old_names, names) [18:41:48.629] changed <- common[...future.oldEnvVars[common] != [18:41:48.629] envs[common]] [18:41:48.629] NAMES <- toupper(changed) [18:41:48.629] args <- list() [18:41:48.629] for (kk in seq_along(NAMES)) { [18:41:48.629] name <- changed[[kk]] [18:41:48.629] NAME <- NAMES[[kk]] [18:41:48.629] if (name != NAME && is.element(NAME, old_names)) [18:41:48.629] next [18:41:48.629] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.629] } [18:41:48.629] NAMES <- toupper(added) [18:41:48.629] for (kk in seq_along(NAMES)) { [18:41:48.629] name <- added[[kk]] [18:41:48.629] NAME <- NAMES[[kk]] [18:41:48.629] if (name != NAME && is.element(NAME, old_names)) [18:41:48.629] next [18:41:48.629] args[[name]] <- "" [18:41:48.629] } [18:41:48.629] NAMES <- toupper(removed) [18:41:48.629] for (kk in seq_along(NAMES)) { [18:41:48.629] name <- removed[[kk]] [18:41:48.629] NAME <- NAMES[[kk]] [18:41:48.629] if (name != NAME && is.element(NAME, old_names)) [18:41:48.629] next [18:41:48.629] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.629] } [18:41:48.629] if (length(args) > 0) [18:41:48.629] base::do.call(base::Sys.setenv, args = args) [18:41:48.629] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.629] } [18:41:48.629] { [18:41:48.629] if (base::length(...future.futureOptionsAdded) > [18:41:48.629] 0L) { [18:41:48.629] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.629] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.629] base::options(opts) [18:41:48.629] } [18:41:48.629] { [18:41:48.629] { [18:41:48.629] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.629] NULL [18:41:48.629] } [18:41:48.629] options(future.plan = NULL) [18:41:48.629] if (is.na(NA_character_)) [18:41:48.629] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.629] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.629] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.629] .init = FALSE) [18:41:48.629] } [18:41:48.629] } [18:41:48.629] } [18:41:48.629] }) [18:41:48.629] if (TRUE) { [18:41:48.629] base::sink(type = "output", split = FALSE) [18:41:48.629] if (TRUE) { [18:41:48.629] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.629] } [18:41:48.629] else { [18:41:48.629] ...future.result["stdout"] <- base::list(NULL) [18:41:48.629] } [18:41:48.629] base::close(...future.stdout) [18:41:48.629] ...future.stdout <- NULL [18:41:48.629] } [18:41:48.629] ...future.result$conditions <- ...future.conditions [18:41:48.629] ...future.result$finished <- base::Sys.time() [18:41:48.629] ...future.result [18:41:48.629] } [18:41:48.634] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... [18:41:48.635] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:48.635] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:48.635] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.636] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.636] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:48.636] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:48.637] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.637] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.637] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.637] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.638] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... DONE [18:41:48.638] MultisessionFuture started [18:41:48.639] - Launch lazy future ... done [18:41:48.639] run() for 'MultisessionFuture' ... done [18:41:48.639] Created future: [18:41:48.652] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.653] - Validating connection of MultisessionFuture [18:41:48.653] - received message: FutureResult [18:41:48.653] - Received FutureResult [18:41:48.653] - Erased future from FutureRegistry [18:41:48.654] result() for ClusterFuture ... [18:41:48.654] - result already collected: FutureResult [18:41:48.654] result() for ClusterFuture ... done [18:41:48.654] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.639] MultisessionFuture: [18:41:48.639] Label: 'future_sapply-1' [18:41:48.639] Expression: [18:41:48.639] { [18:41:48.639] do.call(function(...) { [18:41:48.639] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.639] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.639] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.639] on.exit(options(oopts), add = TRUE) [18:41:48.639] } [18:41:48.639] { [18:41:48.639] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.639] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.639] ...future.FUN(...future.X_jj, ...) [18:41:48.639] }) [18:41:48.639] } [18:41:48.639] }, args = future.call.arguments) [18:41:48.639] } [18:41:48.639] Lazy evaluation: FALSE [18:41:48.639] Asynchronous evaluation: TRUE [18:41:48.639] Local evaluation: TRUE [18:41:48.639] Environment: R_GlobalEnv [18:41:48.639] Capture standard output: TRUE [18:41:48.639] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.639] Globals: 5 objects totaling 1.00 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.639] Packages: [18:41:48.639] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.639] Resolved: TRUE [18:41:48.639] Value: [18:41:48.639] Conditions captured: [18:41:48.639] Early signaling: FALSE [18:41:48.639] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.639] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.655] Chunk #1 of 2 ... DONE [18:41:48.655] Chunk #2 of 2 ... [18:41:48.655] - Finding globals in 'X' for chunk #2 ... [18:41:48.655] getGlobalsAndPackages() ... [18:41:48.655] Searching for globals... [18:41:48.656] [18:41:48.656] Searching for globals ... DONE [18:41:48.656] - globals: [0] [18:41:48.656] getGlobalsAndPackages() ... DONE [18:41:48.656] + additional globals found: [n=0] [18:41:48.656] + additional namespaces needed: [n=0] [18:41:48.656] - Finding globals in 'X' for chunk #2 ... DONE [18:41:48.657] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.657] - seeds: [18:41:48.657] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.657] getGlobalsAndPackages() ... [18:41:48.657] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.657] Resolving globals: FALSE [18:41:48.658] Tweak future expression to call with '...' arguments ... [18:41:48.658] { [18:41:48.658] do.call(function(...) { [18:41:48.658] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.658] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.658] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.658] on.exit(options(oopts), add = TRUE) [18:41:48.658] } [18:41:48.658] { [18:41:48.658] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.658] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.658] ...future.FUN(...future.X_jj, ...) [18:41:48.658] }) [18:41:48.658] } [18:41:48.658] }, args = future.call.arguments) [18:41:48.658] } [18:41:48.658] Tweak future expression to call with '...' arguments ... DONE [18:41:48.659] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.659] [18:41:48.659] getGlobalsAndPackages() ... DONE [18:41:48.659] run() for 'Future' ... [18:41:48.660] - state: 'created' [18:41:48.660] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.676] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.676] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.676] - Field: 'node' [18:41:48.676] - Field: 'label' [18:41:48.676] - Field: 'local' [18:41:48.677] - Field: 'owner' [18:41:48.677] - Field: 'envir' [18:41:48.677] - Field: 'workers' [18:41:48.677] - Field: 'packages' [18:41:48.677] - Field: 'gc' [18:41:48.677] - Field: 'conditions' [18:41:48.678] - Field: 'persistent' [18:41:48.678] - Field: 'expr' [18:41:48.678] - Field: 'uuid' [18:41:48.678] - Field: 'seed' [18:41:48.678] - Field: 'version' [18:41:48.679] - Field: 'result' [18:41:48.679] - Field: 'asynchronous' [18:41:48.679] - Field: 'calls' [18:41:48.679] - Field: 'globals' [18:41:48.679] - Field: 'stdout' [18:41:48.679] - Field: 'earlySignal' [18:41:48.680] - Field: 'lazy' [18:41:48.680] - Field: 'state' [18:41:48.680] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.680] - Launch lazy future ... [18:41:48.681] Packages needed by the future expression (n = 0): [18:41:48.681] Packages needed by future strategies (n = 0): [18:41:48.681] { [18:41:48.681] { [18:41:48.681] { [18:41:48.681] ...future.startTime <- base::Sys.time() [18:41:48.681] { [18:41:48.681] { [18:41:48.681] { [18:41:48.681] { [18:41:48.681] base::local({ [18:41:48.681] has_future <- base::requireNamespace("future", [18:41:48.681] quietly = TRUE) [18:41:48.681] if (has_future) { [18:41:48.681] ns <- base::getNamespace("future") [18:41:48.681] version <- ns[[".package"]][["version"]] [18:41:48.681] if (is.null(version)) [18:41:48.681] version <- utils::packageVersion("future") [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] version <- NULL [18:41:48.681] } [18:41:48.681] if (!has_future || version < "1.8.0") { [18:41:48.681] info <- base::c(r_version = base::gsub("R version ", [18:41:48.681] "", base::R.version$version.string), [18:41:48.681] platform = base::sprintf("%s (%s-bit)", [18:41:48.681] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.681] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.681] "release", "version")], collapse = " "), [18:41:48.681] hostname = base::Sys.info()[["nodename"]]) [18:41:48.681] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.681] info) [18:41:48.681] info <- base::paste(info, collapse = "; ") [18:41:48.681] if (!has_future) { [18:41:48.681] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.681] info) [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.681] info, version) [18:41:48.681] } [18:41:48.681] base::stop(msg) [18:41:48.681] } [18:41:48.681] }) [18:41:48.681] } [18:41:48.681] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.681] base::options(mc.cores = 1L) [18:41:48.681] } [18:41:48.681] ...future.strategy.old <- future::plan("list") [18:41:48.681] options(future.plan = NULL) [18:41:48.681] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.681] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.681] } [18:41:48.681] ...future.workdir <- getwd() [18:41:48.681] } [18:41:48.681] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.681] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.681] } [18:41:48.681] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.681] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.681] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.681] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.681] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.681] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.681] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.681] base::names(...future.oldOptions)) [18:41:48.681] } [18:41:48.681] if (FALSE) { [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] if (TRUE) { [18:41:48.681] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.681] open = "w") [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.681] windows = "NUL", "/dev/null"), open = "w") [18:41:48.681] } [18:41:48.681] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.681] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.681] base::sink(type = "output", split = FALSE) [18:41:48.681] base::close(...future.stdout) [18:41:48.681] }, add = TRUE) [18:41:48.681] } [18:41:48.681] ...future.frame <- base::sys.nframe() [18:41:48.681] ...future.conditions <- base::list() [18:41:48.681] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.681] if (FALSE) { [18:41:48.681] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.681] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.681] } [18:41:48.681] ...future.result <- base::tryCatch({ [18:41:48.681] base::withCallingHandlers({ [18:41:48.681] ...future.value <- base::withVisible(base::local({ [18:41:48.681] ...future.makeSendCondition <- base::local({ [18:41:48.681] sendCondition <- NULL [18:41:48.681] function(frame = 1L) { [18:41:48.681] if (is.function(sendCondition)) [18:41:48.681] return(sendCondition) [18:41:48.681] ns <- getNamespace("parallel") [18:41:48.681] if (exists("sendData", mode = "function", [18:41:48.681] envir = ns)) { [18:41:48.681] parallel_sendData <- get("sendData", mode = "function", [18:41:48.681] envir = ns) [18:41:48.681] envir <- sys.frame(frame) [18:41:48.681] master <- NULL [18:41:48.681] while (!identical(envir, .GlobalEnv) && [18:41:48.681] !identical(envir, emptyenv())) { [18:41:48.681] if (exists("master", mode = "list", envir = envir, [18:41:48.681] inherits = FALSE)) { [18:41:48.681] master <- get("master", mode = "list", [18:41:48.681] envir = envir, inherits = FALSE) [18:41:48.681] if (inherits(master, c("SOCKnode", [18:41:48.681] "SOCK0node"))) { [18:41:48.681] sendCondition <<- function(cond) { [18:41:48.681] data <- list(type = "VALUE", value = cond, [18:41:48.681] success = TRUE) [18:41:48.681] parallel_sendData(master, data) [18:41:48.681] } [18:41:48.681] return(sendCondition) [18:41:48.681] } [18:41:48.681] } [18:41:48.681] frame <- frame + 1L [18:41:48.681] envir <- sys.frame(frame) [18:41:48.681] } [18:41:48.681] } [18:41:48.681] sendCondition <<- function(cond) NULL [18:41:48.681] } [18:41:48.681] }) [18:41:48.681] withCallingHandlers({ [18:41:48.681] { [18:41:48.681] do.call(function(...) { [18:41:48.681] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.681] if (!identical(...future.globals.maxSize.org, [18:41:48.681] ...future.globals.maxSize)) { [18:41:48.681] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.681] on.exit(options(oopts), add = TRUE) [18:41:48.681] } [18:41:48.681] { [18:41:48.681] lapply(seq_along(...future.elements_ii), [18:41:48.681] FUN = function(jj) { [18:41:48.681] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.681] ...future.FUN(...future.X_jj, ...) [18:41:48.681] }) [18:41:48.681] } [18:41:48.681] }, args = future.call.arguments) [18:41:48.681] } [18:41:48.681] }, immediateCondition = function(cond) { [18:41:48.681] sendCondition <- ...future.makeSendCondition() [18:41:48.681] sendCondition(cond) [18:41:48.681] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.681] { [18:41:48.681] inherits <- base::inherits [18:41:48.681] invokeRestart <- base::invokeRestart [18:41:48.681] is.null <- base::is.null [18:41:48.681] muffled <- FALSE [18:41:48.681] if (inherits(cond, "message")) { [18:41:48.681] muffled <- grepl(pattern, "muffleMessage") [18:41:48.681] if (muffled) [18:41:48.681] invokeRestart("muffleMessage") [18:41:48.681] } [18:41:48.681] else if (inherits(cond, "warning")) { [18:41:48.681] muffled <- grepl(pattern, "muffleWarning") [18:41:48.681] if (muffled) [18:41:48.681] invokeRestart("muffleWarning") [18:41:48.681] } [18:41:48.681] else if (inherits(cond, "condition")) { [18:41:48.681] if (!is.null(pattern)) { [18:41:48.681] computeRestarts <- base::computeRestarts [18:41:48.681] grepl <- base::grepl [18:41:48.681] restarts <- computeRestarts(cond) [18:41:48.681] for (restart in restarts) { [18:41:48.681] name <- restart$name [18:41:48.681] if (is.null(name)) [18:41:48.681] next [18:41:48.681] if (!grepl(pattern, name)) [18:41:48.681] next [18:41:48.681] invokeRestart(restart) [18:41:48.681] muffled <- TRUE [18:41:48.681] break [18:41:48.681] } [18:41:48.681] } [18:41:48.681] } [18:41:48.681] invisible(muffled) [18:41:48.681] } [18:41:48.681] muffleCondition(cond) [18:41:48.681] }) [18:41:48.681] })) [18:41:48.681] future::FutureResult(value = ...future.value$value, [18:41:48.681] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.681] ...future.rng), globalenv = if (FALSE) [18:41:48.681] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.681] ...future.globalenv.names)) [18:41:48.681] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.681] }, condition = base::local({ [18:41:48.681] c <- base::c [18:41:48.681] inherits <- base::inherits [18:41:48.681] invokeRestart <- base::invokeRestart [18:41:48.681] length <- base::length [18:41:48.681] list <- base::list [18:41:48.681] seq.int <- base::seq.int [18:41:48.681] signalCondition <- base::signalCondition [18:41:48.681] sys.calls <- base::sys.calls [18:41:48.681] `[[` <- base::`[[` [18:41:48.681] `+` <- base::`+` [18:41:48.681] `<<-` <- base::`<<-` [18:41:48.681] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.681] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.681] 3L)] [18:41:48.681] } [18:41:48.681] function(cond) { [18:41:48.681] is_error <- inherits(cond, "error") [18:41:48.681] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.681] NULL) [18:41:48.681] if (is_error) { [18:41:48.681] sessionInformation <- function() { [18:41:48.681] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.681] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.681] search = base::search(), system = base::Sys.info()) [18:41:48.681] } [18:41:48.681] ...future.conditions[[length(...future.conditions) + [18:41:48.681] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.681] cond$call), session = sessionInformation(), [18:41:48.681] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.681] signalCondition(cond) [18:41:48.681] } [18:41:48.681] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.681] "immediateCondition"))) { [18:41:48.681] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.681] ...future.conditions[[length(...future.conditions) + [18:41:48.681] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.681] if (TRUE && !signal) { [18:41:48.681] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.681] { [18:41:48.681] inherits <- base::inherits [18:41:48.681] invokeRestart <- base::invokeRestart [18:41:48.681] is.null <- base::is.null [18:41:48.681] muffled <- FALSE [18:41:48.681] if (inherits(cond, "message")) { [18:41:48.681] muffled <- grepl(pattern, "muffleMessage") [18:41:48.681] if (muffled) [18:41:48.681] invokeRestart("muffleMessage") [18:41:48.681] } [18:41:48.681] else if (inherits(cond, "warning")) { [18:41:48.681] muffled <- grepl(pattern, "muffleWarning") [18:41:48.681] if (muffled) [18:41:48.681] invokeRestart("muffleWarning") [18:41:48.681] } [18:41:48.681] else if (inherits(cond, "condition")) { [18:41:48.681] if (!is.null(pattern)) { [18:41:48.681] computeRestarts <- base::computeRestarts [18:41:48.681] grepl <- base::grepl [18:41:48.681] restarts <- computeRestarts(cond) [18:41:48.681] for (restart in restarts) { [18:41:48.681] name <- restart$name [18:41:48.681] if (is.null(name)) [18:41:48.681] next [18:41:48.681] if (!grepl(pattern, name)) [18:41:48.681] next [18:41:48.681] invokeRestart(restart) [18:41:48.681] muffled <- TRUE [18:41:48.681] break [18:41:48.681] } [18:41:48.681] } [18:41:48.681] } [18:41:48.681] invisible(muffled) [18:41:48.681] } [18:41:48.681] muffleCondition(cond, pattern = "^muffle") [18:41:48.681] } [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] if (TRUE) { [18:41:48.681] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.681] { [18:41:48.681] inherits <- base::inherits [18:41:48.681] invokeRestart <- base::invokeRestart [18:41:48.681] is.null <- base::is.null [18:41:48.681] muffled <- FALSE [18:41:48.681] if (inherits(cond, "message")) { [18:41:48.681] muffled <- grepl(pattern, "muffleMessage") [18:41:48.681] if (muffled) [18:41:48.681] invokeRestart("muffleMessage") [18:41:48.681] } [18:41:48.681] else if (inherits(cond, "warning")) { [18:41:48.681] muffled <- grepl(pattern, "muffleWarning") [18:41:48.681] if (muffled) [18:41:48.681] invokeRestart("muffleWarning") [18:41:48.681] } [18:41:48.681] else if (inherits(cond, "condition")) { [18:41:48.681] if (!is.null(pattern)) { [18:41:48.681] computeRestarts <- base::computeRestarts [18:41:48.681] grepl <- base::grepl [18:41:48.681] restarts <- computeRestarts(cond) [18:41:48.681] for (restart in restarts) { [18:41:48.681] name <- restart$name [18:41:48.681] if (is.null(name)) [18:41:48.681] next [18:41:48.681] if (!grepl(pattern, name)) [18:41:48.681] next [18:41:48.681] invokeRestart(restart) [18:41:48.681] muffled <- TRUE [18:41:48.681] break [18:41:48.681] } [18:41:48.681] } [18:41:48.681] } [18:41:48.681] invisible(muffled) [18:41:48.681] } [18:41:48.681] muffleCondition(cond, pattern = "^muffle") [18:41:48.681] } [18:41:48.681] } [18:41:48.681] } [18:41:48.681] })) [18:41:48.681] }, error = function(ex) { [18:41:48.681] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.681] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.681] ...future.rng), started = ...future.startTime, [18:41:48.681] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.681] version = "1.8"), class = "FutureResult") [18:41:48.681] }, finally = { [18:41:48.681] if (!identical(...future.workdir, getwd())) [18:41:48.681] setwd(...future.workdir) [18:41:48.681] { [18:41:48.681] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.681] ...future.oldOptions$nwarnings <- NULL [18:41:48.681] } [18:41:48.681] base::options(...future.oldOptions) [18:41:48.681] if (.Platform$OS.type == "windows") { [18:41:48.681] old_names <- names(...future.oldEnvVars) [18:41:48.681] envs <- base::Sys.getenv() [18:41:48.681] names <- names(envs) [18:41:48.681] common <- intersect(names, old_names) [18:41:48.681] added <- setdiff(names, old_names) [18:41:48.681] removed <- setdiff(old_names, names) [18:41:48.681] changed <- common[...future.oldEnvVars[common] != [18:41:48.681] envs[common]] [18:41:48.681] NAMES <- toupper(changed) [18:41:48.681] args <- list() [18:41:48.681] for (kk in seq_along(NAMES)) { [18:41:48.681] name <- changed[[kk]] [18:41:48.681] NAME <- NAMES[[kk]] [18:41:48.681] if (name != NAME && is.element(NAME, old_names)) [18:41:48.681] next [18:41:48.681] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.681] } [18:41:48.681] NAMES <- toupper(added) [18:41:48.681] for (kk in seq_along(NAMES)) { [18:41:48.681] name <- added[[kk]] [18:41:48.681] NAME <- NAMES[[kk]] [18:41:48.681] if (name != NAME && is.element(NAME, old_names)) [18:41:48.681] next [18:41:48.681] args[[name]] <- "" [18:41:48.681] } [18:41:48.681] NAMES <- toupper(removed) [18:41:48.681] for (kk in seq_along(NAMES)) { [18:41:48.681] name <- removed[[kk]] [18:41:48.681] NAME <- NAMES[[kk]] [18:41:48.681] if (name != NAME && is.element(NAME, old_names)) [18:41:48.681] next [18:41:48.681] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.681] } [18:41:48.681] if (length(args) > 0) [18:41:48.681] base::do.call(base::Sys.setenv, args = args) [18:41:48.681] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.681] } [18:41:48.681] { [18:41:48.681] if (base::length(...future.futureOptionsAdded) > [18:41:48.681] 0L) { [18:41:48.681] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.681] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.681] base::options(opts) [18:41:48.681] } [18:41:48.681] { [18:41:48.681] { [18:41:48.681] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.681] NULL [18:41:48.681] } [18:41:48.681] options(future.plan = NULL) [18:41:48.681] if (is.na(NA_character_)) [18:41:48.681] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.681] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.681] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.681] .init = FALSE) [18:41:48.681] } [18:41:48.681] } [18:41:48.681] } [18:41:48.681] }) [18:41:48.681] if (TRUE) { [18:41:48.681] base::sink(type = "output", split = FALSE) [18:41:48.681] if (TRUE) { [18:41:48.681] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.681] } [18:41:48.681] else { [18:41:48.681] ...future.result["stdout"] <- base::list(NULL) [18:41:48.681] } [18:41:48.681] base::close(...future.stdout) [18:41:48.681] ...future.stdout <- NULL [18:41:48.681] } [18:41:48.681] ...future.result$conditions <- ...future.conditions [18:41:48.681] ...future.result$finished <- base::Sys.time() [18:41:48.681] ...future.result [18:41:48.681] } [18:41:48.687] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:48.687] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:48.687] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:48.688] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.688] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.688] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:48.689] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:48.689] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.689] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.690] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.690] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.690] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:48.691] MultisessionFuture started [18:41:48.691] - Launch lazy future ... done [18:41:48.691] run() for 'MultisessionFuture' ... done [18:41:48.692] Created future: [18:41:48.705] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.705] - Validating connection of MultisessionFuture [18:41:48.705] - received message: FutureResult [18:41:48.705] - Received FutureResult [18:41:48.706] - Erased future from FutureRegistry [18:41:48.706] result() for ClusterFuture ... [18:41:48.706] - result already collected: FutureResult [18:41:48.706] result() for ClusterFuture ... done [18:41:48.706] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.692] MultisessionFuture: [18:41:48.692] Label: 'future_sapply-2' [18:41:48.692] Expression: [18:41:48.692] { [18:41:48.692] do.call(function(...) { [18:41:48.692] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.692] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.692] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.692] on.exit(options(oopts), add = TRUE) [18:41:48.692] } [18:41:48.692] { [18:41:48.692] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.692] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.692] ...future.FUN(...future.X_jj, ...) [18:41:48.692] }) [18:41:48.692] } [18:41:48.692] }, args = future.call.arguments) [18:41:48.692] } [18:41:48.692] Lazy evaluation: FALSE [18:41:48.692] Asynchronous evaluation: TRUE [18:41:48.692] Local evaluation: TRUE [18:41:48.692] Environment: R_GlobalEnv [18:41:48.692] Capture standard output: TRUE [18:41:48.692] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.692] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.692] Packages: [18:41:48.692] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.692] Resolved: TRUE [18:41:48.692] Value: [18:41:48.692] Conditions captured: [18:41:48.692] Early signaling: FALSE [18:41:48.692] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.692] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.707] Chunk #2 of 2 ... DONE [18:41:48.707] Launching 2 futures (chunks) ... DONE [18:41:48.707] Resolving 2 futures (chunks) ... [18:41:48.707] resolve() on list ... [18:41:48.707] recursive: 0 [18:41:48.707] length: 2 [18:41:48.708] [18:41:48.708] Future #1 [18:41:48.708] result() for ClusterFuture ... [18:41:48.708] - result already collected: FutureResult [18:41:48.708] result() for ClusterFuture ... done [18:41:48.708] result() for ClusterFuture ... [18:41:48.709] - result already collected: FutureResult [18:41:48.709] result() for ClusterFuture ... done [18:41:48.709] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:48.709] - nx: 2 [18:41:48.709] - relay: TRUE [18:41:48.709] - stdout: TRUE [18:41:48.710] - signal: TRUE [18:41:48.710] - resignal: FALSE [18:41:48.710] - force: TRUE [18:41:48.710] - relayed: [n=2] FALSE, FALSE [18:41:48.710] - queued futures: [n=2] FALSE, FALSE [18:41:48.710] - until=1 [18:41:48.711] - relaying element #1 [18:41:48.711] result() for ClusterFuture ... [18:41:48.711] - result already collected: FutureResult [18:41:48.711] result() for ClusterFuture ... done [18:41:48.711] result() for ClusterFuture ... [18:41:48.711] - result already collected: FutureResult [18:41:48.712] result() for ClusterFuture ... done [18:41:48.712] result() for ClusterFuture ... [18:41:48.712] - result already collected: FutureResult [18:41:48.712] result() for ClusterFuture ... done [18:41:48.712] result() for ClusterFuture ... [18:41:48.712] - result already collected: FutureResult [18:41:48.713] result() for ClusterFuture ... done [18:41:48.713] - relayed: [n=2] TRUE, FALSE [18:41:48.713] - queued futures: [n=2] TRUE, FALSE [18:41:48.713] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:48.713] length: 1 (resolved future 1) [18:41:48.713] Future #2 [18:41:48.714] result() for ClusterFuture ... [18:41:48.714] - result already collected: FutureResult [18:41:48.714] result() for ClusterFuture ... done [18:41:48.714] result() for ClusterFuture ... [18:41:48.714] - result already collected: FutureResult [18:41:48.714] result() for ClusterFuture ... done [18:41:48.715] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:48.715] - nx: 2 [18:41:48.715] - relay: TRUE [18:41:48.715] - stdout: TRUE [18:41:48.715] - signal: TRUE [18:41:48.715] - resignal: FALSE [18:41:48.715] - force: TRUE [18:41:48.716] - relayed: [n=2] TRUE, FALSE [18:41:48.716] - queued futures: [n=2] TRUE, FALSE [18:41:48.716] - until=2 [18:41:48.716] - relaying element #2 [18:41:48.716] result() for ClusterFuture ... [18:41:48.716] - result already collected: FutureResult [18:41:48.717] result() for ClusterFuture ... done [18:41:48.717] result() for ClusterFuture ... [18:41:48.717] - result already collected: FutureResult [18:41:48.717] result() for ClusterFuture ... done [18:41:48.717] result() for ClusterFuture ... [18:41:48.717] - result already collected: FutureResult [18:41:48.718] result() for ClusterFuture ... done [18:41:48.718] result() for ClusterFuture ... [18:41:48.718] - result already collected: FutureResult [18:41:48.718] result() for ClusterFuture ... done [18:41:48.718] - relayed: [n=2] TRUE, TRUE [18:41:48.718] - queued futures: [n=2] TRUE, TRUE [18:41:48.718] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:48.719] length: 0 (resolved future 2) [18:41:48.719] Relaying remaining futures [18:41:48.719] signalConditionsASAP(NULL, pos=0) ... [18:41:48.719] - nx: 2 [18:41:48.719] - relay: TRUE [18:41:48.719] - stdout: TRUE [18:41:48.720] - signal: TRUE [18:41:48.720] - resignal: FALSE [18:41:48.720] - force: TRUE [18:41:48.720] - relayed: [n=2] TRUE, TRUE [18:41:48.720] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:48.720] - relayed: [n=2] TRUE, TRUE [18:41:48.721] - queued futures: [n=2] TRUE, TRUE [18:41:48.721] signalConditionsASAP(NULL, pos=0) ... done [18:41:48.721] resolve() on list ... DONE [18:41:48.721] result() for ClusterFuture ... [18:41:48.721] - result already collected: FutureResult [18:41:48.721] result() for ClusterFuture ... done [18:41:48.722] result() for ClusterFuture ... [18:41:48.722] - result already collected: FutureResult [18:41:48.722] result() for ClusterFuture ... done [18:41:48.722] result() for ClusterFuture ... [18:41:48.722] - result already collected: FutureResult [18:41:48.722] result() for ClusterFuture ... done [18:41:48.723] result() for ClusterFuture ... [18:41:48.723] - result already collected: FutureResult [18:41:48.723] result() for ClusterFuture ... done [18:41:48.723] - Number of value chunks collected: 2 [18:41:48.723] Resolving 2 futures (chunks) ... DONE [18:41:48.723] Reducing values from 2 chunks ... [18:41:48.723] - Number of values collected after concatenation: 3 [18:41:48.724] - Number of values expected: 3 [18:41:48.724] Reducing values from 2 chunks ... DONE [18:41:48.724] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y1:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... List of 2 $ y0:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... $ y2:List of 3 ..$ a: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ b: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ c: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... [18:41:48.734] future_lapply() ... [18:41:48.737] Number of chunks: 2 [18:41:48.737] getGlobalsAndPackagesXApply() ... [18:41:48.738] - future.globals: TRUE [18:41:48.738] getGlobalsAndPackages() ... [18:41:48.738] Searching for globals... [18:41:48.739] - globals found: [1] 'FUN' [18:41:48.740] Searching for globals ... DONE [18:41:48.740] Resolving globals: FALSE [18:41:48.740] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:48.741] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:48.741] - globals: [1] 'FUN' [18:41:48.741] [18:41:48.741] getGlobalsAndPackages() ... DONE [18:41:48.741] - globals found/used: [n=1] 'FUN' [18:41:48.741] - needed namespaces: [n=0] [18:41:48.742] Finding globals ... DONE [18:41:48.742] - use_args: TRUE [18:41:48.742] - Getting '...' globals ... [18:41:48.742] resolve() on list ... [18:41:48.742] recursive: 0 [18:41:48.743] length: 1 [18:41:48.743] elements: '...' [18:41:48.743] length: 0 (resolved future 1) [18:41:48.743] resolve() on list ... DONE [18:41:48.743] - '...' content: [n=0] [18:41:48.744] List of 1 [18:41:48.744] $ ...: list() [18:41:48.744] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.744] - attr(*, "where")=List of 1 [18:41:48.744] ..$ ...: [18:41:48.744] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.744] - attr(*, "resolved")= logi TRUE [18:41:48.744] - attr(*, "total_size")= num NA [18:41:48.746] - Getting '...' globals ... DONE [18:41:48.747] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:48.747] List of 2 [18:41:48.747] $ ...future.FUN:function (x) [18:41:48.747] $ ... : list() [18:41:48.747] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.747] - attr(*, "where")=List of 2 [18:41:48.747] ..$ ...future.FUN: [18:41:48.747] ..$ ... : [18:41:48.747] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.747] - attr(*, "resolved")= logi FALSE [18:41:48.747] - attr(*, "total_size")= int 4876 [18:41:48.750] Packages to be attached in all futures: [n=0] [18:41:48.750] getGlobalsAndPackagesXApply() ... DONE [18:41:48.751] Number of futures (= number of chunks): 2 [18:41:48.751] Launching 2 futures (chunks) ... [18:41:48.751] Chunk #1 of 2 ... [18:41:48.751] - Finding globals in 'X' for chunk #1 ... [18:41:48.751] getGlobalsAndPackages() ... [18:41:48.751] Searching for globals... [18:41:48.752] [18:41:48.752] Searching for globals ... DONE [18:41:48.752] - globals: [0] [18:41:48.752] getGlobalsAndPackages() ... DONE [18:41:48.752] + additional globals found: [n=0] [18:41:48.753] + additional namespaces needed: [n=0] [18:41:48.753] - Finding globals in 'X' for chunk #1 ... DONE [18:41:48.753] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.753] - seeds: [18:41:48.753] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.753] getGlobalsAndPackages() ... [18:41:48.753] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.754] Resolving globals: FALSE [18:41:48.754] Tweak future expression to call with '...' arguments ... [18:41:48.754] { [18:41:48.754] do.call(function(...) { [18:41:48.754] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.754] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.754] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.754] on.exit(options(oopts), add = TRUE) [18:41:48.754] } [18:41:48.754] { [18:41:48.754] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.754] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.754] ...future.FUN(...future.X_jj, ...) [18:41:48.754] }) [18:41:48.754] } [18:41:48.754] }, args = future.call.arguments) [18:41:48.754] } [18:41:48.755] Tweak future expression to call with '...' arguments ... DONE [18:41:48.756] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.756] [18:41:48.757] getGlobalsAndPackages() ... DONE [18:41:48.757] run() for 'Future' ... [18:41:48.757] - state: 'created' [18:41:48.758] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.774] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.775] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.775] - Field: 'node' [18:41:48.775] - Field: 'label' [18:41:48.775] - Field: 'local' [18:41:48.775] - Field: 'owner' [18:41:48.776] - Field: 'envir' [18:41:48.776] - Field: 'workers' [18:41:48.776] - Field: 'packages' [18:41:48.776] - Field: 'gc' [18:41:48.776] - Field: 'conditions' [18:41:48.776] - Field: 'persistent' [18:41:48.777] - Field: 'expr' [18:41:48.777] - Field: 'uuid' [18:41:48.777] - Field: 'seed' [18:41:48.777] - Field: 'version' [18:41:48.777] - Field: 'result' [18:41:48.777] - Field: 'asynchronous' [18:41:48.778] - Field: 'calls' [18:41:48.778] - Field: 'globals' [18:41:48.778] - Field: 'stdout' [18:41:48.778] - Field: 'earlySignal' [18:41:48.778] - Field: 'lazy' [18:41:48.778] - Field: 'state' [18:41:48.779] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.779] - Launch lazy future ... [18:41:48.779] Packages needed by the future expression (n = 0): [18:41:48.779] Packages needed by future strategies (n = 0): [18:41:48.780] { [18:41:48.780] { [18:41:48.780] { [18:41:48.780] ...future.startTime <- base::Sys.time() [18:41:48.780] { [18:41:48.780] { [18:41:48.780] { [18:41:48.780] { [18:41:48.780] base::local({ [18:41:48.780] has_future <- base::requireNamespace("future", [18:41:48.780] quietly = TRUE) [18:41:48.780] if (has_future) { [18:41:48.780] ns <- base::getNamespace("future") [18:41:48.780] version <- ns[[".package"]][["version"]] [18:41:48.780] if (is.null(version)) [18:41:48.780] version <- utils::packageVersion("future") [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] version <- NULL [18:41:48.780] } [18:41:48.780] if (!has_future || version < "1.8.0") { [18:41:48.780] info <- base::c(r_version = base::gsub("R version ", [18:41:48.780] "", base::R.version$version.string), [18:41:48.780] platform = base::sprintf("%s (%s-bit)", [18:41:48.780] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.780] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.780] "release", "version")], collapse = " "), [18:41:48.780] hostname = base::Sys.info()[["nodename"]]) [18:41:48.780] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.780] info) [18:41:48.780] info <- base::paste(info, collapse = "; ") [18:41:48.780] if (!has_future) { [18:41:48.780] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.780] info) [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.780] info, version) [18:41:48.780] } [18:41:48.780] base::stop(msg) [18:41:48.780] } [18:41:48.780] }) [18:41:48.780] } [18:41:48.780] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.780] base::options(mc.cores = 1L) [18:41:48.780] } [18:41:48.780] ...future.strategy.old <- future::plan("list") [18:41:48.780] options(future.plan = NULL) [18:41:48.780] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.780] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.780] } [18:41:48.780] ...future.workdir <- getwd() [18:41:48.780] } [18:41:48.780] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.780] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.780] } [18:41:48.780] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.780] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.780] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.780] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.780] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.780] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.780] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.780] base::names(...future.oldOptions)) [18:41:48.780] } [18:41:48.780] if (FALSE) { [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] if (TRUE) { [18:41:48.780] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.780] open = "w") [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.780] windows = "NUL", "/dev/null"), open = "w") [18:41:48.780] } [18:41:48.780] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.780] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.780] base::sink(type = "output", split = FALSE) [18:41:48.780] base::close(...future.stdout) [18:41:48.780] }, add = TRUE) [18:41:48.780] } [18:41:48.780] ...future.frame <- base::sys.nframe() [18:41:48.780] ...future.conditions <- base::list() [18:41:48.780] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.780] if (FALSE) { [18:41:48.780] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.780] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.780] } [18:41:48.780] ...future.result <- base::tryCatch({ [18:41:48.780] base::withCallingHandlers({ [18:41:48.780] ...future.value <- base::withVisible(base::local({ [18:41:48.780] ...future.makeSendCondition <- base::local({ [18:41:48.780] sendCondition <- NULL [18:41:48.780] function(frame = 1L) { [18:41:48.780] if (is.function(sendCondition)) [18:41:48.780] return(sendCondition) [18:41:48.780] ns <- getNamespace("parallel") [18:41:48.780] if (exists("sendData", mode = "function", [18:41:48.780] envir = ns)) { [18:41:48.780] parallel_sendData <- get("sendData", mode = "function", [18:41:48.780] envir = ns) [18:41:48.780] envir <- sys.frame(frame) [18:41:48.780] master <- NULL [18:41:48.780] while (!identical(envir, .GlobalEnv) && [18:41:48.780] !identical(envir, emptyenv())) { [18:41:48.780] if (exists("master", mode = "list", envir = envir, [18:41:48.780] inherits = FALSE)) { [18:41:48.780] master <- get("master", mode = "list", [18:41:48.780] envir = envir, inherits = FALSE) [18:41:48.780] if (inherits(master, c("SOCKnode", [18:41:48.780] "SOCK0node"))) { [18:41:48.780] sendCondition <<- function(cond) { [18:41:48.780] data <- list(type = "VALUE", value = cond, [18:41:48.780] success = TRUE) [18:41:48.780] parallel_sendData(master, data) [18:41:48.780] } [18:41:48.780] return(sendCondition) [18:41:48.780] } [18:41:48.780] } [18:41:48.780] frame <- frame + 1L [18:41:48.780] envir <- sys.frame(frame) [18:41:48.780] } [18:41:48.780] } [18:41:48.780] sendCondition <<- function(cond) NULL [18:41:48.780] } [18:41:48.780] }) [18:41:48.780] withCallingHandlers({ [18:41:48.780] { [18:41:48.780] do.call(function(...) { [18:41:48.780] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.780] if (!identical(...future.globals.maxSize.org, [18:41:48.780] ...future.globals.maxSize)) { [18:41:48.780] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.780] on.exit(options(oopts), add = TRUE) [18:41:48.780] } [18:41:48.780] { [18:41:48.780] lapply(seq_along(...future.elements_ii), [18:41:48.780] FUN = function(jj) { [18:41:48.780] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.780] ...future.FUN(...future.X_jj, ...) [18:41:48.780] }) [18:41:48.780] } [18:41:48.780] }, args = future.call.arguments) [18:41:48.780] } [18:41:48.780] }, immediateCondition = function(cond) { [18:41:48.780] sendCondition <- ...future.makeSendCondition() [18:41:48.780] sendCondition(cond) [18:41:48.780] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.780] { [18:41:48.780] inherits <- base::inherits [18:41:48.780] invokeRestart <- base::invokeRestart [18:41:48.780] is.null <- base::is.null [18:41:48.780] muffled <- FALSE [18:41:48.780] if (inherits(cond, "message")) { [18:41:48.780] muffled <- grepl(pattern, "muffleMessage") [18:41:48.780] if (muffled) [18:41:48.780] invokeRestart("muffleMessage") [18:41:48.780] } [18:41:48.780] else if (inherits(cond, "warning")) { [18:41:48.780] muffled <- grepl(pattern, "muffleWarning") [18:41:48.780] if (muffled) [18:41:48.780] invokeRestart("muffleWarning") [18:41:48.780] } [18:41:48.780] else if (inherits(cond, "condition")) { [18:41:48.780] if (!is.null(pattern)) { [18:41:48.780] computeRestarts <- base::computeRestarts [18:41:48.780] grepl <- base::grepl [18:41:48.780] restarts <- computeRestarts(cond) [18:41:48.780] for (restart in restarts) { [18:41:48.780] name <- restart$name [18:41:48.780] if (is.null(name)) [18:41:48.780] next [18:41:48.780] if (!grepl(pattern, name)) [18:41:48.780] next [18:41:48.780] invokeRestart(restart) [18:41:48.780] muffled <- TRUE [18:41:48.780] break [18:41:48.780] } [18:41:48.780] } [18:41:48.780] } [18:41:48.780] invisible(muffled) [18:41:48.780] } [18:41:48.780] muffleCondition(cond) [18:41:48.780] }) [18:41:48.780] })) [18:41:48.780] future::FutureResult(value = ...future.value$value, [18:41:48.780] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.780] ...future.rng), globalenv = if (FALSE) [18:41:48.780] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.780] ...future.globalenv.names)) [18:41:48.780] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.780] }, condition = base::local({ [18:41:48.780] c <- base::c [18:41:48.780] inherits <- base::inherits [18:41:48.780] invokeRestart <- base::invokeRestart [18:41:48.780] length <- base::length [18:41:48.780] list <- base::list [18:41:48.780] seq.int <- base::seq.int [18:41:48.780] signalCondition <- base::signalCondition [18:41:48.780] sys.calls <- base::sys.calls [18:41:48.780] `[[` <- base::`[[` [18:41:48.780] `+` <- base::`+` [18:41:48.780] `<<-` <- base::`<<-` [18:41:48.780] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.780] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.780] 3L)] [18:41:48.780] } [18:41:48.780] function(cond) { [18:41:48.780] is_error <- inherits(cond, "error") [18:41:48.780] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.780] NULL) [18:41:48.780] if (is_error) { [18:41:48.780] sessionInformation <- function() { [18:41:48.780] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.780] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.780] search = base::search(), system = base::Sys.info()) [18:41:48.780] } [18:41:48.780] ...future.conditions[[length(...future.conditions) + [18:41:48.780] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.780] cond$call), session = sessionInformation(), [18:41:48.780] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.780] signalCondition(cond) [18:41:48.780] } [18:41:48.780] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.780] "immediateCondition"))) { [18:41:48.780] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.780] ...future.conditions[[length(...future.conditions) + [18:41:48.780] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.780] if (TRUE && !signal) { [18:41:48.780] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.780] { [18:41:48.780] inherits <- base::inherits [18:41:48.780] invokeRestart <- base::invokeRestart [18:41:48.780] is.null <- base::is.null [18:41:48.780] muffled <- FALSE [18:41:48.780] if (inherits(cond, "message")) { [18:41:48.780] muffled <- grepl(pattern, "muffleMessage") [18:41:48.780] if (muffled) [18:41:48.780] invokeRestart("muffleMessage") [18:41:48.780] } [18:41:48.780] else if (inherits(cond, "warning")) { [18:41:48.780] muffled <- grepl(pattern, "muffleWarning") [18:41:48.780] if (muffled) [18:41:48.780] invokeRestart("muffleWarning") [18:41:48.780] } [18:41:48.780] else if (inherits(cond, "condition")) { [18:41:48.780] if (!is.null(pattern)) { [18:41:48.780] computeRestarts <- base::computeRestarts [18:41:48.780] grepl <- base::grepl [18:41:48.780] restarts <- computeRestarts(cond) [18:41:48.780] for (restart in restarts) { [18:41:48.780] name <- restart$name [18:41:48.780] if (is.null(name)) [18:41:48.780] next [18:41:48.780] if (!grepl(pattern, name)) [18:41:48.780] next [18:41:48.780] invokeRestart(restart) [18:41:48.780] muffled <- TRUE [18:41:48.780] break [18:41:48.780] } [18:41:48.780] } [18:41:48.780] } [18:41:48.780] invisible(muffled) [18:41:48.780] } [18:41:48.780] muffleCondition(cond, pattern = "^muffle") [18:41:48.780] } [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] if (TRUE) { [18:41:48.780] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.780] { [18:41:48.780] inherits <- base::inherits [18:41:48.780] invokeRestart <- base::invokeRestart [18:41:48.780] is.null <- base::is.null [18:41:48.780] muffled <- FALSE [18:41:48.780] if (inherits(cond, "message")) { [18:41:48.780] muffled <- grepl(pattern, "muffleMessage") [18:41:48.780] if (muffled) [18:41:48.780] invokeRestart("muffleMessage") [18:41:48.780] } [18:41:48.780] else if (inherits(cond, "warning")) { [18:41:48.780] muffled <- grepl(pattern, "muffleWarning") [18:41:48.780] if (muffled) [18:41:48.780] invokeRestart("muffleWarning") [18:41:48.780] } [18:41:48.780] else if (inherits(cond, "condition")) { [18:41:48.780] if (!is.null(pattern)) { [18:41:48.780] computeRestarts <- base::computeRestarts [18:41:48.780] grepl <- base::grepl [18:41:48.780] restarts <- computeRestarts(cond) [18:41:48.780] for (restart in restarts) { [18:41:48.780] name <- restart$name [18:41:48.780] if (is.null(name)) [18:41:48.780] next [18:41:48.780] if (!grepl(pattern, name)) [18:41:48.780] next [18:41:48.780] invokeRestart(restart) [18:41:48.780] muffled <- TRUE [18:41:48.780] break [18:41:48.780] } [18:41:48.780] } [18:41:48.780] } [18:41:48.780] invisible(muffled) [18:41:48.780] } [18:41:48.780] muffleCondition(cond, pattern = "^muffle") [18:41:48.780] } [18:41:48.780] } [18:41:48.780] } [18:41:48.780] })) [18:41:48.780] }, error = function(ex) { [18:41:48.780] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.780] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.780] ...future.rng), started = ...future.startTime, [18:41:48.780] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.780] version = "1.8"), class = "FutureResult") [18:41:48.780] }, finally = { [18:41:48.780] if (!identical(...future.workdir, getwd())) [18:41:48.780] setwd(...future.workdir) [18:41:48.780] { [18:41:48.780] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.780] ...future.oldOptions$nwarnings <- NULL [18:41:48.780] } [18:41:48.780] base::options(...future.oldOptions) [18:41:48.780] if (.Platform$OS.type == "windows") { [18:41:48.780] old_names <- names(...future.oldEnvVars) [18:41:48.780] envs <- base::Sys.getenv() [18:41:48.780] names <- names(envs) [18:41:48.780] common <- intersect(names, old_names) [18:41:48.780] added <- setdiff(names, old_names) [18:41:48.780] removed <- setdiff(old_names, names) [18:41:48.780] changed <- common[...future.oldEnvVars[common] != [18:41:48.780] envs[common]] [18:41:48.780] NAMES <- toupper(changed) [18:41:48.780] args <- list() [18:41:48.780] for (kk in seq_along(NAMES)) { [18:41:48.780] name <- changed[[kk]] [18:41:48.780] NAME <- NAMES[[kk]] [18:41:48.780] if (name != NAME && is.element(NAME, old_names)) [18:41:48.780] next [18:41:48.780] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.780] } [18:41:48.780] NAMES <- toupper(added) [18:41:48.780] for (kk in seq_along(NAMES)) { [18:41:48.780] name <- added[[kk]] [18:41:48.780] NAME <- NAMES[[kk]] [18:41:48.780] if (name != NAME && is.element(NAME, old_names)) [18:41:48.780] next [18:41:48.780] args[[name]] <- "" [18:41:48.780] } [18:41:48.780] NAMES <- toupper(removed) [18:41:48.780] for (kk in seq_along(NAMES)) { [18:41:48.780] name <- removed[[kk]] [18:41:48.780] NAME <- NAMES[[kk]] [18:41:48.780] if (name != NAME && is.element(NAME, old_names)) [18:41:48.780] next [18:41:48.780] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.780] } [18:41:48.780] if (length(args) > 0) [18:41:48.780] base::do.call(base::Sys.setenv, args = args) [18:41:48.780] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.780] } [18:41:48.780] { [18:41:48.780] if (base::length(...future.futureOptionsAdded) > [18:41:48.780] 0L) { [18:41:48.780] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.780] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.780] base::options(opts) [18:41:48.780] } [18:41:48.780] { [18:41:48.780] { [18:41:48.780] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.780] NULL [18:41:48.780] } [18:41:48.780] options(future.plan = NULL) [18:41:48.780] if (is.na(NA_character_)) [18:41:48.780] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.780] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.780] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.780] .init = FALSE) [18:41:48.780] } [18:41:48.780] } [18:41:48.780] } [18:41:48.780] }) [18:41:48.780] if (TRUE) { [18:41:48.780] base::sink(type = "output", split = FALSE) [18:41:48.780] if (TRUE) { [18:41:48.780] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.780] } [18:41:48.780] else { [18:41:48.780] ...future.result["stdout"] <- base::list(NULL) [18:41:48.780] } [18:41:48.780] base::close(...future.stdout) [18:41:48.780] ...future.stdout <- NULL [18:41:48.780] } [18:41:48.780] ...future.result$conditions <- ...future.conditions [18:41:48.780] ...future.result$finished <- base::Sys.time() [18:41:48.780] ...future.result [18:41:48.780] } [18:41:48.785] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:48.785] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:48.786] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:48.786] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.786] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.787] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:48.787] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:48.787] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.788] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.788] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.788] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.788] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:48.789] MultisessionFuture started [18:41:48.789] - Launch lazy future ... done [18:41:48.789] run() for 'MultisessionFuture' ... done [18:41:48.790] Created future: [18:41:48.823] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.823] - Validating connection of MultisessionFuture [18:41:48.823] - received message: FutureResult [18:41:48.824] - Received FutureResult [18:41:48.824] - Erased future from FutureRegistry [18:41:48.824] result() for ClusterFuture ... [18:41:48.824] - result already collected: FutureResult [18:41:48.824] result() for ClusterFuture ... done [18:41:48.824] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.790] MultisessionFuture: [18:41:48.790] Label: 'future_sapply-1' [18:41:48.790] Expression: [18:41:48.790] { [18:41:48.790] do.call(function(...) { [18:41:48.790] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.790] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.790] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.790] on.exit(options(oopts), add = TRUE) [18:41:48.790] } [18:41:48.790] { [18:41:48.790] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.790] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.790] ...future.FUN(...future.X_jj, ...) [18:41:48.790] }) [18:41:48.790] } [18:41:48.790] }, args = future.call.arguments) [18:41:48.790] } [18:41:48.790] Lazy evaluation: FALSE [18:41:48.790] Asynchronous evaluation: TRUE [18:41:48.790] Local evaluation: TRUE [18:41:48.790] Environment: R_GlobalEnv [18:41:48.790] Capture standard output: TRUE [18:41:48.790] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.790] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.790] Packages: [18:41:48.790] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.790] Resolved: TRUE [18:41:48.790] Value: [18:41:48.790] Conditions captured: [18:41:48.790] Early signaling: FALSE [18:41:48.790] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.790] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.825] Chunk #1 of 2 ... DONE [18:41:48.825] Chunk #2 of 2 ... [18:41:48.825] - Finding globals in 'X' for chunk #2 ... [18:41:48.825] getGlobalsAndPackages() ... [18:41:48.826] Searching for globals... [18:41:48.826] [18:41:48.826] Searching for globals ... DONE [18:41:48.826] - globals: [0] [18:41:48.826] getGlobalsAndPackages() ... DONE [18:41:48.826] + additional globals found: [n=0] [18:41:48.827] + additional namespaces needed: [n=0] [18:41:48.827] - Finding globals in 'X' for chunk #2 ... DONE [18:41:48.827] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.827] - seeds: [18:41:48.827] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.827] getGlobalsAndPackages() ... [18:41:48.828] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.828] Resolving globals: FALSE [18:41:48.828] Tweak future expression to call with '...' arguments ... [18:41:48.828] { [18:41:48.828] do.call(function(...) { [18:41:48.828] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.828] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.828] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.828] on.exit(options(oopts), add = TRUE) [18:41:48.828] } [18:41:48.828] { [18:41:48.828] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.828] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.828] ...future.FUN(...future.X_jj, ...) [18:41:48.828] }) [18:41:48.828] } [18:41:48.828] }, args = future.call.arguments) [18:41:48.828] } [18:41:48.829] Tweak future expression to call with '...' arguments ... DONE [18:41:48.829] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.829] [18:41:48.829] getGlobalsAndPackages() ... DONE [18:41:48.830] run() for 'Future' ... [18:41:48.830] - state: 'created' [18:41:48.830] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.845] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.846] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.846] - Field: 'node' [18:41:48.846] - Field: 'label' [18:41:48.846] - Field: 'local' [18:41:48.846] - Field: 'owner' [18:41:48.846] - Field: 'envir' [18:41:48.847] - Field: 'workers' [18:41:48.847] - Field: 'packages' [18:41:48.847] - Field: 'gc' [18:41:48.847] - Field: 'conditions' [18:41:48.847] - Field: 'persistent' [18:41:48.848] - Field: 'expr' [18:41:48.848] - Field: 'uuid' [18:41:48.848] - Field: 'seed' [18:41:48.848] - Field: 'version' [18:41:48.848] - Field: 'result' [18:41:48.848] - Field: 'asynchronous' [18:41:48.849] - Field: 'calls' [18:41:48.849] - Field: 'globals' [18:41:48.849] - Field: 'stdout' [18:41:48.849] - Field: 'earlySignal' [18:41:48.849] - Field: 'lazy' [18:41:48.849] - Field: 'state' [18:41:48.850] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.850] - Launch lazy future ... [18:41:48.850] Packages needed by the future expression (n = 0): [18:41:48.851] Packages needed by future strategies (n = 0): [18:41:48.851] { [18:41:48.851] { [18:41:48.851] { [18:41:48.851] ...future.startTime <- base::Sys.time() [18:41:48.851] { [18:41:48.851] { [18:41:48.851] { [18:41:48.851] { [18:41:48.851] base::local({ [18:41:48.851] has_future <- base::requireNamespace("future", [18:41:48.851] quietly = TRUE) [18:41:48.851] if (has_future) { [18:41:48.851] ns <- base::getNamespace("future") [18:41:48.851] version <- ns[[".package"]][["version"]] [18:41:48.851] if (is.null(version)) [18:41:48.851] version <- utils::packageVersion("future") [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] version <- NULL [18:41:48.851] } [18:41:48.851] if (!has_future || version < "1.8.0") { [18:41:48.851] info <- base::c(r_version = base::gsub("R version ", [18:41:48.851] "", base::R.version$version.string), [18:41:48.851] platform = base::sprintf("%s (%s-bit)", [18:41:48.851] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.851] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.851] "release", "version")], collapse = " "), [18:41:48.851] hostname = base::Sys.info()[["nodename"]]) [18:41:48.851] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.851] info) [18:41:48.851] info <- base::paste(info, collapse = "; ") [18:41:48.851] if (!has_future) { [18:41:48.851] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.851] info) [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.851] info, version) [18:41:48.851] } [18:41:48.851] base::stop(msg) [18:41:48.851] } [18:41:48.851] }) [18:41:48.851] } [18:41:48.851] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.851] base::options(mc.cores = 1L) [18:41:48.851] } [18:41:48.851] ...future.strategy.old <- future::plan("list") [18:41:48.851] options(future.plan = NULL) [18:41:48.851] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.851] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.851] } [18:41:48.851] ...future.workdir <- getwd() [18:41:48.851] } [18:41:48.851] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.851] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.851] } [18:41:48.851] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.851] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.851] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.851] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.851] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.851] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.851] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.851] base::names(...future.oldOptions)) [18:41:48.851] } [18:41:48.851] if (FALSE) { [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] if (TRUE) { [18:41:48.851] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.851] open = "w") [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.851] windows = "NUL", "/dev/null"), open = "w") [18:41:48.851] } [18:41:48.851] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.851] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.851] base::sink(type = "output", split = FALSE) [18:41:48.851] base::close(...future.stdout) [18:41:48.851] }, add = TRUE) [18:41:48.851] } [18:41:48.851] ...future.frame <- base::sys.nframe() [18:41:48.851] ...future.conditions <- base::list() [18:41:48.851] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.851] if (FALSE) { [18:41:48.851] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.851] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.851] } [18:41:48.851] ...future.result <- base::tryCatch({ [18:41:48.851] base::withCallingHandlers({ [18:41:48.851] ...future.value <- base::withVisible(base::local({ [18:41:48.851] ...future.makeSendCondition <- base::local({ [18:41:48.851] sendCondition <- NULL [18:41:48.851] function(frame = 1L) { [18:41:48.851] if (is.function(sendCondition)) [18:41:48.851] return(sendCondition) [18:41:48.851] ns <- getNamespace("parallel") [18:41:48.851] if (exists("sendData", mode = "function", [18:41:48.851] envir = ns)) { [18:41:48.851] parallel_sendData <- get("sendData", mode = "function", [18:41:48.851] envir = ns) [18:41:48.851] envir <- sys.frame(frame) [18:41:48.851] master <- NULL [18:41:48.851] while (!identical(envir, .GlobalEnv) && [18:41:48.851] !identical(envir, emptyenv())) { [18:41:48.851] if (exists("master", mode = "list", envir = envir, [18:41:48.851] inherits = FALSE)) { [18:41:48.851] master <- get("master", mode = "list", [18:41:48.851] envir = envir, inherits = FALSE) [18:41:48.851] if (inherits(master, c("SOCKnode", [18:41:48.851] "SOCK0node"))) { [18:41:48.851] sendCondition <<- function(cond) { [18:41:48.851] data <- list(type = "VALUE", value = cond, [18:41:48.851] success = TRUE) [18:41:48.851] parallel_sendData(master, data) [18:41:48.851] } [18:41:48.851] return(sendCondition) [18:41:48.851] } [18:41:48.851] } [18:41:48.851] frame <- frame + 1L [18:41:48.851] envir <- sys.frame(frame) [18:41:48.851] } [18:41:48.851] } [18:41:48.851] sendCondition <<- function(cond) NULL [18:41:48.851] } [18:41:48.851] }) [18:41:48.851] withCallingHandlers({ [18:41:48.851] { [18:41:48.851] do.call(function(...) { [18:41:48.851] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.851] if (!identical(...future.globals.maxSize.org, [18:41:48.851] ...future.globals.maxSize)) { [18:41:48.851] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.851] on.exit(options(oopts), add = TRUE) [18:41:48.851] } [18:41:48.851] { [18:41:48.851] lapply(seq_along(...future.elements_ii), [18:41:48.851] FUN = function(jj) { [18:41:48.851] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.851] ...future.FUN(...future.X_jj, ...) [18:41:48.851] }) [18:41:48.851] } [18:41:48.851] }, args = future.call.arguments) [18:41:48.851] } [18:41:48.851] }, immediateCondition = function(cond) { [18:41:48.851] sendCondition <- ...future.makeSendCondition() [18:41:48.851] sendCondition(cond) [18:41:48.851] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.851] { [18:41:48.851] inherits <- base::inherits [18:41:48.851] invokeRestart <- base::invokeRestart [18:41:48.851] is.null <- base::is.null [18:41:48.851] muffled <- FALSE [18:41:48.851] if (inherits(cond, "message")) { [18:41:48.851] muffled <- grepl(pattern, "muffleMessage") [18:41:48.851] if (muffled) [18:41:48.851] invokeRestart("muffleMessage") [18:41:48.851] } [18:41:48.851] else if (inherits(cond, "warning")) { [18:41:48.851] muffled <- grepl(pattern, "muffleWarning") [18:41:48.851] if (muffled) [18:41:48.851] invokeRestart("muffleWarning") [18:41:48.851] } [18:41:48.851] else if (inherits(cond, "condition")) { [18:41:48.851] if (!is.null(pattern)) { [18:41:48.851] computeRestarts <- base::computeRestarts [18:41:48.851] grepl <- base::grepl [18:41:48.851] restarts <- computeRestarts(cond) [18:41:48.851] for (restart in restarts) { [18:41:48.851] name <- restart$name [18:41:48.851] if (is.null(name)) [18:41:48.851] next [18:41:48.851] if (!grepl(pattern, name)) [18:41:48.851] next [18:41:48.851] invokeRestart(restart) [18:41:48.851] muffled <- TRUE [18:41:48.851] break [18:41:48.851] } [18:41:48.851] } [18:41:48.851] } [18:41:48.851] invisible(muffled) [18:41:48.851] } [18:41:48.851] muffleCondition(cond) [18:41:48.851] }) [18:41:48.851] })) [18:41:48.851] future::FutureResult(value = ...future.value$value, [18:41:48.851] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.851] ...future.rng), globalenv = if (FALSE) [18:41:48.851] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.851] ...future.globalenv.names)) [18:41:48.851] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.851] }, condition = base::local({ [18:41:48.851] c <- base::c [18:41:48.851] inherits <- base::inherits [18:41:48.851] invokeRestart <- base::invokeRestart [18:41:48.851] length <- base::length [18:41:48.851] list <- base::list [18:41:48.851] seq.int <- base::seq.int [18:41:48.851] signalCondition <- base::signalCondition [18:41:48.851] sys.calls <- base::sys.calls [18:41:48.851] `[[` <- base::`[[` [18:41:48.851] `+` <- base::`+` [18:41:48.851] `<<-` <- base::`<<-` [18:41:48.851] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.851] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.851] 3L)] [18:41:48.851] } [18:41:48.851] function(cond) { [18:41:48.851] is_error <- inherits(cond, "error") [18:41:48.851] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.851] NULL) [18:41:48.851] if (is_error) { [18:41:48.851] sessionInformation <- function() { [18:41:48.851] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.851] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.851] search = base::search(), system = base::Sys.info()) [18:41:48.851] } [18:41:48.851] ...future.conditions[[length(...future.conditions) + [18:41:48.851] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.851] cond$call), session = sessionInformation(), [18:41:48.851] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.851] signalCondition(cond) [18:41:48.851] } [18:41:48.851] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.851] "immediateCondition"))) { [18:41:48.851] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.851] ...future.conditions[[length(...future.conditions) + [18:41:48.851] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.851] if (TRUE && !signal) { [18:41:48.851] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.851] { [18:41:48.851] inherits <- base::inherits [18:41:48.851] invokeRestart <- base::invokeRestart [18:41:48.851] is.null <- base::is.null [18:41:48.851] muffled <- FALSE [18:41:48.851] if (inherits(cond, "message")) { [18:41:48.851] muffled <- grepl(pattern, "muffleMessage") [18:41:48.851] if (muffled) [18:41:48.851] invokeRestart("muffleMessage") [18:41:48.851] } [18:41:48.851] else if (inherits(cond, "warning")) { [18:41:48.851] muffled <- grepl(pattern, "muffleWarning") [18:41:48.851] if (muffled) [18:41:48.851] invokeRestart("muffleWarning") [18:41:48.851] } [18:41:48.851] else if (inherits(cond, "condition")) { [18:41:48.851] if (!is.null(pattern)) { [18:41:48.851] computeRestarts <- base::computeRestarts [18:41:48.851] grepl <- base::grepl [18:41:48.851] restarts <- computeRestarts(cond) [18:41:48.851] for (restart in restarts) { [18:41:48.851] name <- restart$name [18:41:48.851] if (is.null(name)) [18:41:48.851] next [18:41:48.851] if (!grepl(pattern, name)) [18:41:48.851] next [18:41:48.851] invokeRestart(restart) [18:41:48.851] muffled <- TRUE [18:41:48.851] break [18:41:48.851] } [18:41:48.851] } [18:41:48.851] } [18:41:48.851] invisible(muffled) [18:41:48.851] } [18:41:48.851] muffleCondition(cond, pattern = "^muffle") [18:41:48.851] } [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] if (TRUE) { [18:41:48.851] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.851] { [18:41:48.851] inherits <- base::inherits [18:41:48.851] invokeRestart <- base::invokeRestart [18:41:48.851] is.null <- base::is.null [18:41:48.851] muffled <- FALSE [18:41:48.851] if (inherits(cond, "message")) { [18:41:48.851] muffled <- grepl(pattern, "muffleMessage") [18:41:48.851] if (muffled) [18:41:48.851] invokeRestart("muffleMessage") [18:41:48.851] } [18:41:48.851] else if (inherits(cond, "warning")) { [18:41:48.851] muffled <- grepl(pattern, "muffleWarning") [18:41:48.851] if (muffled) [18:41:48.851] invokeRestart("muffleWarning") [18:41:48.851] } [18:41:48.851] else if (inherits(cond, "condition")) { [18:41:48.851] if (!is.null(pattern)) { [18:41:48.851] computeRestarts <- base::computeRestarts [18:41:48.851] grepl <- base::grepl [18:41:48.851] restarts <- computeRestarts(cond) [18:41:48.851] for (restart in restarts) { [18:41:48.851] name <- restart$name [18:41:48.851] if (is.null(name)) [18:41:48.851] next [18:41:48.851] if (!grepl(pattern, name)) [18:41:48.851] next [18:41:48.851] invokeRestart(restart) [18:41:48.851] muffled <- TRUE [18:41:48.851] break [18:41:48.851] } [18:41:48.851] } [18:41:48.851] } [18:41:48.851] invisible(muffled) [18:41:48.851] } [18:41:48.851] muffleCondition(cond, pattern = "^muffle") [18:41:48.851] } [18:41:48.851] } [18:41:48.851] } [18:41:48.851] })) [18:41:48.851] }, error = function(ex) { [18:41:48.851] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.851] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.851] ...future.rng), started = ...future.startTime, [18:41:48.851] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.851] version = "1.8"), class = "FutureResult") [18:41:48.851] }, finally = { [18:41:48.851] if (!identical(...future.workdir, getwd())) [18:41:48.851] setwd(...future.workdir) [18:41:48.851] { [18:41:48.851] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.851] ...future.oldOptions$nwarnings <- NULL [18:41:48.851] } [18:41:48.851] base::options(...future.oldOptions) [18:41:48.851] if (.Platform$OS.type == "windows") { [18:41:48.851] old_names <- names(...future.oldEnvVars) [18:41:48.851] envs <- base::Sys.getenv() [18:41:48.851] names <- names(envs) [18:41:48.851] common <- intersect(names, old_names) [18:41:48.851] added <- setdiff(names, old_names) [18:41:48.851] removed <- setdiff(old_names, names) [18:41:48.851] changed <- common[...future.oldEnvVars[common] != [18:41:48.851] envs[common]] [18:41:48.851] NAMES <- toupper(changed) [18:41:48.851] args <- list() [18:41:48.851] for (kk in seq_along(NAMES)) { [18:41:48.851] name <- changed[[kk]] [18:41:48.851] NAME <- NAMES[[kk]] [18:41:48.851] if (name != NAME && is.element(NAME, old_names)) [18:41:48.851] next [18:41:48.851] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.851] } [18:41:48.851] NAMES <- toupper(added) [18:41:48.851] for (kk in seq_along(NAMES)) { [18:41:48.851] name <- added[[kk]] [18:41:48.851] NAME <- NAMES[[kk]] [18:41:48.851] if (name != NAME && is.element(NAME, old_names)) [18:41:48.851] next [18:41:48.851] args[[name]] <- "" [18:41:48.851] } [18:41:48.851] NAMES <- toupper(removed) [18:41:48.851] for (kk in seq_along(NAMES)) { [18:41:48.851] name <- removed[[kk]] [18:41:48.851] NAME <- NAMES[[kk]] [18:41:48.851] if (name != NAME && is.element(NAME, old_names)) [18:41:48.851] next [18:41:48.851] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.851] } [18:41:48.851] if (length(args) > 0) [18:41:48.851] base::do.call(base::Sys.setenv, args = args) [18:41:48.851] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.851] } [18:41:48.851] { [18:41:48.851] if (base::length(...future.futureOptionsAdded) > [18:41:48.851] 0L) { [18:41:48.851] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.851] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.851] base::options(opts) [18:41:48.851] } [18:41:48.851] { [18:41:48.851] { [18:41:48.851] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.851] NULL [18:41:48.851] } [18:41:48.851] options(future.plan = NULL) [18:41:48.851] if (is.na(NA_character_)) [18:41:48.851] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.851] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.851] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.851] .init = FALSE) [18:41:48.851] } [18:41:48.851] } [18:41:48.851] } [18:41:48.851] }) [18:41:48.851] if (TRUE) { [18:41:48.851] base::sink(type = "output", split = FALSE) [18:41:48.851] if (TRUE) { [18:41:48.851] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.851] } [18:41:48.851] else { [18:41:48.851] ...future.result["stdout"] <- base::list(NULL) [18:41:48.851] } [18:41:48.851] base::close(...future.stdout) [18:41:48.851] ...future.stdout <- NULL [18:41:48.851] } [18:41:48.851] ...future.result$conditions <- ...future.conditions [18:41:48.851] ...future.result$finished <- base::Sys.time() [18:41:48.851] ...future.result [18:41:48.851] } [18:41:48.856] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:48.857] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:48.857] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:48.857] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.858] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.858] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:48.858] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:48.858] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.859] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.859] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.859] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.860] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:48.860] MultisessionFuture started [18:41:48.860] - Launch lazy future ... done [18:41:48.861] run() for 'MultisessionFuture' ... done [18:41:48.861] Created future: [18:41:48.874] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.874] - Validating connection of MultisessionFuture [18:41:48.874] - received message: FutureResult [18:41:48.875] - Received FutureResult [18:41:48.875] - Erased future from FutureRegistry [18:41:48.875] result() for ClusterFuture ... [18:41:48.875] - result already collected: FutureResult [18:41:48.875] result() for ClusterFuture ... done [18:41:48.876] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.861] MultisessionFuture: [18:41:48.861] Label: 'future_sapply-2' [18:41:48.861] Expression: [18:41:48.861] { [18:41:48.861] do.call(function(...) { [18:41:48.861] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.861] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.861] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.861] on.exit(options(oopts), add = TRUE) [18:41:48.861] } [18:41:48.861] { [18:41:48.861] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.861] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.861] ...future.FUN(...future.X_jj, ...) [18:41:48.861] }) [18:41:48.861] } [18:41:48.861] }, args = future.call.arguments) [18:41:48.861] } [18:41:48.861] Lazy evaluation: FALSE [18:41:48.861] Asynchronous evaluation: TRUE [18:41:48.861] Local evaluation: TRUE [18:41:48.861] Environment: R_GlobalEnv [18:41:48.861] Capture standard output: TRUE [18:41:48.861] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.861] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.861] Packages: [18:41:48.861] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.861] Resolved: TRUE [18:41:48.861] Value: [18:41:48.861] Conditions captured: [18:41:48.861] Early signaling: FALSE [18:41:48.861] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.861] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.876] Chunk #2 of 2 ... DONE [18:41:48.876] Launching 2 futures (chunks) ... DONE [18:41:48.876] Resolving 2 futures (chunks) ... [18:41:48.877] resolve() on list ... [18:41:48.877] recursive: 0 [18:41:48.877] length: 2 [18:41:48.877] [18:41:48.877] Future #1 [18:41:48.877] result() for ClusterFuture ... [18:41:48.878] - result already collected: FutureResult [18:41:48.878] result() for ClusterFuture ... done [18:41:48.878] result() for ClusterFuture ... [18:41:48.878] - result already collected: FutureResult [18:41:48.878] result() for ClusterFuture ... done [18:41:48.878] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:48.878] - nx: 2 [18:41:48.879] - relay: TRUE [18:41:48.879] - stdout: TRUE [18:41:48.879] - signal: TRUE [18:41:48.879] - resignal: FALSE [18:41:48.879] - force: TRUE [18:41:48.879] - relayed: [n=2] FALSE, FALSE [18:41:48.880] - queued futures: [n=2] FALSE, FALSE [18:41:48.880] - until=1 [18:41:48.880] - relaying element #1 [18:41:48.880] result() for ClusterFuture ... [18:41:48.880] - result already collected: FutureResult [18:41:48.880] result() for ClusterFuture ... done [18:41:48.881] result() for ClusterFuture ... [18:41:48.881] - result already collected: FutureResult [18:41:48.881] result() for ClusterFuture ... done [18:41:48.881] result() for ClusterFuture ... [18:41:48.881] - result already collected: FutureResult [18:41:48.881] result() for ClusterFuture ... done [18:41:48.882] result() for ClusterFuture ... [18:41:48.882] - result already collected: FutureResult [18:41:48.882] result() for ClusterFuture ... done [18:41:48.882] - relayed: [n=2] TRUE, FALSE [18:41:48.882] - queued futures: [n=2] TRUE, FALSE [18:41:48.882] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:48.883] length: 1 (resolved future 1) [18:41:48.883] Future #2 [18:41:48.883] result() for ClusterFuture ... [18:41:48.883] - result already collected: FutureResult [18:41:48.883] result() for ClusterFuture ... done [18:41:48.884] result() for ClusterFuture ... [18:41:48.884] - result already collected: FutureResult [18:41:48.884] result() for ClusterFuture ... done [18:41:48.884] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:48.884] - nx: 2 [18:41:48.884] - relay: TRUE [18:41:48.884] - stdout: TRUE [18:41:48.885] - signal: TRUE [18:41:48.885] - resignal: FALSE [18:41:48.885] - force: TRUE [18:41:48.885] - relayed: [n=2] TRUE, FALSE [18:41:48.885] - queued futures: [n=2] TRUE, FALSE [18:41:48.885] - until=2 [18:41:48.886] - relaying element #2 [18:41:48.886] result() for ClusterFuture ... [18:41:48.886] - result already collected: FutureResult [18:41:48.886] result() for ClusterFuture ... done [18:41:48.886] result() for ClusterFuture ... [18:41:48.886] - result already collected: FutureResult [18:41:48.886] result() for ClusterFuture ... done [18:41:48.887] result() for ClusterFuture ... [18:41:48.887] - result already collected: FutureResult [18:41:48.887] result() for ClusterFuture ... done [18:41:48.887] result() for ClusterFuture ... [18:41:48.887] - result already collected: FutureResult [18:41:48.887] result() for ClusterFuture ... done [18:41:48.888] - relayed: [n=2] TRUE, TRUE [18:41:48.888] - queued futures: [n=2] TRUE, TRUE [18:41:48.888] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:48.888] length: 0 (resolved future 2) [18:41:48.888] Relaying remaining futures [18:41:48.888] signalConditionsASAP(NULL, pos=0) ... [18:41:48.889] - nx: 2 [18:41:48.889] - relay: TRUE [18:41:48.889] - stdout: TRUE [18:41:48.889] - signal: TRUE [18:41:48.889] - resignal: FALSE [18:41:48.889] - force: TRUE [18:41:48.889] - relayed: [n=2] TRUE, TRUE [18:41:48.890] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:48.890] - relayed: [n=2] TRUE, TRUE [18:41:48.890] - queued futures: [n=2] TRUE, TRUE [18:41:48.890] signalConditionsASAP(NULL, pos=0) ... done [18:41:48.890] resolve() on list ... DONE [18:41:48.890] result() for ClusterFuture ... [18:41:48.891] - result already collected: FutureResult [18:41:48.891] result() for ClusterFuture ... done [18:41:48.891] result() for ClusterFuture ... [18:41:48.891] - result already collected: FutureResult [18:41:48.891] result() for ClusterFuture ... done [18:41:48.891] result() for ClusterFuture ... [18:41:48.892] - result already collected: FutureResult [18:41:48.892] result() for ClusterFuture ... done [18:41:48.892] result() for ClusterFuture ... [18:41:48.892] - result already collected: FutureResult [18:41:48.892] result() for ClusterFuture ... done [18:41:48.892] - Number of value chunks collected: 2 [18:41:48.893] Resolving 2 futures (chunks) ... DONE [18:41:48.893] Reducing values from 2 chunks ... [18:41:48.893] - Number of values collected after concatenation: 3 [18:41:48.893] - Number of values expected: 3 [18:41:48.893] Reducing values from 2 chunks ... DONE [18:41:48.893] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:48.896] future_lapply() ... [18:41:48.899] Number of chunks: 2 [18:41:48.899] getGlobalsAndPackagesXApply() ... [18:41:48.899] - future.globals: TRUE [18:41:48.899] getGlobalsAndPackages() ... [18:41:48.899] Searching for globals... [18:41:48.901] - globals found: [2] 'FUN', 'UseMethod' [18:41:48.901] Searching for globals ... DONE [18:41:48.901] Resolving globals: FALSE [18:41:48.902] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:48.902] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:48.902] - globals: [1] 'FUN' [18:41:48.903] [18:41:48.903] getGlobalsAndPackages() ... DONE [18:41:48.903] - globals found/used: [n=1] 'FUN' [18:41:48.903] - needed namespaces: [n=0] [18:41:48.903] Finding globals ... DONE [18:41:48.903] - use_args: TRUE [18:41:48.904] - Getting '...' globals ... [18:41:48.904] resolve() on list ... [18:41:48.904] recursive: 0 [18:41:48.905] length: 1 [18:41:48.905] elements: '...' [18:41:48.905] length: 0 (resolved future 1) [18:41:48.905] resolve() on list ... DONE [18:41:48.905] - '...' content: [n=0] [18:41:48.905] List of 1 [18:41:48.905] $ ...: list() [18:41:48.905] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.905] - attr(*, "where")=List of 1 [18:41:48.905] ..$ ...: [18:41:48.905] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.905] - attr(*, "resolved")= logi TRUE [18:41:48.905] - attr(*, "total_size")= num NA [18:41:48.908] - Getting '...' globals ... DONE [18:41:48.909] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:48.909] List of 2 [18:41:48.909] $ ...future.FUN:function (x, ...) [18:41:48.909] $ ... : list() [18:41:48.909] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:48.909] - attr(*, "where")=List of 2 [18:41:48.909] ..$ ...future.FUN: [18:41:48.909] ..$ ... : [18:41:48.909] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:48.909] - attr(*, "resolved")= logi FALSE [18:41:48.909] - attr(*, "total_size")= int 5116 [18:41:48.912] Packages to be attached in all futures: [n=0] [18:41:48.912] getGlobalsAndPackagesXApply() ... DONE [18:41:48.913] Number of futures (= number of chunks): 2 [18:41:48.913] Launching 2 futures (chunks) ... [18:41:48.913] Chunk #1 of 2 ... [18:41:48.913] - Finding globals in 'X' for chunk #1 ... [18:41:48.913] getGlobalsAndPackages() ... [18:41:48.914] Searching for globals... [18:41:48.914] [18:41:48.914] Searching for globals ... DONE [18:41:48.914] - globals: [0] [18:41:48.914] getGlobalsAndPackages() ... DONE [18:41:48.914] + additional globals found: [n=0] [18:41:48.915] + additional namespaces needed: [n=0] [18:41:48.915] - Finding globals in 'X' for chunk #1 ... DONE [18:41:48.915] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.915] - seeds: [18:41:48.915] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.915] getGlobalsAndPackages() ... [18:41:48.916] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.916] Resolving globals: FALSE [18:41:48.916] Tweak future expression to call with '...' arguments ... [18:41:48.916] { [18:41:48.916] do.call(function(...) { [18:41:48.916] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.916] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.916] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.916] on.exit(options(oopts), add = TRUE) [18:41:48.916] } [18:41:48.916] { [18:41:48.916] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.916] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.916] ...future.FUN(...future.X_jj, ...) [18:41:48.916] }) [18:41:48.916] } [18:41:48.916] }, args = future.call.arguments) [18:41:48.916] } [18:41:48.917] Tweak future expression to call with '...' arguments ... DONE [18:41:48.917] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.917] [18:41:48.917] getGlobalsAndPackages() ... DONE [18:41:48.918] run() for 'Future' ... [18:41:48.918] - state: 'created' [18:41:48.918] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.942] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.942] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.942] - Field: 'node' [18:41:48.942] - Field: 'label' [18:41:48.943] - Field: 'local' [18:41:48.943] - Field: 'owner' [18:41:48.943] - Field: 'envir' [18:41:48.943] - Field: 'workers' [18:41:48.943] - Field: 'packages' [18:41:48.943] - Field: 'gc' [18:41:48.944] - Field: 'conditions' [18:41:48.944] - Field: 'persistent' [18:41:48.944] - Field: 'expr' [18:41:48.944] - Field: 'uuid' [18:41:48.944] - Field: 'seed' [18:41:48.945] - Field: 'version' [18:41:48.945] - Field: 'result' [18:41:48.945] - Field: 'asynchronous' [18:41:48.945] - Field: 'calls' [18:41:48.945] - Field: 'globals' [18:41:48.945] - Field: 'stdout' [18:41:48.946] - Field: 'earlySignal' [18:41:48.946] - Field: 'lazy' [18:41:48.946] - Field: 'state' [18:41:48.946] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.946] - Launch lazy future ... [18:41:48.947] Packages needed by the future expression (n = 0): [18:41:48.947] Packages needed by future strategies (n = 0): [18:41:48.947] { [18:41:48.947] { [18:41:48.947] { [18:41:48.947] ...future.startTime <- base::Sys.time() [18:41:48.947] { [18:41:48.947] { [18:41:48.947] { [18:41:48.947] { [18:41:48.947] base::local({ [18:41:48.947] has_future <- base::requireNamespace("future", [18:41:48.947] quietly = TRUE) [18:41:48.947] if (has_future) { [18:41:48.947] ns <- base::getNamespace("future") [18:41:48.947] version <- ns[[".package"]][["version"]] [18:41:48.947] if (is.null(version)) [18:41:48.947] version <- utils::packageVersion("future") [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] version <- NULL [18:41:48.947] } [18:41:48.947] if (!has_future || version < "1.8.0") { [18:41:48.947] info <- base::c(r_version = base::gsub("R version ", [18:41:48.947] "", base::R.version$version.string), [18:41:48.947] platform = base::sprintf("%s (%s-bit)", [18:41:48.947] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:48.947] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:48.947] "release", "version")], collapse = " "), [18:41:48.947] hostname = base::Sys.info()[["nodename"]]) [18:41:48.947] info <- base::sprintf("%s: %s", base::names(info), [18:41:48.947] info) [18:41:48.947] info <- base::paste(info, collapse = "; ") [18:41:48.947] if (!has_future) { [18:41:48.947] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:48.947] info) [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:48.947] info, version) [18:41:48.947] } [18:41:48.947] base::stop(msg) [18:41:48.947] } [18:41:48.947] }) [18:41:48.947] } [18:41:48.947] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:48.947] base::options(mc.cores = 1L) [18:41:48.947] } [18:41:48.947] ...future.strategy.old <- future::plan("list") [18:41:48.947] options(future.plan = NULL) [18:41:48.947] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.947] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:48.947] } [18:41:48.947] ...future.workdir <- getwd() [18:41:48.947] } [18:41:48.947] ...future.oldOptions <- base::as.list(base::.Options) [18:41:48.947] ...future.oldEnvVars <- base::Sys.getenv() [18:41:48.947] } [18:41:48.947] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:48.947] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:48.947] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:48.947] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:48.947] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:48.947] future.stdout.windows.reencode = NULL, width = 80L) [18:41:48.947] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:48.947] base::names(...future.oldOptions)) [18:41:48.947] } [18:41:48.947] if (FALSE) { [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] if (TRUE) { [18:41:48.947] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:48.947] open = "w") [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:48.947] windows = "NUL", "/dev/null"), open = "w") [18:41:48.947] } [18:41:48.947] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:48.947] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:48.947] base::sink(type = "output", split = FALSE) [18:41:48.947] base::close(...future.stdout) [18:41:48.947] }, add = TRUE) [18:41:48.947] } [18:41:48.947] ...future.frame <- base::sys.nframe() [18:41:48.947] ...future.conditions <- base::list() [18:41:48.947] ...future.rng <- base::globalenv()$.Random.seed [18:41:48.947] if (FALSE) { [18:41:48.947] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:48.947] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:48.947] } [18:41:48.947] ...future.result <- base::tryCatch({ [18:41:48.947] base::withCallingHandlers({ [18:41:48.947] ...future.value <- base::withVisible(base::local({ [18:41:48.947] ...future.makeSendCondition <- base::local({ [18:41:48.947] sendCondition <- NULL [18:41:48.947] function(frame = 1L) { [18:41:48.947] if (is.function(sendCondition)) [18:41:48.947] return(sendCondition) [18:41:48.947] ns <- getNamespace("parallel") [18:41:48.947] if (exists("sendData", mode = "function", [18:41:48.947] envir = ns)) { [18:41:48.947] parallel_sendData <- get("sendData", mode = "function", [18:41:48.947] envir = ns) [18:41:48.947] envir <- sys.frame(frame) [18:41:48.947] master <- NULL [18:41:48.947] while (!identical(envir, .GlobalEnv) && [18:41:48.947] !identical(envir, emptyenv())) { [18:41:48.947] if (exists("master", mode = "list", envir = envir, [18:41:48.947] inherits = FALSE)) { [18:41:48.947] master <- get("master", mode = "list", [18:41:48.947] envir = envir, inherits = FALSE) [18:41:48.947] if (inherits(master, c("SOCKnode", [18:41:48.947] "SOCK0node"))) { [18:41:48.947] sendCondition <<- function(cond) { [18:41:48.947] data <- list(type = "VALUE", value = cond, [18:41:48.947] success = TRUE) [18:41:48.947] parallel_sendData(master, data) [18:41:48.947] } [18:41:48.947] return(sendCondition) [18:41:48.947] } [18:41:48.947] } [18:41:48.947] frame <- frame + 1L [18:41:48.947] envir <- sys.frame(frame) [18:41:48.947] } [18:41:48.947] } [18:41:48.947] sendCondition <<- function(cond) NULL [18:41:48.947] } [18:41:48.947] }) [18:41:48.947] withCallingHandlers({ [18:41:48.947] { [18:41:48.947] do.call(function(...) { [18:41:48.947] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.947] if (!identical(...future.globals.maxSize.org, [18:41:48.947] ...future.globals.maxSize)) { [18:41:48.947] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.947] on.exit(options(oopts), add = TRUE) [18:41:48.947] } [18:41:48.947] { [18:41:48.947] lapply(seq_along(...future.elements_ii), [18:41:48.947] FUN = function(jj) { [18:41:48.947] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.947] ...future.FUN(...future.X_jj, ...) [18:41:48.947] }) [18:41:48.947] } [18:41:48.947] }, args = future.call.arguments) [18:41:48.947] } [18:41:48.947] }, immediateCondition = function(cond) { [18:41:48.947] sendCondition <- ...future.makeSendCondition() [18:41:48.947] sendCondition(cond) [18:41:48.947] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.947] { [18:41:48.947] inherits <- base::inherits [18:41:48.947] invokeRestart <- base::invokeRestart [18:41:48.947] is.null <- base::is.null [18:41:48.947] muffled <- FALSE [18:41:48.947] if (inherits(cond, "message")) { [18:41:48.947] muffled <- grepl(pattern, "muffleMessage") [18:41:48.947] if (muffled) [18:41:48.947] invokeRestart("muffleMessage") [18:41:48.947] } [18:41:48.947] else if (inherits(cond, "warning")) { [18:41:48.947] muffled <- grepl(pattern, "muffleWarning") [18:41:48.947] if (muffled) [18:41:48.947] invokeRestart("muffleWarning") [18:41:48.947] } [18:41:48.947] else if (inherits(cond, "condition")) { [18:41:48.947] if (!is.null(pattern)) { [18:41:48.947] computeRestarts <- base::computeRestarts [18:41:48.947] grepl <- base::grepl [18:41:48.947] restarts <- computeRestarts(cond) [18:41:48.947] for (restart in restarts) { [18:41:48.947] name <- restart$name [18:41:48.947] if (is.null(name)) [18:41:48.947] next [18:41:48.947] if (!grepl(pattern, name)) [18:41:48.947] next [18:41:48.947] invokeRestart(restart) [18:41:48.947] muffled <- TRUE [18:41:48.947] break [18:41:48.947] } [18:41:48.947] } [18:41:48.947] } [18:41:48.947] invisible(muffled) [18:41:48.947] } [18:41:48.947] muffleCondition(cond) [18:41:48.947] }) [18:41:48.947] })) [18:41:48.947] future::FutureResult(value = ...future.value$value, [18:41:48.947] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.947] ...future.rng), globalenv = if (FALSE) [18:41:48.947] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:48.947] ...future.globalenv.names)) [18:41:48.947] else NULL, started = ...future.startTime, version = "1.8") [18:41:48.947] }, condition = base::local({ [18:41:48.947] c <- base::c [18:41:48.947] inherits <- base::inherits [18:41:48.947] invokeRestart <- base::invokeRestart [18:41:48.947] length <- base::length [18:41:48.947] list <- base::list [18:41:48.947] seq.int <- base::seq.int [18:41:48.947] signalCondition <- base::signalCondition [18:41:48.947] sys.calls <- base::sys.calls [18:41:48.947] `[[` <- base::`[[` [18:41:48.947] `+` <- base::`+` [18:41:48.947] `<<-` <- base::`<<-` [18:41:48.947] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:48.947] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:48.947] 3L)] [18:41:48.947] } [18:41:48.947] function(cond) { [18:41:48.947] is_error <- inherits(cond, "error") [18:41:48.947] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:48.947] NULL) [18:41:48.947] if (is_error) { [18:41:48.947] sessionInformation <- function() { [18:41:48.947] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:48.947] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:48.947] search = base::search(), system = base::Sys.info()) [18:41:48.947] } [18:41:48.947] ...future.conditions[[length(...future.conditions) + [18:41:48.947] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:48.947] cond$call), session = sessionInformation(), [18:41:48.947] timestamp = base::Sys.time(), signaled = 0L) [18:41:48.947] signalCondition(cond) [18:41:48.947] } [18:41:48.947] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:48.947] "immediateCondition"))) { [18:41:48.947] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:48.947] ...future.conditions[[length(...future.conditions) + [18:41:48.947] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:48.947] if (TRUE && !signal) { [18:41:48.947] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.947] { [18:41:48.947] inherits <- base::inherits [18:41:48.947] invokeRestart <- base::invokeRestart [18:41:48.947] is.null <- base::is.null [18:41:48.947] muffled <- FALSE [18:41:48.947] if (inherits(cond, "message")) { [18:41:48.947] muffled <- grepl(pattern, "muffleMessage") [18:41:48.947] if (muffled) [18:41:48.947] invokeRestart("muffleMessage") [18:41:48.947] } [18:41:48.947] else if (inherits(cond, "warning")) { [18:41:48.947] muffled <- grepl(pattern, "muffleWarning") [18:41:48.947] if (muffled) [18:41:48.947] invokeRestart("muffleWarning") [18:41:48.947] } [18:41:48.947] else if (inherits(cond, "condition")) { [18:41:48.947] if (!is.null(pattern)) { [18:41:48.947] computeRestarts <- base::computeRestarts [18:41:48.947] grepl <- base::grepl [18:41:48.947] restarts <- computeRestarts(cond) [18:41:48.947] for (restart in restarts) { [18:41:48.947] name <- restart$name [18:41:48.947] if (is.null(name)) [18:41:48.947] next [18:41:48.947] if (!grepl(pattern, name)) [18:41:48.947] next [18:41:48.947] invokeRestart(restart) [18:41:48.947] muffled <- TRUE [18:41:48.947] break [18:41:48.947] } [18:41:48.947] } [18:41:48.947] } [18:41:48.947] invisible(muffled) [18:41:48.947] } [18:41:48.947] muffleCondition(cond, pattern = "^muffle") [18:41:48.947] } [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] if (TRUE) { [18:41:48.947] muffleCondition <- function (cond, pattern = "^muffle") [18:41:48.947] { [18:41:48.947] inherits <- base::inherits [18:41:48.947] invokeRestart <- base::invokeRestart [18:41:48.947] is.null <- base::is.null [18:41:48.947] muffled <- FALSE [18:41:48.947] if (inherits(cond, "message")) { [18:41:48.947] muffled <- grepl(pattern, "muffleMessage") [18:41:48.947] if (muffled) [18:41:48.947] invokeRestart("muffleMessage") [18:41:48.947] } [18:41:48.947] else if (inherits(cond, "warning")) { [18:41:48.947] muffled <- grepl(pattern, "muffleWarning") [18:41:48.947] if (muffled) [18:41:48.947] invokeRestart("muffleWarning") [18:41:48.947] } [18:41:48.947] else if (inherits(cond, "condition")) { [18:41:48.947] if (!is.null(pattern)) { [18:41:48.947] computeRestarts <- base::computeRestarts [18:41:48.947] grepl <- base::grepl [18:41:48.947] restarts <- computeRestarts(cond) [18:41:48.947] for (restart in restarts) { [18:41:48.947] name <- restart$name [18:41:48.947] if (is.null(name)) [18:41:48.947] next [18:41:48.947] if (!grepl(pattern, name)) [18:41:48.947] next [18:41:48.947] invokeRestart(restart) [18:41:48.947] muffled <- TRUE [18:41:48.947] break [18:41:48.947] } [18:41:48.947] } [18:41:48.947] } [18:41:48.947] invisible(muffled) [18:41:48.947] } [18:41:48.947] muffleCondition(cond, pattern = "^muffle") [18:41:48.947] } [18:41:48.947] } [18:41:48.947] } [18:41:48.947] })) [18:41:48.947] }, error = function(ex) { [18:41:48.947] base::structure(base::list(value = NULL, visible = NULL, [18:41:48.947] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:48.947] ...future.rng), started = ...future.startTime, [18:41:48.947] finished = Sys.time(), session_uuid = NA_character_, [18:41:48.947] version = "1.8"), class = "FutureResult") [18:41:48.947] }, finally = { [18:41:48.947] if (!identical(...future.workdir, getwd())) [18:41:48.947] setwd(...future.workdir) [18:41:48.947] { [18:41:48.947] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:48.947] ...future.oldOptions$nwarnings <- NULL [18:41:48.947] } [18:41:48.947] base::options(...future.oldOptions) [18:41:48.947] if (.Platform$OS.type == "windows") { [18:41:48.947] old_names <- names(...future.oldEnvVars) [18:41:48.947] envs <- base::Sys.getenv() [18:41:48.947] names <- names(envs) [18:41:48.947] common <- intersect(names, old_names) [18:41:48.947] added <- setdiff(names, old_names) [18:41:48.947] removed <- setdiff(old_names, names) [18:41:48.947] changed <- common[...future.oldEnvVars[common] != [18:41:48.947] envs[common]] [18:41:48.947] NAMES <- toupper(changed) [18:41:48.947] args <- list() [18:41:48.947] for (kk in seq_along(NAMES)) { [18:41:48.947] name <- changed[[kk]] [18:41:48.947] NAME <- NAMES[[kk]] [18:41:48.947] if (name != NAME && is.element(NAME, old_names)) [18:41:48.947] next [18:41:48.947] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.947] } [18:41:48.947] NAMES <- toupper(added) [18:41:48.947] for (kk in seq_along(NAMES)) { [18:41:48.947] name <- added[[kk]] [18:41:48.947] NAME <- NAMES[[kk]] [18:41:48.947] if (name != NAME && is.element(NAME, old_names)) [18:41:48.947] next [18:41:48.947] args[[name]] <- "" [18:41:48.947] } [18:41:48.947] NAMES <- toupper(removed) [18:41:48.947] for (kk in seq_along(NAMES)) { [18:41:48.947] name <- removed[[kk]] [18:41:48.947] NAME <- NAMES[[kk]] [18:41:48.947] if (name != NAME && is.element(NAME, old_names)) [18:41:48.947] next [18:41:48.947] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:48.947] } [18:41:48.947] if (length(args) > 0) [18:41:48.947] base::do.call(base::Sys.setenv, args = args) [18:41:48.947] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:48.947] } [18:41:48.947] { [18:41:48.947] if (base::length(...future.futureOptionsAdded) > [18:41:48.947] 0L) { [18:41:48.947] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:48.947] base::names(opts) <- ...future.futureOptionsAdded [18:41:48.947] base::options(opts) [18:41:48.947] } [18:41:48.947] { [18:41:48.947] { [18:41:48.947] base::options(mc.cores = ...future.mc.cores.old) [18:41:48.947] NULL [18:41:48.947] } [18:41:48.947] options(future.plan = NULL) [18:41:48.947] if (is.na(NA_character_)) [18:41:48.947] Sys.unsetenv("R_FUTURE_PLAN") [18:41:48.947] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:48.947] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:48.947] .init = FALSE) [18:41:48.947] } [18:41:48.947] } [18:41:48.947] } [18:41:48.947] }) [18:41:48.947] if (TRUE) { [18:41:48.947] base::sink(type = "output", split = FALSE) [18:41:48.947] if (TRUE) { [18:41:48.947] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:48.947] } [18:41:48.947] else { [18:41:48.947] ...future.result["stdout"] <- base::list(NULL) [18:41:48.947] } [18:41:48.947] base::close(...future.stdout) [18:41:48.947] ...future.stdout <- NULL [18:41:48.947] } [18:41:48.947] ...future.result$conditions <- ...future.conditions [18:41:48.947] ...future.result$finished <- base::Sys.time() [18:41:48.947] ...future.result [18:41:48.947] } [18:41:48.953] Exporting 5 global objects (968 bytes) to cluster node #1 ... [18:41:48.953] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:48.953] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:48.954] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:48.954] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:48.954] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:48.955] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:48.955] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:48.955] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:48.955] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:48.956] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:48.956] Exporting 5 global objects (968 bytes) to cluster node #1 ... DONE [18:41:48.957] MultisessionFuture started [18:41:48.957] - Launch lazy future ... done [18:41:48.957] run() for 'MultisessionFuture' ... done [18:41:48.957] Created future: [18:41:48.971] receiveMessageFromWorker() for ClusterFuture ... [18:41:48.972] - Validating connection of MultisessionFuture [18:41:48.972] - received message: FutureResult [18:41:48.972] - Received FutureResult [18:41:48.972] - Erased future from FutureRegistry [18:41:48.972] result() for ClusterFuture ... [18:41:48.973] - result already collected: FutureResult [18:41:48.973] result() for ClusterFuture ... done [18:41:48.973] receiveMessageFromWorker() for ClusterFuture ... done [18:41:48.957] MultisessionFuture: [18:41:48.957] Label: 'future_sapply-1' [18:41:48.957] Expression: [18:41:48.957] { [18:41:48.957] do.call(function(...) { [18:41:48.957] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.957] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.957] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.957] on.exit(options(oopts), add = TRUE) [18:41:48.957] } [18:41:48.957] { [18:41:48.957] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.957] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.957] ...future.FUN(...future.X_jj, ...) [18:41:48.957] }) [18:41:48.957] } [18:41:48.957] }, args = future.call.arguments) [18:41:48.957] } [18:41:48.957] Lazy evaluation: FALSE [18:41:48.957] Asynchronous evaluation: TRUE [18:41:48.957] Local evaluation: TRUE [18:41:48.957] Environment: R_GlobalEnv [18:41:48.957] Capture standard output: TRUE [18:41:48.957] Capture condition classes: 'condition' (excluding 'nothing') [18:41:48.957] Globals: 5 objects totaling 518 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:48.957] Packages: [18:41:48.957] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:48.957] Resolved: TRUE [18:41:48.957] Value: [18:41:48.957] Conditions captured: [18:41:48.957] Early signaling: FALSE [18:41:48.957] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:48.957] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.973] Chunk #1 of 2 ... DONE [18:41:48.973] Chunk #2 of 2 ... [18:41:48.974] - Finding globals in 'X' for chunk #2 ... [18:41:48.974] getGlobalsAndPackages() ... [18:41:48.974] Searching for globals... [18:41:48.974] [18:41:48.974] Searching for globals ... DONE [18:41:48.975] - globals: [0] [18:41:48.975] getGlobalsAndPackages() ... DONE [18:41:48.975] + additional globals found: [n=0] [18:41:48.975] + additional namespaces needed: [n=0] [18:41:48.975] - Finding globals in 'X' for chunk #2 ... DONE [18:41:48.975] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:48.976] - seeds: [18:41:48.976] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.976] getGlobalsAndPackages() ... [18:41:48.976] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.976] Resolving globals: FALSE [18:41:48.976] Tweak future expression to call with '...' arguments ... [18:41:48.977] { [18:41:48.977] do.call(function(...) { [18:41:48.977] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:48.977] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:48.977] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:48.977] on.exit(options(oopts), add = TRUE) [18:41:48.977] } [18:41:48.977] { [18:41:48.977] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:48.977] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:48.977] ...future.FUN(...future.X_jj, ...) [18:41:48.977] }) [18:41:48.977] } [18:41:48.977] }, args = future.call.arguments) [18:41:48.977] } [18:41:48.977] Tweak future expression to call with '...' arguments ... DONE [18:41:48.978] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:48.978] [18:41:48.978] getGlobalsAndPackages() ... DONE [18:41:48.978] run() for 'Future' ... [18:41:48.979] - state: 'created' [18:41:48.979] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:48.994] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:48.994] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:48.994] - Field: 'node' [18:41:48.995] - Field: 'label' [18:41:48.995] - Field: 'local' [18:41:48.995] - Field: 'owner' [18:41:48.995] - Field: 'envir' [18:41:48.995] - Field: 'workers' [18:41:48.995] - Field: 'packages' [18:41:48.996] - Field: 'gc' [18:41:48.996] - Field: 'conditions' [18:41:48.996] - Field: 'persistent' [18:41:48.996] - Field: 'expr' [18:41:48.996] - Field: 'uuid' [18:41:48.997] - Field: 'seed' [18:41:48.997] - Field: 'version' [18:41:48.997] - Field: 'result' [18:41:48.997] - Field: 'asynchronous' [18:41:48.997] - Field: 'calls' [18:41:48.997] - Field: 'globals' [18:41:48.998] - Field: 'stdout' [18:41:48.998] - Field: 'earlySignal' [18:41:48.998] - Field: 'lazy' [18:41:48.998] - Field: 'state' [18:41:48.998] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:48.998] - Launch lazy future ... [18:41:48.999] Packages needed by the future expression (n = 0): [18:41:48.999] Packages needed by future strategies (n = 0): [18:41:49.000] { [18:41:49.000] { [18:41:49.000] { [18:41:49.000] ...future.startTime <- base::Sys.time() [18:41:49.000] { [18:41:49.000] { [18:41:49.000] { [18:41:49.000] { [18:41:49.000] base::local({ [18:41:49.000] has_future <- base::requireNamespace("future", [18:41:49.000] quietly = TRUE) [18:41:49.000] if (has_future) { [18:41:49.000] ns <- base::getNamespace("future") [18:41:49.000] version <- ns[[".package"]][["version"]] [18:41:49.000] if (is.null(version)) [18:41:49.000] version <- utils::packageVersion("future") [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] version <- NULL [18:41:49.000] } [18:41:49.000] if (!has_future || version < "1.8.0") { [18:41:49.000] info <- base::c(r_version = base::gsub("R version ", [18:41:49.000] "", base::R.version$version.string), [18:41:49.000] platform = base::sprintf("%s (%s-bit)", [18:41:49.000] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.000] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.000] "release", "version")], collapse = " "), [18:41:49.000] hostname = base::Sys.info()[["nodename"]]) [18:41:49.000] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.000] info) [18:41:49.000] info <- base::paste(info, collapse = "; ") [18:41:49.000] if (!has_future) { [18:41:49.000] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.000] info) [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.000] info, version) [18:41:49.000] } [18:41:49.000] base::stop(msg) [18:41:49.000] } [18:41:49.000] }) [18:41:49.000] } [18:41:49.000] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.000] base::options(mc.cores = 1L) [18:41:49.000] } [18:41:49.000] ...future.strategy.old <- future::plan("list") [18:41:49.000] options(future.plan = NULL) [18:41:49.000] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.000] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.000] } [18:41:49.000] ...future.workdir <- getwd() [18:41:49.000] } [18:41:49.000] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.000] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.000] } [18:41:49.000] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.000] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.000] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.000] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.000] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.000] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.000] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.000] base::names(...future.oldOptions)) [18:41:49.000] } [18:41:49.000] if (FALSE) { [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] if (TRUE) { [18:41:49.000] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.000] open = "w") [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.000] windows = "NUL", "/dev/null"), open = "w") [18:41:49.000] } [18:41:49.000] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.000] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.000] base::sink(type = "output", split = FALSE) [18:41:49.000] base::close(...future.stdout) [18:41:49.000] }, add = TRUE) [18:41:49.000] } [18:41:49.000] ...future.frame <- base::sys.nframe() [18:41:49.000] ...future.conditions <- base::list() [18:41:49.000] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.000] if (FALSE) { [18:41:49.000] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.000] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.000] } [18:41:49.000] ...future.result <- base::tryCatch({ [18:41:49.000] base::withCallingHandlers({ [18:41:49.000] ...future.value <- base::withVisible(base::local({ [18:41:49.000] ...future.makeSendCondition <- base::local({ [18:41:49.000] sendCondition <- NULL [18:41:49.000] function(frame = 1L) { [18:41:49.000] if (is.function(sendCondition)) [18:41:49.000] return(sendCondition) [18:41:49.000] ns <- getNamespace("parallel") [18:41:49.000] if (exists("sendData", mode = "function", [18:41:49.000] envir = ns)) { [18:41:49.000] parallel_sendData <- get("sendData", mode = "function", [18:41:49.000] envir = ns) [18:41:49.000] envir <- sys.frame(frame) [18:41:49.000] master <- NULL [18:41:49.000] while (!identical(envir, .GlobalEnv) && [18:41:49.000] !identical(envir, emptyenv())) { [18:41:49.000] if (exists("master", mode = "list", envir = envir, [18:41:49.000] inherits = FALSE)) { [18:41:49.000] master <- get("master", mode = "list", [18:41:49.000] envir = envir, inherits = FALSE) [18:41:49.000] if (inherits(master, c("SOCKnode", [18:41:49.000] "SOCK0node"))) { [18:41:49.000] sendCondition <<- function(cond) { [18:41:49.000] data <- list(type = "VALUE", value = cond, [18:41:49.000] success = TRUE) [18:41:49.000] parallel_sendData(master, data) [18:41:49.000] } [18:41:49.000] return(sendCondition) [18:41:49.000] } [18:41:49.000] } [18:41:49.000] frame <- frame + 1L [18:41:49.000] envir <- sys.frame(frame) [18:41:49.000] } [18:41:49.000] } [18:41:49.000] sendCondition <<- function(cond) NULL [18:41:49.000] } [18:41:49.000] }) [18:41:49.000] withCallingHandlers({ [18:41:49.000] { [18:41:49.000] do.call(function(...) { [18:41:49.000] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.000] if (!identical(...future.globals.maxSize.org, [18:41:49.000] ...future.globals.maxSize)) { [18:41:49.000] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.000] on.exit(options(oopts), add = TRUE) [18:41:49.000] } [18:41:49.000] { [18:41:49.000] lapply(seq_along(...future.elements_ii), [18:41:49.000] FUN = function(jj) { [18:41:49.000] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.000] ...future.FUN(...future.X_jj, ...) [18:41:49.000] }) [18:41:49.000] } [18:41:49.000] }, args = future.call.arguments) [18:41:49.000] } [18:41:49.000] }, immediateCondition = function(cond) { [18:41:49.000] sendCondition <- ...future.makeSendCondition() [18:41:49.000] sendCondition(cond) [18:41:49.000] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.000] { [18:41:49.000] inherits <- base::inherits [18:41:49.000] invokeRestart <- base::invokeRestart [18:41:49.000] is.null <- base::is.null [18:41:49.000] muffled <- FALSE [18:41:49.000] if (inherits(cond, "message")) { [18:41:49.000] muffled <- grepl(pattern, "muffleMessage") [18:41:49.000] if (muffled) [18:41:49.000] invokeRestart("muffleMessage") [18:41:49.000] } [18:41:49.000] else if (inherits(cond, "warning")) { [18:41:49.000] muffled <- grepl(pattern, "muffleWarning") [18:41:49.000] if (muffled) [18:41:49.000] invokeRestart("muffleWarning") [18:41:49.000] } [18:41:49.000] else if (inherits(cond, "condition")) { [18:41:49.000] if (!is.null(pattern)) { [18:41:49.000] computeRestarts <- base::computeRestarts [18:41:49.000] grepl <- base::grepl [18:41:49.000] restarts <- computeRestarts(cond) [18:41:49.000] for (restart in restarts) { [18:41:49.000] name <- restart$name [18:41:49.000] if (is.null(name)) [18:41:49.000] next [18:41:49.000] if (!grepl(pattern, name)) [18:41:49.000] next [18:41:49.000] invokeRestart(restart) [18:41:49.000] muffled <- TRUE [18:41:49.000] break [18:41:49.000] } [18:41:49.000] } [18:41:49.000] } [18:41:49.000] invisible(muffled) [18:41:49.000] } [18:41:49.000] muffleCondition(cond) [18:41:49.000] }) [18:41:49.000] })) [18:41:49.000] future::FutureResult(value = ...future.value$value, [18:41:49.000] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.000] ...future.rng), globalenv = if (FALSE) [18:41:49.000] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.000] ...future.globalenv.names)) [18:41:49.000] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.000] }, condition = base::local({ [18:41:49.000] c <- base::c [18:41:49.000] inherits <- base::inherits [18:41:49.000] invokeRestart <- base::invokeRestart [18:41:49.000] length <- base::length [18:41:49.000] list <- base::list [18:41:49.000] seq.int <- base::seq.int [18:41:49.000] signalCondition <- base::signalCondition [18:41:49.000] sys.calls <- base::sys.calls [18:41:49.000] `[[` <- base::`[[` [18:41:49.000] `+` <- base::`+` [18:41:49.000] `<<-` <- base::`<<-` [18:41:49.000] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.000] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.000] 3L)] [18:41:49.000] } [18:41:49.000] function(cond) { [18:41:49.000] is_error <- inherits(cond, "error") [18:41:49.000] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.000] NULL) [18:41:49.000] if (is_error) { [18:41:49.000] sessionInformation <- function() { [18:41:49.000] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.000] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.000] search = base::search(), system = base::Sys.info()) [18:41:49.000] } [18:41:49.000] ...future.conditions[[length(...future.conditions) + [18:41:49.000] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.000] cond$call), session = sessionInformation(), [18:41:49.000] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.000] signalCondition(cond) [18:41:49.000] } [18:41:49.000] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.000] "immediateCondition"))) { [18:41:49.000] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.000] ...future.conditions[[length(...future.conditions) + [18:41:49.000] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.000] if (TRUE && !signal) { [18:41:49.000] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.000] { [18:41:49.000] inherits <- base::inherits [18:41:49.000] invokeRestart <- base::invokeRestart [18:41:49.000] is.null <- base::is.null [18:41:49.000] muffled <- FALSE [18:41:49.000] if (inherits(cond, "message")) { [18:41:49.000] muffled <- grepl(pattern, "muffleMessage") [18:41:49.000] if (muffled) [18:41:49.000] invokeRestart("muffleMessage") [18:41:49.000] } [18:41:49.000] else if (inherits(cond, "warning")) { [18:41:49.000] muffled <- grepl(pattern, "muffleWarning") [18:41:49.000] if (muffled) [18:41:49.000] invokeRestart("muffleWarning") [18:41:49.000] } [18:41:49.000] else if (inherits(cond, "condition")) { [18:41:49.000] if (!is.null(pattern)) { [18:41:49.000] computeRestarts <- base::computeRestarts [18:41:49.000] grepl <- base::grepl [18:41:49.000] restarts <- computeRestarts(cond) [18:41:49.000] for (restart in restarts) { [18:41:49.000] name <- restart$name [18:41:49.000] if (is.null(name)) [18:41:49.000] next [18:41:49.000] if (!grepl(pattern, name)) [18:41:49.000] next [18:41:49.000] invokeRestart(restart) [18:41:49.000] muffled <- TRUE [18:41:49.000] break [18:41:49.000] } [18:41:49.000] } [18:41:49.000] } [18:41:49.000] invisible(muffled) [18:41:49.000] } [18:41:49.000] muffleCondition(cond, pattern = "^muffle") [18:41:49.000] } [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] if (TRUE) { [18:41:49.000] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.000] { [18:41:49.000] inherits <- base::inherits [18:41:49.000] invokeRestart <- base::invokeRestart [18:41:49.000] is.null <- base::is.null [18:41:49.000] muffled <- FALSE [18:41:49.000] if (inherits(cond, "message")) { [18:41:49.000] muffled <- grepl(pattern, "muffleMessage") [18:41:49.000] if (muffled) [18:41:49.000] invokeRestart("muffleMessage") [18:41:49.000] } [18:41:49.000] else if (inherits(cond, "warning")) { [18:41:49.000] muffled <- grepl(pattern, "muffleWarning") [18:41:49.000] if (muffled) [18:41:49.000] invokeRestart("muffleWarning") [18:41:49.000] } [18:41:49.000] else if (inherits(cond, "condition")) { [18:41:49.000] if (!is.null(pattern)) { [18:41:49.000] computeRestarts <- base::computeRestarts [18:41:49.000] grepl <- base::grepl [18:41:49.000] restarts <- computeRestarts(cond) [18:41:49.000] for (restart in restarts) { [18:41:49.000] name <- restart$name [18:41:49.000] if (is.null(name)) [18:41:49.000] next [18:41:49.000] if (!grepl(pattern, name)) [18:41:49.000] next [18:41:49.000] invokeRestart(restart) [18:41:49.000] muffled <- TRUE [18:41:49.000] break [18:41:49.000] } [18:41:49.000] } [18:41:49.000] } [18:41:49.000] invisible(muffled) [18:41:49.000] } [18:41:49.000] muffleCondition(cond, pattern = "^muffle") [18:41:49.000] } [18:41:49.000] } [18:41:49.000] } [18:41:49.000] })) [18:41:49.000] }, error = function(ex) { [18:41:49.000] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.000] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.000] ...future.rng), started = ...future.startTime, [18:41:49.000] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.000] version = "1.8"), class = "FutureResult") [18:41:49.000] }, finally = { [18:41:49.000] if (!identical(...future.workdir, getwd())) [18:41:49.000] setwd(...future.workdir) [18:41:49.000] { [18:41:49.000] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.000] ...future.oldOptions$nwarnings <- NULL [18:41:49.000] } [18:41:49.000] base::options(...future.oldOptions) [18:41:49.000] if (.Platform$OS.type == "windows") { [18:41:49.000] old_names <- names(...future.oldEnvVars) [18:41:49.000] envs <- base::Sys.getenv() [18:41:49.000] names <- names(envs) [18:41:49.000] common <- intersect(names, old_names) [18:41:49.000] added <- setdiff(names, old_names) [18:41:49.000] removed <- setdiff(old_names, names) [18:41:49.000] changed <- common[...future.oldEnvVars[common] != [18:41:49.000] envs[common]] [18:41:49.000] NAMES <- toupper(changed) [18:41:49.000] args <- list() [18:41:49.000] for (kk in seq_along(NAMES)) { [18:41:49.000] name <- changed[[kk]] [18:41:49.000] NAME <- NAMES[[kk]] [18:41:49.000] if (name != NAME && is.element(NAME, old_names)) [18:41:49.000] next [18:41:49.000] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.000] } [18:41:49.000] NAMES <- toupper(added) [18:41:49.000] for (kk in seq_along(NAMES)) { [18:41:49.000] name <- added[[kk]] [18:41:49.000] NAME <- NAMES[[kk]] [18:41:49.000] if (name != NAME && is.element(NAME, old_names)) [18:41:49.000] next [18:41:49.000] args[[name]] <- "" [18:41:49.000] } [18:41:49.000] NAMES <- toupper(removed) [18:41:49.000] for (kk in seq_along(NAMES)) { [18:41:49.000] name <- removed[[kk]] [18:41:49.000] NAME <- NAMES[[kk]] [18:41:49.000] if (name != NAME && is.element(NAME, old_names)) [18:41:49.000] next [18:41:49.000] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.000] } [18:41:49.000] if (length(args) > 0) [18:41:49.000] base::do.call(base::Sys.setenv, args = args) [18:41:49.000] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.000] } [18:41:49.000] { [18:41:49.000] if (base::length(...future.futureOptionsAdded) > [18:41:49.000] 0L) { [18:41:49.000] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.000] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.000] base::options(opts) [18:41:49.000] } [18:41:49.000] { [18:41:49.000] { [18:41:49.000] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.000] NULL [18:41:49.000] } [18:41:49.000] options(future.plan = NULL) [18:41:49.000] if (is.na(NA_character_)) [18:41:49.000] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.000] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.000] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.000] .init = FALSE) [18:41:49.000] } [18:41:49.000] } [18:41:49.000] } [18:41:49.000] }) [18:41:49.000] if (TRUE) { [18:41:49.000] base::sink(type = "output", split = FALSE) [18:41:49.000] if (TRUE) { [18:41:49.000] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.000] } [18:41:49.000] else { [18:41:49.000] ...future.result["stdout"] <- base::list(NULL) [18:41:49.000] } [18:41:49.000] base::close(...future.stdout) [18:41:49.000] ...future.stdout <- NULL [18:41:49.000] } [18:41:49.000] ...future.result$conditions <- ...future.conditions [18:41:49.000] ...future.result$finished <- base::Sys.time() [18:41:49.000] ...future.result [18:41:49.000] } [18:41:49.005] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:49.005] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:49.005] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:49.006] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.006] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.006] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:49.007] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:49.007] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.007] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.007] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.008] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.008] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:49.009] MultisessionFuture started [18:41:49.009] - Launch lazy future ... done [18:41:49.009] run() for 'MultisessionFuture' ... done [18:41:49.009] Created future: [18:41:49.022] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.022] - Validating connection of MultisessionFuture [18:41:49.023] - received message: FutureResult [18:41:49.023] - Received FutureResult [18:41:49.023] - Erased future from FutureRegistry [18:41:49.024] result() for ClusterFuture ... [18:41:49.024] - result already collected: FutureResult [18:41:49.024] result() for ClusterFuture ... done [18:41:49.024] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.009] MultisessionFuture: [18:41:49.009] Label: 'future_sapply-2' [18:41:49.009] Expression: [18:41:49.009] { [18:41:49.009] do.call(function(...) { [18:41:49.009] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.009] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.009] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.009] on.exit(options(oopts), add = TRUE) [18:41:49.009] } [18:41:49.009] { [18:41:49.009] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.009] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.009] ...future.FUN(...future.X_jj, ...) [18:41:49.009] }) [18:41:49.009] } [18:41:49.009] }, args = future.call.arguments) [18:41:49.009] } [18:41:49.009] Lazy evaluation: FALSE [18:41:49.009] Asynchronous evaluation: TRUE [18:41:49.009] Local evaluation: TRUE [18:41:49.009] Environment: R_GlobalEnv [18:41:49.009] Capture standard output: TRUE [18:41:49.009] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.009] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.009] Packages: [18:41:49.009] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.009] Resolved: TRUE [18:41:49.009] Value: [18:41:49.009] Conditions captured: [18:41:49.009] Early signaling: FALSE [18:41:49.009] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.009] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.025] Chunk #2 of 2 ... DONE [18:41:49.025] Launching 2 futures (chunks) ... DONE [18:41:49.026] Resolving 2 futures (chunks) ... [18:41:49.026] resolve() on list ... [18:41:49.026] recursive: 0 [18:41:49.026] length: 2 [18:41:49.027] [18:41:49.027] Future #1 [18:41:49.027] result() for ClusterFuture ... [18:41:49.027] - result already collected: FutureResult [18:41:49.028] result() for ClusterFuture ... done [18:41:49.028] result() for ClusterFuture ... [18:41:49.028] - result already collected: FutureResult [18:41:49.028] result() for ClusterFuture ... done [18:41:49.029] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:49.029] - nx: 2 [18:41:49.029] - relay: TRUE [18:41:49.029] - stdout: TRUE [18:41:49.030] - signal: TRUE [18:41:49.030] - resignal: FALSE [18:41:49.030] - force: TRUE [18:41:49.030] - relayed: [n=2] FALSE, FALSE [18:41:49.031] - queued futures: [n=2] FALSE, FALSE [18:41:49.031] - until=1 [18:41:49.031] - relaying element #1 [18:41:49.031] result() for ClusterFuture ... [18:41:49.032] - result already collected: FutureResult [18:41:49.032] result() for ClusterFuture ... done [18:41:49.032] result() for ClusterFuture ... [18:41:49.032] - result already collected: FutureResult [18:41:49.033] result() for ClusterFuture ... done [18:41:49.033] result() for ClusterFuture ... [18:41:49.033] - result already collected: FutureResult [18:41:49.033] result() for ClusterFuture ... done [18:41:49.034] result() for ClusterFuture ... [18:41:49.034] - result already collected: FutureResult [18:41:49.034] result() for ClusterFuture ... done [18:41:49.034] - relayed: [n=2] TRUE, FALSE [18:41:49.035] - queued futures: [n=2] TRUE, FALSE [18:41:49.035] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:49.035] length: 1 (resolved future 1) [18:41:49.036] Future #2 [18:41:49.036] result() for ClusterFuture ... [18:41:49.036] - result already collected: FutureResult [18:41:49.036] result() for ClusterFuture ... done [18:41:49.037] result() for ClusterFuture ... [18:41:49.037] - result already collected: FutureResult [18:41:49.037] result() for ClusterFuture ... done [18:41:49.037] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:49.038] - nx: 2 [18:41:49.038] - relay: TRUE [18:41:49.038] - stdout: TRUE [18:41:49.038] - signal: TRUE [18:41:49.039] - resignal: FALSE [18:41:49.039] - force: TRUE [18:41:49.039] - relayed: [n=2] TRUE, FALSE [18:41:49.039] - queued futures: [n=2] TRUE, FALSE [18:41:49.040] - until=2 [18:41:49.040] - relaying element #2 [18:41:49.040] result() for ClusterFuture ... [18:41:49.040] - result already collected: FutureResult [18:41:49.041] result() for ClusterFuture ... done [18:41:49.041] result() for ClusterFuture ... [18:41:49.041] - result already collected: FutureResult [18:41:49.041] result() for ClusterFuture ... done [18:41:49.042] result() for ClusterFuture ... [18:41:49.042] - result already collected: FutureResult [18:41:49.042] result() for ClusterFuture ... done [18:41:49.042] result() for ClusterFuture ... [18:41:49.043] - result already collected: FutureResult [18:41:49.043] result() for ClusterFuture ... done [18:41:49.043] - relayed: [n=2] TRUE, TRUE [18:41:49.043] - queued futures: [n=2] TRUE, TRUE [18:41:49.044] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:49.044] length: 0 (resolved future 2) [18:41:49.044] Relaying remaining futures [18:41:49.044] signalConditionsASAP(NULL, pos=0) ... [18:41:49.045] - nx: 2 [18:41:49.045] - relay: TRUE [18:41:49.045] - stdout: TRUE [18:41:49.045] - signal: TRUE [18:41:49.046] - resignal: FALSE [18:41:49.046] - force: TRUE [18:41:49.046] - relayed: [n=2] TRUE, TRUE [18:41:49.046] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:49.047] - relayed: [n=2] TRUE, TRUE [18:41:49.047] - queued futures: [n=2] TRUE, TRUE [18:41:49.047] signalConditionsASAP(NULL, pos=0) ... done [18:41:49.048] resolve() on list ... DONE [18:41:49.048] result() for ClusterFuture ... [18:41:49.048] - result already collected: FutureResult [18:41:49.048] result() for ClusterFuture ... done [18:41:49.049] result() for ClusterFuture ... [18:41:49.049] - result already collected: FutureResult [18:41:49.049] result() for ClusterFuture ... done [18:41:49.049] result() for ClusterFuture ... [18:41:49.050] - result already collected: FutureResult [18:41:49.050] result() for ClusterFuture ... done [18:41:49.050] result() for ClusterFuture ... [18:41:49.050] - result already collected: FutureResult [18:41:49.051] result() for ClusterFuture ... done [18:41:49.051] - Number of value chunks collected: 2 [18:41:49.051] Resolving 2 futures (chunks) ... DONE [18:41:49.051] Reducing values from 2 chunks ... [18:41:49.051] - Number of values collected after concatenation: 3 [18:41:49.052] - Number of values expected: 3 [18:41:49.052] Reducing values from 2 chunks ... DONE [18:41:49.052] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:49.054] future_lapply() ... [18:41:49.058] Number of chunks: 2 [18:41:49.058] getGlobalsAndPackagesXApply() ... [18:41:49.058] - future.globals: TRUE [18:41:49.058] getGlobalsAndPackages() ... [18:41:49.058] Searching for globals... [18:41:49.060] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:49.060] Searching for globals ... DONE [18:41:49.060] Resolving globals: FALSE [18:41:49.061] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:49.061] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:49.062] - globals: [1] 'FUN' [18:41:49.062] [18:41:49.062] getGlobalsAndPackages() ... DONE [18:41:49.062] - globals found/used: [n=1] 'FUN' [18:41:49.062] - needed namespaces: [n=0] [18:41:49.063] Finding globals ... DONE [18:41:49.063] - use_args: TRUE [18:41:49.063] - Getting '...' globals ... [18:41:49.063] resolve() on list ... [18:41:49.063] recursive: 0 [18:41:49.064] length: 1 [18:41:49.064] elements: '...' [18:41:49.064] length: 0 (resolved future 1) [18:41:49.064] resolve() on list ... DONE [18:41:49.064] - '...' content: [n=0] [18:41:49.065] List of 1 [18:41:49.065] $ ...: list() [18:41:49.065] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.065] - attr(*, "where")=List of 1 [18:41:49.065] ..$ ...: [18:41:49.065] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.065] - attr(*, "resolved")= logi TRUE [18:41:49.065] - attr(*, "total_size")= num NA [18:41:49.068] - Getting '...' globals ... DONE [18:41:49.068] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:49.068] List of 2 [18:41:49.068] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:49.068] $ ... : list() [18:41:49.068] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.068] - attr(*, "where")=List of 2 [18:41:49.068] ..$ ...future.FUN: [18:41:49.068] ..$ ... : [18:41:49.068] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.068] - attr(*, "resolved")= logi FALSE [18:41:49.068] - attr(*, "total_size")= int 6598 [18:41:49.072] Packages to be attached in all futures: [n=0] [18:41:49.072] getGlobalsAndPackagesXApply() ... DONE [18:41:49.072] Number of futures (= number of chunks): 2 [18:41:49.072] Launching 2 futures (chunks) ... [18:41:49.072] Chunk #1 of 2 ... [18:41:49.073] - Finding globals in 'X' for chunk #1 ... [18:41:49.073] getGlobalsAndPackages() ... [18:41:49.073] Searching for globals... [18:41:49.073] [18:41:49.073] Searching for globals ... DONE [18:41:49.074] - globals: [0] [18:41:49.074] getGlobalsAndPackages() ... DONE [18:41:49.074] + additional globals found: [n=0] [18:41:49.074] + additional namespaces needed: [n=0] [18:41:49.074] - Finding globals in 'X' for chunk #1 ... DONE [18:41:49.074] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.075] - seeds: [18:41:49.075] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.075] getGlobalsAndPackages() ... [18:41:49.075] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.075] Resolving globals: FALSE [18:41:49.075] Tweak future expression to call with '...' arguments ... [18:41:49.076] { [18:41:49.076] do.call(function(...) { [18:41:49.076] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.076] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.076] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.076] on.exit(options(oopts), add = TRUE) [18:41:49.076] } [18:41:49.076] { [18:41:49.076] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.076] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.076] ...future.FUN(...future.X_jj, ...) [18:41:49.076] }) [18:41:49.076] } [18:41:49.076] }, args = future.call.arguments) [18:41:49.076] } [18:41:49.076] Tweak future expression to call with '...' arguments ... DONE [18:41:49.077] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.077] [18:41:49.077] getGlobalsAndPackages() ... DONE [18:41:49.077] run() for 'Future' ... [18:41:49.077] - state: 'created' [18:41:49.078] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.093] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.093] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.093] - Field: 'node' [18:41:49.094] - Field: 'label' [18:41:49.094] - Field: 'local' [18:41:49.094] - Field: 'owner' [18:41:49.094] - Field: 'envir' [18:41:49.094] - Field: 'workers' [18:41:49.094] - Field: 'packages' [18:41:49.095] - Field: 'gc' [18:41:49.095] - Field: 'conditions' [18:41:49.095] - Field: 'persistent' [18:41:49.095] - Field: 'expr' [18:41:49.095] - Field: 'uuid' [18:41:49.096] - Field: 'seed' [18:41:49.096] - Field: 'version' [18:41:49.096] - Field: 'result' [18:41:49.096] - Field: 'asynchronous' [18:41:49.096] - Field: 'calls' [18:41:49.096] - Field: 'globals' [18:41:49.097] - Field: 'stdout' [18:41:49.097] - Field: 'earlySignal' [18:41:49.097] - Field: 'lazy' [18:41:49.097] - Field: 'state' [18:41:49.097] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.097] - Launch lazy future ... [18:41:49.098] Packages needed by the future expression (n = 0): [18:41:49.098] Packages needed by future strategies (n = 0): [18:41:49.099] { [18:41:49.099] { [18:41:49.099] { [18:41:49.099] ...future.startTime <- base::Sys.time() [18:41:49.099] { [18:41:49.099] { [18:41:49.099] { [18:41:49.099] { [18:41:49.099] base::local({ [18:41:49.099] has_future <- base::requireNamespace("future", [18:41:49.099] quietly = TRUE) [18:41:49.099] if (has_future) { [18:41:49.099] ns <- base::getNamespace("future") [18:41:49.099] version <- ns[[".package"]][["version"]] [18:41:49.099] if (is.null(version)) [18:41:49.099] version <- utils::packageVersion("future") [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] version <- NULL [18:41:49.099] } [18:41:49.099] if (!has_future || version < "1.8.0") { [18:41:49.099] info <- base::c(r_version = base::gsub("R version ", [18:41:49.099] "", base::R.version$version.string), [18:41:49.099] platform = base::sprintf("%s (%s-bit)", [18:41:49.099] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.099] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.099] "release", "version")], collapse = " "), [18:41:49.099] hostname = base::Sys.info()[["nodename"]]) [18:41:49.099] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.099] info) [18:41:49.099] info <- base::paste(info, collapse = "; ") [18:41:49.099] if (!has_future) { [18:41:49.099] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.099] info) [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.099] info, version) [18:41:49.099] } [18:41:49.099] base::stop(msg) [18:41:49.099] } [18:41:49.099] }) [18:41:49.099] } [18:41:49.099] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.099] base::options(mc.cores = 1L) [18:41:49.099] } [18:41:49.099] ...future.strategy.old <- future::plan("list") [18:41:49.099] options(future.plan = NULL) [18:41:49.099] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.099] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.099] } [18:41:49.099] ...future.workdir <- getwd() [18:41:49.099] } [18:41:49.099] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.099] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.099] } [18:41:49.099] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.099] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.099] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.099] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.099] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.099] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.099] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.099] base::names(...future.oldOptions)) [18:41:49.099] } [18:41:49.099] if (FALSE) { [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] if (TRUE) { [18:41:49.099] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.099] open = "w") [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.099] windows = "NUL", "/dev/null"), open = "w") [18:41:49.099] } [18:41:49.099] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.099] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.099] base::sink(type = "output", split = FALSE) [18:41:49.099] base::close(...future.stdout) [18:41:49.099] }, add = TRUE) [18:41:49.099] } [18:41:49.099] ...future.frame <- base::sys.nframe() [18:41:49.099] ...future.conditions <- base::list() [18:41:49.099] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.099] if (FALSE) { [18:41:49.099] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.099] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.099] } [18:41:49.099] ...future.result <- base::tryCatch({ [18:41:49.099] base::withCallingHandlers({ [18:41:49.099] ...future.value <- base::withVisible(base::local({ [18:41:49.099] ...future.makeSendCondition <- base::local({ [18:41:49.099] sendCondition <- NULL [18:41:49.099] function(frame = 1L) { [18:41:49.099] if (is.function(sendCondition)) [18:41:49.099] return(sendCondition) [18:41:49.099] ns <- getNamespace("parallel") [18:41:49.099] if (exists("sendData", mode = "function", [18:41:49.099] envir = ns)) { [18:41:49.099] parallel_sendData <- get("sendData", mode = "function", [18:41:49.099] envir = ns) [18:41:49.099] envir <- sys.frame(frame) [18:41:49.099] master <- NULL [18:41:49.099] while (!identical(envir, .GlobalEnv) && [18:41:49.099] !identical(envir, emptyenv())) { [18:41:49.099] if (exists("master", mode = "list", envir = envir, [18:41:49.099] inherits = FALSE)) { [18:41:49.099] master <- get("master", mode = "list", [18:41:49.099] envir = envir, inherits = FALSE) [18:41:49.099] if (inherits(master, c("SOCKnode", [18:41:49.099] "SOCK0node"))) { [18:41:49.099] sendCondition <<- function(cond) { [18:41:49.099] data <- list(type = "VALUE", value = cond, [18:41:49.099] success = TRUE) [18:41:49.099] parallel_sendData(master, data) [18:41:49.099] } [18:41:49.099] return(sendCondition) [18:41:49.099] } [18:41:49.099] } [18:41:49.099] frame <- frame + 1L [18:41:49.099] envir <- sys.frame(frame) [18:41:49.099] } [18:41:49.099] } [18:41:49.099] sendCondition <<- function(cond) NULL [18:41:49.099] } [18:41:49.099] }) [18:41:49.099] withCallingHandlers({ [18:41:49.099] { [18:41:49.099] do.call(function(...) { [18:41:49.099] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.099] if (!identical(...future.globals.maxSize.org, [18:41:49.099] ...future.globals.maxSize)) { [18:41:49.099] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.099] on.exit(options(oopts), add = TRUE) [18:41:49.099] } [18:41:49.099] { [18:41:49.099] lapply(seq_along(...future.elements_ii), [18:41:49.099] FUN = function(jj) { [18:41:49.099] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.099] ...future.FUN(...future.X_jj, ...) [18:41:49.099] }) [18:41:49.099] } [18:41:49.099] }, args = future.call.arguments) [18:41:49.099] } [18:41:49.099] }, immediateCondition = function(cond) { [18:41:49.099] sendCondition <- ...future.makeSendCondition() [18:41:49.099] sendCondition(cond) [18:41:49.099] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.099] { [18:41:49.099] inherits <- base::inherits [18:41:49.099] invokeRestart <- base::invokeRestart [18:41:49.099] is.null <- base::is.null [18:41:49.099] muffled <- FALSE [18:41:49.099] if (inherits(cond, "message")) { [18:41:49.099] muffled <- grepl(pattern, "muffleMessage") [18:41:49.099] if (muffled) [18:41:49.099] invokeRestart("muffleMessage") [18:41:49.099] } [18:41:49.099] else if (inherits(cond, "warning")) { [18:41:49.099] muffled <- grepl(pattern, "muffleWarning") [18:41:49.099] if (muffled) [18:41:49.099] invokeRestart("muffleWarning") [18:41:49.099] } [18:41:49.099] else if (inherits(cond, "condition")) { [18:41:49.099] if (!is.null(pattern)) { [18:41:49.099] computeRestarts <- base::computeRestarts [18:41:49.099] grepl <- base::grepl [18:41:49.099] restarts <- computeRestarts(cond) [18:41:49.099] for (restart in restarts) { [18:41:49.099] name <- restart$name [18:41:49.099] if (is.null(name)) [18:41:49.099] next [18:41:49.099] if (!grepl(pattern, name)) [18:41:49.099] next [18:41:49.099] invokeRestart(restart) [18:41:49.099] muffled <- TRUE [18:41:49.099] break [18:41:49.099] } [18:41:49.099] } [18:41:49.099] } [18:41:49.099] invisible(muffled) [18:41:49.099] } [18:41:49.099] muffleCondition(cond) [18:41:49.099] }) [18:41:49.099] })) [18:41:49.099] future::FutureResult(value = ...future.value$value, [18:41:49.099] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.099] ...future.rng), globalenv = if (FALSE) [18:41:49.099] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.099] ...future.globalenv.names)) [18:41:49.099] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.099] }, condition = base::local({ [18:41:49.099] c <- base::c [18:41:49.099] inherits <- base::inherits [18:41:49.099] invokeRestart <- base::invokeRestart [18:41:49.099] length <- base::length [18:41:49.099] list <- base::list [18:41:49.099] seq.int <- base::seq.int [18:41:49.099] signalCondition <- base::signalCondition [18:41:49.099] sys.calls <- base::sys.calls [18:41:49.099] `[[` <- base::`[[` [18:41:49.099] `+` <- base::`+` [18:41:49.099] `<<-` <- base::`<<-` [18:41:49.099] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.099] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.099] 3L)] [18:41:49.099] } [18:41:49.099] function(cond) { [18:41:49.099] is_error <- inherits(cond, "error") [18:41:49.099] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.099] NULL) [18:41:49.099] if (is_error) { [18:41:49.099] sessionInformation <- function() { [18:41:49.099] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.099] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.099] search = base::search(), system = base::Sys.info()) [18:41:49.099] } [18:41:49.099] ...future.conditions[[length(...future.conditions) + [18:41:49.099] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.099] cond$call), session = sessionInformation(), [18:41:49.099] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.099] signalCondition(cond) [18:41:49.099] } [18:41:49.099] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.099] "immediateCondition"))) { [18:41:49.099] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.099] ...future.conditions[[length(...future.conditions) + [18:41:49.099] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.099] if (TRUE && !signal) { [18:41:49.099] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.099] { [18:41:49.099] inherits <- base::inherits [18:41:49.099] invokeRestart <- base::invokeRestart [18:41:49.099] is.null <- base::is.null [18:41:49.099] muffled <- FALSE [18:41:49.099] if (inherits(cond, "message")) { [18:41:49.099] muffled <- grepl(pattern, "muffleMessage") [18:41:49.099] if (muffled) [18:41:49.099] invokeRestart("muffleMessage") [18:41:49.099] } [18:41:49.099] else if (inherits(cond, "warning")) { [18:41:49.099] muffled <- grepl(pattern, "muffleWarning") [18:41:49.099] if (muffled) [18:41:49.099] invokeRestart("muffleWarning") [18:41:49.099] } [18:41:49.099] else if (inherits(cond, "condition")) { [18:41:49.099] if (!is.null(pattern)) { [18:41:49.099] computeRestarts <- base::computeRestarts [18:41:49.099] grepl <- base::grepl [18:41:49.099] restarts <- computeRestarts(cond) [18:41:49.099] for (restart in restarts) { [18:41:49.099] name <- restart$name [18:41:49.099] if (is.null(name)) [18:41:49.099] next [18:41:49.099] if (!grepl(pattern, name)) [18:41:49.099] next [18:41:49.099] invokeRestart(restart) [18:41:49.099] muffled <- TRUE [18:41:49.099] break [18:41:49.099] } [18:41:49.099] } [18:41:49.099] } [18:41:49.099] invisible(muffled) [18:41:49.099] } [18:41:49.099] muffleCondition(cond, pattern = "^muffle") [18:41:49.099] } [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] if (TRUE) { [18:41:49.099] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.099] { [18:41:49.099] inherits <- base::inherits [18:41:49.099] invokeRestart <- base::invokeRestart [18:41:49.099] is.null <- base::is.null [18:41:49.099] muffled <- FALSE [18:41:49.099] if (inherits(cond, "message")) { [18:41:49.099] muffled <- grepl(pattern, "muffleMessage") [18:41:49.099] if (muffled) [18:41:49.099] invokeRestart("muffleMessage") [18:41:49.099] } [18:41:49.099] else if (inherits(cond, "warning")) { [18:41:49.099] muffled <- grepl(pattern, "muffleWarning") [18:41:49.099] if (muffled) [18:41:49.099] invokeRestart("muffleWarning") [18:41:49.099] } [18:41:49.099] else if (inherits(cond, "condition")) { [18:41:49.099] if (!is.null(pattern)) { [18:41:49.099] computeRestarts <- base::computeRestarts [18:41:49.099] grepl <- base::grepl [18:41:49.099] restarts <- computeRestarts(cond) [18:41:49.099] for (restart in restarts) { [18:41:49.099] name <- restart$name [18:41:49.099] if (is.null(name)) [18:41:49.099] next [18:41:49.099] if (!grepl(pattern, name)) [18:41:49.099] next [18:41:49.099] invokeRestart(restart) [18:41:49.099] muffled <- TRUE [18:41:49.099] break [18:41:49.099] } [18:41:49.099] } [18:41:49.099] } [18:41:49.099] invisible(muffled) [18:41:49.099] } [18:41:49.099] muffleCondition(cond, pattern = "^muffle") [18:41:49.099] } [18:41:49.099] } [18:41:49.099] } [18:41:49.099] })) [18:41:49.099] }, error = function(ex) { [18:41:49.099] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.099] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.099] ...future.rng), started = ...future.startTime, [18:41:49.099] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.099] version = "1.8"), class = "FutureResult") [18:41:49.099] }, finally = { [18:41:49.099] if (!identical(...future.workdir, getwd())) [18:41:49.099] setwd(...future.workdir) [18:41:49.099] { [18:41:49.099] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.099] ...future.oldOptions$nwarnings <- NULL [18:41:49.099] } [18:41:49.099] base::options(...future.oldOptions) [18:41:49.099] if (.Platform$OS.type == "windows") { [18:41:49.099] old_names <- names(...future.oldEnvVars) [18:41:49.099] envs <- base::Sys.getenv() [18:41:49.099] names <- names(envs) [18:41:49.099] common <- intersect(names, old_names) [18:41:49.099] added <- setdiff(names, old_names) [18:41:49.099] removed <- setdiff(old_names, names) [18:41:49.099] changed <- common[...future.oldEnvVars[common] != [18:41:49.099] envs[common]] [18:41:49.099] NAMES <- toupper(changed) [18:41:49.099] args <- list() [18:41:49.099] for (kk in seq_along(NAMES)) { [18:41:49.099] name <- changed[[kk]] [18:41:49.099] NAME <- NAMES[[kk]] [18:41:49.099] if (name != NAME && is.element(NAME, old_names)) [18:41:49.099] next [18:41:49.099] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.099] } [18:41:49.099] NAMES <- toupper(added) [18:41:49.099] for (kk in seq_along(NAMES)) { [18:41:49.099] name <- added[[kk]] [18:41:49.099] NAME <- NAMES[[kk]] [18:41:49.099] if (name != NAME && is.element(NAME, old_names)) [18:41:49.099] next [18:41:49.099] args[[name]] <- "" [18:41:49.099] } [18:41:49.099] NAMES <- toupper(removed) [18:41:49.099] for (kk in seq_along(NAMES)) { [18:41:49.099] name <- removed[[kk]] [18:41:49.099] NAME <- NAMES[[kk]] [18:41:49.099] if (name != NAME && is.element(NAME, old_names)) [18:41:49.099] next [18:41:49.099] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.099] } [18:41:49.099] if (length(args) > 0) [18:41:49.099] base::do.call(base::Sys.setenv, args = args) [18:41:49.099] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.099] } [18:41:49.099] { [18:41:49.099] if (base::length(...future.futureOptionsAdded) > [18:41:49.099] 0L) { [18:41:49.099] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.099] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.099] base::options(opts) [18:41:49.099] } [18:41:49.099] { [18:41:49.099] { [18:41:49.099] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.099] NULL [18:41:49.099] } [18:41:49.099] options(future.plan = NULL) [18:41:49.099] if (is.na(NA_character_)) [18:41:49.099] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.099] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.099] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.099] .init = FALSE) [18:41:49.099] } [18:41:49.099] } [18:41:49.099] } [18:41:49.099] }) [18:41:49.099] if (TRUE) { [18:41:49.099] base::sink(type = "output", split = FALSE) [18:41:49.099] if (TRUE) { [18:41:49.099] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.099] } [18:41:49.099] else { [18:41:49.099] ...future.result["stdout"] <- base::list(NULL) [18:41:49.099] } [18:41:49.099] base::close(...future.stdout) [18:41:49.099] ...future.stdout <- NULL [18:41:49.099] } [18:41:49.099] ...future.result$conditions <- ...future.conditions [18:41:49.099] ...future.result$finished <- base::Sys.time() [18:41:49.099] ...future.result [18:41:49.099] } [18:41:49.104] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... [18:41:49.104] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:49.105] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:49.105] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.105] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.106] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:49.106] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:49.106] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.107] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.107] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.107] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.107] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... DONE [18:41:49.108] MultisessionFuture started [18:41:49.108] - Launch lazy future ... done [18:41:49.108] run() for 'MultisessionFuture' ... done [18:41:49.109] Created future: [18:41:49.122] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.123] - Validating connection of MultisessionFuture [18:41:49.123] - received message: FutureResult [18:41:49.123] - Received FutureResult [18:41:49.123] - Erased future from FutureRegistry [18:41:49.124] result() for ClusterFuture ... [18:41:49.124] - result already collected: FutureResult [18:41:49.124] result() for ClusterFuture ... done [18:41:49.124] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.109] MultisessionFuture: [18:41:49.109] Label: 'future_sapply-1' [18:41:49.109] Expression: [18:41:49.109] { [18:41:49.109] do.call(function(...) { [18:41:49.109] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.109] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.109] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.109] on.exit(options(oopts), add = TRUE) [18:41:49.109] } [18:41:49.109] { [18:41:49.109] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.109] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.109] ...future.FUN(...future.X_jj, ...) [18:41:49.109] }) [18:41:49.109] } [18:41:49.109] }, args = future.call.arguments) [18:41:49.109] } [18:41:49.109] Lazy evaluation: FALSE [18:41:49.109] Asynchronous evaluation: TRUE [18:41:49.109] Local evaluation: TRUE [18:41:49.109] Environment: R_GlobalEnv [18:41:49.109] Capture standard output: TRUE [18:41:49.109] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.109] Globals: 5 objects totaling 1.00 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.109] Packages: [18:41:49.109] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.109] Resolved: TRUE [18:41:49.109] Value: [18:41:49.109] Conditions captured: [18:41:49.109] Early signaling: FALSE [18:41:49.109] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.109] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.124] Chunk #1 of 2 ... DONE [18:41:49.125] Chunk #2 of 2 ... [18:41:49.125] - Finding globals in 'X' for chunk #2 ... [18:41:49.125] getGlobalsAndPackages() ... [18:41:49.125] Searching for globals... [18:41:49.125] [18:41:49.126] Searching for globals ... DONE [18:41:49.126] - globals: [0] [18:41:49.126] getGlobalsAndPackages() ... DONE [18:41:49.126] + additional globals found: [n=0] [18:41:49.126] + additional namespaces needed: [n=0] [18:41:49.126] - Finding globals in 'X' for chunk #2 ... DONE [18:41:49.127] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.127] - seeds: [18:41:49.127] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.127] getGlobalsAndPackages() ... [18:41:49.127] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.127] Resolving globals: FALSE [18:41:49.128] Tweak future expression to call with '...' arguments ... [18:41:49.128] { [18:41:49.128] do.call(function(...) { [18:41:49.128] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.128] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.128] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.128] on.exit(options(oopts), add = TRUE) [18:41:49.128] } [18:41:49.128] { [18:41:49.128] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.128] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.128] ...future.FUN(...future.X_jj, ...) [18:41:49.128] }) [18:41:49.128] } [18:41:49.128] }, args = future.call.arguments) [18:41:49.128] } [18:41:49.128] Tweak future expression to call with '...' arguments ... DONE [18:41:49.129] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.129] [18:41:49.129] getGlobalsAndPackages() ... DONE [18:41:49.129] run() for 'Future' ... [18:41:49.130] - state: 'created' [18:41:49.130] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.153] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.154] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.154] - Field: 'node' [18:41:49.154] - Field: 'label' [18:41:49.154] - Field: 'local' [18:41:49.155] - Field: 'owner' [18:41:49.155] - Field: 'envir' [18:41:49.155] - Field: 'workers' [18:41:49.155] - Field: 'packages' [18:41:49.155] - Field: 'gc' [18:41:49.155] - Field: 'conditions' [18:41:49.156] - Field: 'persistent' [18:41:49.156] - Field: 'expr' [18:41:49.156] - Field: 'uuid' [18:41:49.156] - Field: 'seed' [18:41:49.156] - Field: 'version' [18:41:49.157] - Field: 'result' [18:41:49.157] - Field: 'asynchronous' [18:41:49.157] - Field: 'calls' [18:41:49.157] - Field: 'globals' [18:41:49.157] - Field: 'stdout' [18:41:49.157] - Field: 'earlySignal' [18:41:49.158] - Field: 'lazy' [18:41:49.158] - Field: 'state' [18:41:49.158] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.158] - Launch lazy future ... [18:41:49.158] Packages needed by the future expression (n = 0): [18:41:49.159] Packages needed by future strategies (n = 0): [18:41:49.159] { [18:41:49.159] { [18:41:49.159] { [18:41:49.159] ...future.startTime <- base::Sys.time() [18:41:49.159] { [18:41:49.159] { [18:41:49.159] { [18:41:49.159] { [18:41:49.159] base::local({ [18:41:49.159] has_future <- base::requireNamespace("future", [18:41:49.159] quietly = TRUE) [18:41:49.159] if (has_future) { [18:41:49.159] ns <- base::getNamespace("future") [18:41:49.159] version <- ns[[".package"]][["version"]] [18:41:49.159] if (is.null(version)) [18:41:49.159] version <- utils::packageVersion("future") [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] version <- NULL [18:41:49.159] } [18:41:49.159] if (!has_future || version < "1.8.0") { [18:41:49.159] info <- base::c(r_version = base::gsub("R version ", [18:41:49.159] "", base::R.version$version.string), [18:41:49.159] platform = base::sprintf("%s (%s-bit)", [18:41:49.159] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.159] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.159] "release", "version")], collapse = " "), [18:41:49.159] hostname = base::Sys.info()[["nodename"]]) [18:41:49.159] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.159] info) [18:41:49.159] info <- base::paste(info, collapse = "; ") [18:41:49.159] if (!has_future) { [18:41:49.159] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.159] info) [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.159] info, version) [18:41:49.159] } [18:41:49.159] base::stop(msg) [18:41:49.159] } [18:41:49.159] }) [18:41:49.159] } [18:41:49.159] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.159] base::options(mc.cores = 1L) [18:41:49.159] } [18:41:49.159] ...future.strategy.old <- future::plan("list") [18:41:49.159] options(future.plan = NULL) [18:41:49.159] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.159] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.159] } [18:41:49.159] ...future.workdir <- getwd() [18:41:49.159] } [18:41:49.159] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.159] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.159] } [18:41:49.159] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.159] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.159] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.159] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.159] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.159] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.159] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.159] base::names(...future.oldOptions)) [18:41:49.159] } [18:41:49.159] if (FALSE) { [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] if (TRUE) { [18:41:49.159] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.159] open = "w") [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.159] windows = "NUL", "/dev/null"), open = "w") [18:41:49.159] } [18:41:49.159] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.159] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.159] base::sink(type = "output", split = FALSE) [18:41:49.159] base::close(...future.stdout) [18:41:49.159] }, add = TRUE) [18:41:49.159] } [18:41:49.159] ...future.frame <- base::sys.nframe() [18:41:49.159] ...future.conditions <- base::list() [18:41:49.159] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.159] if (FALSE) { [18:41:49.159] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.159] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.159] } [18:41:49.159] ...future.result <- base::tryCatch({ [18:41:49.159] base::withCallingHandlers({ [18:41:49.159] ...future.value <- base::withVisible(base::local({ [18:41:49.159] ...future.makeSendCondition <- base::local({ [18:41:49.159] sendCondition <- NULL [18:41:49.159] function(frame = 1L) { [18:41:49.159] if (is.function(sendCondition)) [18:41:49.159] return(sendCondition) [18:41:49.159] ns <- getNamespace("parallel") [18:41:49.159] if (exists("sendData", mode = "function", [18:41:49.159] envir = ns)) { [18:41:49.159] parallel_sendData <- get("sendData", mode = "function", [18:41:49.159] envir = ns) [18:41:49.159] envir <- sys.frame(frame) [18:41:49.159] master <- NULL [18:41:49.159] while (!identical(envir, .GlobalEnv) && [18:41:49.159] !identical(envir, emptyenv())) { [18:41:49.159] if (exists("master", mode = "list", envir = envir, [18:41:49.159] inherits = FALSE)) { [18:41:49.159] master <- get("master", mode = "list", [18:41:49.159] envir = envir, inherits = FALSE) [18:41:49.159] if (inherits(master, c("SOCKnode", [18:41:49.159] "SOCK0node"))) { [18:41:49.159] sendCondition <<- function(cond) { [18:41:49.159] data <- list(type = "VALUE", value = cond, [18:41:49.159] success = TRUE) [18:41:49.159] parallel_sendData(master, data) [18:41:49.159] } [18:41:49.159] return(sendCondition) [18:41:49.159] } [18:41:49.159] } [18:41:49.159] frame <- frame + 1L [18:41:49.159] envir <- sys.frame(frame) [18:41:49.159] } [18:41:49.159] } [18:41:49.159] sendCondition <<- function(cond) NULL [18:41:49.159] } [18:41:49.159] }) [18:41:49.159] withCallingHandlers({ [18:41:49.159] { [18:41:49.159] do.call(function(...) { [18:41:49.159] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.159] if (!identical(...future.globals.maxSize.org, [18:41:49.159] ...future.globals.maxSize)) { [18:41:49.159] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.159] on.exit(options(oopts), add = TRUE) [18:41:49.159] } [18:41:49.159] { [18:41:49.159] lapply(seq_along(...future.elements_ii), [18:41:49.159] FUN = function(jj) { [18:41:49.159] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.159] ...future.FUN(...future.X_jj, ...) [18:41:49.159] }) [18:41:49.159] } [18:41:49.159] }, args = future.call.arguments) [18:41:49.159] } [18:41:49.159] }, immediateCondition = function(cond) { [18:41:49.159] sendCondition <- ...future.makeSendCondition() [18:41:49.159] sendCondition(cond) [18:41:49.159] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.159] { [18:41:49.159] inherits <- base::inherits [18:41:49.159] invokeRestart <- base::invokeRestart [18:41:49.159] is.null <- base::is.null [18:41:49.159] muffled <- FALSE [18:41:49.159] if (inherits(cond, "message")) { [18:41:49.159] muffled <- grepl(pattern, "muffleMessage") [18:41:49.159] if (muffled) [18:41:49.159] invokeRestart("muffleMessage") [18:41:49.159] } [18:41:49.159] else if (inherits(cond, "warning")) { [18:41:49.159] muffled <- grepl(pattern, "muffleWarning") [18:41:49.159] if (muffled) [18:41:49.159] invokeRestart("muffleWarning") [18:41:49.159] } [18:41:49.159] else if (inherits(cond, "condition")) { [18:41:49.159] if (!is.null(pattern)) { [18:41:49.159] computeRestarts <- base::computeRestarts [18:41:49.159] grepl <- base::grepl [18:41:49.159] restarts <- computeRestarts(cond) [18:41:49.159] for (restart in restarts) { [18:41:49.159] name <- restart$name [18:41:49.159] if (is.null(name)) [18:41:49.159] next [18:41:49.159] if (!grepl(pattern, name)) [18:41:49.159] next [18:41:49.159] invokeRestart(restart) [18:41:49.159] muffled <- TRUE [18:41:49.159] break [18:41:49.159] } [18:41:49.159] } [18:41:49.159] } [18:41:49.159] invisible(muffled) [18:41:49.159] } [18:41:49.159] muffleCondition(cond) [18:41:49.159] }) [18:41:49.159] })) [18:41:49.159] future::FutureResult(value = ...future.value$value, [18:41:49.159] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.159] ...future.rng), globalenv = if (FALSE) [18:41:49.159] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.159] ...future.globalenv.names)) [18:41:49.159] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.159] }, condition = base::local({ [18:41:49.159] c <- base::c [18:41:49.159] inherits <- base::inherits [18:41:49.159] invokeRestart <- base::invokeRestart [18:41:49.159] length <- base::length [18:41:49.159] list <- base::list [18:41:49.159] seq.int <- base::seq.int [18:41:49.159] signalCondition <- base::signalCondition [18:41:49.159] sys.calls <- base::sys.calls [18:41:49.159] `[[` <- base::`[[` [18:41:49.159] `+` <- base::`+` [18:41:49.159] `<<-` <- base::`<<-` [18:41:49.159] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.159] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.159] 3L)] [18:41:49.159] } [18:41:49.159] function(cond) { [18:41:49.159] is_error <- inherits(cond, "error") [18:41:49.159] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.159] NULL) [18:41:49.159] if (is_error) { [18:41:49.159] sessionInformation <- function() { [18:41:49.159] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.159] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.159] search = base::search(), system = base::Sys.info()) [18:41:49.159] } [18:41:49.159] ...future.conditions[[length(...future.conditions) + [18:41:49.159] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.159] cond$call), session = sessionInformation(), [18:41:49.159] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.159] signalCondition(cond) [18:41:49.159] } [18:41:49.159] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.159] "immediateCondition"))) { [18:41:49.159] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.159] ...future.conditions[[length(...future.conditions) + [18:41:49.159] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.159] if (TRUE && !signal) { [18:41:49.159] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.159] { [18:41:49.159] inherits <- base::inherits [18:41:49.159] invokeRestart <- base::invokeRestart [18:41:49.159] is.null <- base::is.null [18:41:49.159] muffled <- FALSE [18:41:49.159] if (inherits(cond, "message")) { [18:41:49.159] muffled <- grepl(pattern, "muffleMessage") [18:41:49.159] if (muffled) [18:41:49.159] invokeRestart("muffleMessage") [18:41:49.159] } [18:41:49.159] else if (inherits(cond, "warning")) { [18:41:49.159] muffled <- grepl(pattern, "muffleWarning") [18:41:49.159] if (muffled) [18:41:49.159] invokeRestart("muffleWarning") [18:41:49.159] } [18:41:49.159] else if (inherits(cond, "condition")) { [18:41:49.159] if (!is.null(pattern)) { [18:41:49.159] computeRestarts <- base::computeRestarts [18:41:49.159] grepl <- base::grepl [18:41:49.159] restarts <- computeRestarts(cond) [18:41:49.159] for (restart in restarts) { [18:41:49.159] name <- restart$name [18:41:49.159] if (is.null(name)) [18:41:49.159] next [18:41:49.159] if (!grepl(pattern, name)) [18:41:49.159] next [18:41:49.159] invokeRestart(restart) [18:41:49.159] muffled <- TRUE [18:41:49.159] break [18:41:49.159] } [18:41:49.159] } [18:41:49.159] } [18:41:49.159] invisible(muffled) [18:41:49.159] } [18:41:49.159] muffleCondition(cond, pattern = "^muffle") [18:41:49.159] } [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] if (TRUE) { [18:41:49.159] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.159] { [18:41:49.159] inherits <- base::inherits [18:41:49.159] invokeRestart <- base::invokeRestart [18:41:49.159] is.null <- base::is.null [18:41:49.159] muffled <- FALSE [18:41:49.159] if (inherits(cond, "message")) { [18:41:49.159] muffled <- grepl(pattern, "muffleMessage") [18:41:49.159] if (muffled) [18:41:49.159] invokeRestart("muffleMessage") [18:41:49.159] } [18:41:49.159] else if (inherits(cond, "warning")) { [18:41:49.159] muffled <- grepl(pattern, "muffleWarning") [18:41:49.159] if (muffled) [18:41:49.159] invokeRestart("muffleWarning") [18:41:49.159] } [18:41:49.159] else if (inherits(cond, "condition")) { [18:41:49.159] if (!is.null(pattern)) { [18:41:49.159] computeRestarts <- base::computeRestarts [18:41:49.159] grepl <- base::grepl [18:41:49.159] restarts <- computeRestarts(cond) [18:41:49.159] for (restart in restarts) { [18:41:49.159] name <- restart$name [18:41:49.159] if (is.null(name)) [18:41:49.159] next [18:41:49.159] if (!grepl(pattern, name)) [18:41:49.159] next [18:41:49.159] invokeRestart(restart) [18:41:49.159] muffled <- TRUE [18:41:49.159] break [18:41:49.159] } [18:41:49.159] } [18:41:49.159] } [18:41:49.159] invisible(muffled) [18:41:49.159] } [18:41:49.159] muffleCondition(cond, pattern = "^muffle") [18:41:49.159] } [18:41:49.159] } [18:41:49.159] } [18:41:49.159] })) [18:41:49.159] }, error = function(ex) { [18:41:49.159] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.159] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.159] ...future.rng), started = ...future.startTime, [18:41:49.159] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.159] version = "1.8"), class = "FutureResult") [18:41:49.159] }, finally = { [18:41:49.159] if (!identical(...future.workdir, getwd())) [18:41:49.159] setwd(...future.workdir) [18:41:49.159] { [18:41:49.159] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.159] ...future.oldOptions$nwarnings <- NULL [18:41:49.159] } [18:41:49.159] base::options(...future.oldOptions) [18:41:49.159] if (.Platform$OS.type == "windows") { [18:41:49.159] old_names <- names(...future.oldEnvVars) [18:41:49.159] envs <- base::Sys.getenv() [18:41:49.159] names <- names(envs) [18:41:49.159] common <- intersect(names, old_names) [18:41:49.159] added <- setdiff(names, old_names) [18:41:49.159] removed <- setdiff(old_names, names) [18:41:49.159] changed <- common[...future.oldEnvVars[common] != [18:41:49.159] envs[common]] [18:41:49.159] NAMES <- toupper(changed) [18:41:49.159] args <- list() [18:41:49.159] for (kk in seq_along(NAMES)) { [18:41:49.159] name <- changed[[kk]] [18:41:49.159] NAME <- NAMES[[kk]] [18:41:49.159] if (name != NAME && is.element(NAME, old_names)) [18:41:49.159] next [18:41:49.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.159] } [18:41:49.159] NAMES <- toupper(added) [18:41:49.159] for (kk in seq_along(NAMES)) { [18:41:49.159] name <- added[[kk]] [18:41:49.159] NAME <- NAMES[[kk]] [18:41:49.159] if (name != NAME && is.element(NAME, old_names)) [18:41:49.159] next [18:41:49.159] args[[name]] <- "" [18:41:49.159] } [18:41:49.159] NAMES <- toupper(removed) [18:41:49.159] for (kk in seq_along(NAMES)) { [18:41:49.159] name <- removed[[kk]] [18:41:49.159] NAME <- NAMES[[kk]] [18:41:49.159] if (name != NAME && is.element(NAME, old_names)) [18:41:49.159] next [18:41:49.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.159] } [18:41:49.159] if (length(args) > 0) [18:41:49.159] base::do.call(base::Sys.setenv, args = args) [18:41:49.159] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.159] } [18:41:49.159] { [18:41:49.159] if (base::length(...future.futureOptionsAdded) > [18:41:49.159] 0L) { [18:41:49.159] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.159] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.159] base::options(opts) [18:41:49.159] } [18:41:49.159] { [18:41:49.159] { [18:41:49.159] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.159] NULL [18:41:49.159] } [18:41:49.159] options(future.plan = NULL) [18:41:49.159] if (is.na(NA_character_)) [18:41:49.159] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.159] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.159] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.159] .init = FALSE) [18:41:49.159] } [18:41:49.159] } [18:41:49.159] } [18:41:49.159] }) [18:41:49.159] if (TRUE) { [18:41:49.159] base::sink(type = "output", split = FALSE) [18:41:49.159] if (TRUE) { [18:41:49.159] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.159] } [18:41:49.159] else { [18:41:49.159] ...future.result["stdout"] <- base::list(NULL) [18:41:49.159] } [18:41:49.159] base::close(...future.stdout) [18:41:49.159] ...future.stdout <- NULL [18:41:49.159] } [18:41:49.159] ...future.result$conditions <- ...future.conditions [18:41:49.159] ...future.result$finished <- base::Sys.time() [18:41:49.159] ...future.result [18:41:49.159] } [18:41:49.164] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:49.165] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:49.165] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:49.165] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.166] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.166] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:49.166] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:49.167] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.167] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.167] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.168] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.168] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:49.168] MultisessionFuture started [18:41:49.169] - Launch lazy future ... done [18:41:49.169] run() for 'MultisessionFuture' ... done [18:41:49.169] Created future: [18:41:49.182] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.183] - Validating connection of MultisessionFuture [18:41:49.183] - received message: FutureResult [18:41:49.183] - Received FutureResult [18:41:49.183] - Erased future from FutureRegistry [18:41:49.184] result() for ClusterFuture ... [18:41:49.184] - result already collected: FutureResult [18:41:49.184] result() for ClusterFuture ... done [18:41:49.184] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.169] MultisessionFuture: [18:41:49.169] Label: 'future_sapply-2' [18:41:49.169] Expression: [18:41:49.169] { [18:41:49.169] do.call(function(...) { [18:41:49.169] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.169] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.169] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.169] on.exit(options(oopts), add = TRUE) [18:41:49.169] } [18:41:49.169] { [18:41:49.169] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.169] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.169] ...future.FUN(...future.X_jj, ...) [18:41:49.169] }) [18:41:49.169] } [18:41:49.169] }, args = future.call.arguments) [18:41:49.169] } [18:41:49.169] Lazy evaluation: FALSE [18:41:49.169] Asynchronous evaluation: TRUE [18:41:49.169] Local evaluation: TRUE [18:41:49.169] Environment: R_GlobalEnv [18:41:49.169] Capture standard output: TRUE [18:41:49.169] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.169] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.169] Packages: [18:41:49.169] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.169] Resolved: TRUE [18:41:49.169] Value: [18:41:49.169] Conditions captured: [18:41:49.169] Early signaling: FALSE [18:41:49.169] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.169] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.185] Chunk #2 of 2 ... DONE [18:41:49.185] Launching 2 futures (chunks) ... DONE [18:41:49.185] Resolving 2 futures (chunks) ... [18:41:49.185] resolve() on list ... [18:41:49.185] recursive: 0 [18:41:49.185] length: 2 [18:41:49.185] [18:41:49.186] Future #1 [18:41:49.186] result() for ClusterFuture ... [18:41:49.186] - result already collected: FutureResult [18:41:49.186] result() for ClusterFuture ... done [18:41:49.186] result() for ClusterFuture ... [18:41:49.186] - result already collected: FutureResult [18:41:49.187] result() for ClusterFuture ... done [18:41:49.187] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:49.187] - nx: 2 [18:41:49.187] - relay: TRUE [18:41:49.187] - stdout: TRUE [18:41:49.187] - signal: TRUE [18:41:49.188] - resignal: FALSE [18:41:49.188] - force: TRUE [18:41:49.188] - relayed: [n=2] FALSE, FALSE [18:41:49.188] - queued futures: [n=2] FALSE, FALSE [18:41:49.188] - until=1 [18:41:49.188] - relaying element #1 [18:41:49.188] result() for ClusterFuture ... [18:41:49.189] - result already collected: FutureResult [18:41:49.189] result() for ClusterFuture ... done [18:41:49.189] result() for ClusterFuture ... [18:41:49.189] - result already collected: FutureResult [18:41:49.189] result() for ClusterFuture ... done [18:41:49.189] result() for ClusterFuture ... [18:41:49.190] - result already collected: FutureResult [18:41:49.190] result() for ClusterFuture ... done [18:41:49.190] result() for ClusterFuture ... [18:41:49.190] - result already collected: FutureResult [18:41:49.190] result() for ClusterFuture ... done [18:41:49.190] - relayed: [n=2] TRUE, FALSE [18:41:49.191] - queued futures: [n=2] TRUE, FALSE [18:41:49.191] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:49.191] length: 1 (resolved future 1) [18:41:49.191] Future #2 [18:41:49.191] result() for ClusterFuture ... [18:41:49.192] - result already collected: FutureResult [18:41:49.193] result() for ClusterFuture ... done [18:41:49.193] result() for ClusterFuture ... [18:41:49.193] - result already collected: FutureResult [18:41:49.193] result() for ClusterFuture ... done [18:41:49.193] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:49.194] - nx: 2 [18:41:49.194] - relay: TRUE [18:41:49.194] - stdout: TRUE [18:41:49.194] - signal: TRUE [18:41:49.194] - resignal: FALSE [18:41:49.194] - force: TRUE [18:41:49.195] - relayed: [n=2] TRUE, FALSE [18:41:49.195] - queued futures: [n=2] TRUE, FALSE [18:41:49.195] - until=2 [18:41:49.195] - relaying element #2 [18:41:49.195] result() for ClusterFuture ... [18:41:49.195] - result already collected: FutureResult [18:41:49.195] result() for ClusterFuture ... done [18:41:49.196] result() for ClusterFuture ... [18:41:49.196] - result already collected: FutureResult [18:41:49.196] result() for ClusterFuture ... done [18:41:49.196] result() for ClusterFuture ... [18:41:49.196] - result already collected: FutureResult [18:41:49.196] result() for ClusterFuture ... done [18:41:49.197] result() for ClusterFuture ... [18:41:49.197] - result already collected: FutureResult [18:41:49.197] result() for ClusterFuture ... done [18:41:49.197] - relayed: [n=2] TRUE, TRUE [18:41:49.197] - queued futures: [n=2] TRUE, TRUE [18:41:49.197] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:49.198] length: 0 (resolved future 2) [18:41:49.198] Relaying remaining futures [18:41:49.198] signalConditionsASAP(NULL, pos=0) ... [18:41:49.198] - nx: 2 [18:41:49.198] - relay: TRUE [18:41:49.198] - stdout: TRUE [18:41:49.199] - signal: TRUE [18:41:49.199] - resignal: FALSE [18:41:49.199] - force: TRUE [18:41:49.199] - relayed: [n=2] TRUE, TRUE [18:41:49.199] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:49.199] - relayed: [n=2] TRUE, TRUE [18:41:49.200] - queued futures: [n=2] TRUE, TRUE [18:41:49.200] signalConditionsASAP(NULL, pos=0) ... done [18:41:49.200] resolve() on list ... DONE [18:41:49.200] result() for ClusterFuture ... [18:41:49.200] - result already collected: FutureResult [18:41:49.200] result() for ClusterFuture ... done [18:41:49.201] result() for ClusterFuture ... [18:41:49.201] - result already collected: FutureResult [18:41:49.201] result() for ClusterFuture ... done [18:41:49.201] result() for ClusterFuture ... [18:41:49.201] - result already collected: FutureResult [18:41:49.201] result() for ClusterFuture ... done [18:41:49.201] result() for ClusterFuture ... [18:41:49.202] - result already collected: FutureResult [18:41:49.202] result() for ClusterFuture ... done [18:41:49.202] - Number of value chunks collected: 2 [18:41:49.202] Resolving 2 futures (chunks) ... DONE [18:41:49.202] Reducing values from 2 chunks ... [18:41:49.202] - Number of values collected after concatenation: 3 [18:41:49.203] - Number of values expected: 3 [18:41:49.203] Reducing values from 2 chunks ... DONE [18:41:49.203] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:15, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:49.206] future_lapply() ... [18:41:49.209] Number of chunks: 2 [18:41:49.210] getGlobalsAndPackagesXApply() ... [18:41:49.210] - future.globals: TRUE [18:41:49.210] getGlobalsAndPackages() ... [18:41:49.210] Searching for globals... [18:41:49.211] - globals found: [1] 'FUN' [18:41:49.212] Searching for globals ... DONE [18:41:49.212] Resolving globals: FALSE [18:41:49.212] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:49.213] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:49.213] - globals: [1] 'FUN' [18:41:49.213] [18:41:49.213] getGlobalsAndPackages() ... DONE [18:41:49.213] - globals found/used: [n=1] 'FUN' [18:41:49.214] - needed namespaces: [n=0] [18:41:49.214] Finding globals ... DONE [18:41:49.214] - use_args: TRUE [18:41:49.214] - Getting '...' globals ... [18:41:49.215] resolve() on list ... [18:41:49.215] recursive: 0 [18:41:49.215] length: 1 [18:41:49.215] elements: '...' [18:41:49.215] length: 0 (resolved future 1) [18:41:49.215] resolve() on list ... DONE [18:41:49.216] - '...' content: [n=0] [18:41:49.216] List of 1 [18:41:49.216] $ ...: list() [18:41:49.216] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.216] - attr(*, "where")=List of 1 [18:41:49.216] ..$ ...: [18:41:49.216] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.216] - attr(*, "resolved")= logi TRUE [18:41:49.216] - attr(*, "total_size")= num NA [18:41:49.219] - Getting '...' globals ... DONE [18:41:49.219] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:49.219] List of 2 [18:41:49.219] $ ...future.FUN:function (x) [18:41:49.219] $ ... : list() [18:41:49.219] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.219] - attr(*, "where")=List of 2 [18:41:49.219] ..$ ...future.FUN: [18:41:49.219] ..$ ... : [18:41:49.219] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.219] - attr(*, "resolved")= logi FALSE [18:41:49.219] - attr(*, "total_size")= int 4876 [18:41:49.223] Packages to be attached in all futures: [n=0] [18:41:49.223] getGlobalsAndPackagesXApply() ... DONE [18:41:49.223] Number of futures (= number of chunks): 2 [18:41:49.223] Launching 2 futures (chunks) ... [18:41:49.223] Chunk #1 of 2 ... [18:41:49.224] - Finding globals in 'X' for chunk #1 ... [18:41:49.224] getGlobalsAndPackages() ... [18:41:49.224] Searching for globals... [18:41:49.224] [18:41:49.224] Searching for globals ... DONE [18:41:49.225] - globals: [0] [18:41:49.225] getGlobalsAndPackages() ... DONE [18:41:49.225] + additional globals found: [n=0] [18:41:49.225] + additional namespaces needed: [n=0] [18:41:49.225] - Finding globals in 'X' for chunk #1 ... DONE [18:41:49.225] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.226] - seeds: [18:41:49.226] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.226] getGlobalsAndPackages() ... [18:41:49.226] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.226] Resolving globals: FALSE [18:41:49.226] Tweak future expression to call with '...' arguments ... [18:41:49.227] { [18:41:49.227] do.call(function(...) { [18:41:49.227] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.227] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.227] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.227] on.exit(options(oopts), add = TRUE) [18:41:49.227] } [18:41:49.227] { [18:41:49.227] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.227] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.227] ...future.FUN(...future.X_jj, ...) [18:41:49.227] }) [18:41:49.227] } [18:41:49.227] }, args = future.call.arguments) [18:41:49.227] } [18:41:49.227] Tweak future expression to call with '...' arguments ... DONE [18:41:49.228] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.228] [18:41:49.228] getGlobalsAndPackages() ... DONE [18:41:49.228] run() for 'Future' ... [18:41:49.229] - state: 'created' [18:41:49.229] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.244] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.244] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.244] - Field: 'node' [18:41:49.245] - Field: 'label' [18:41:49.245] - Field: 'local' [18:41:49.245] - Field: 'owner' [18:41:49.245] - Field: 'envir' [18:41:49.245] - Field: 'workers' [18:41:49.246] - Field: 'packages' [18:41:49.246] - Field: 'gc' [18:41:49.246] - Field: 'conditions' [18:41:49.246] - Field: 'persistent' [18:41:49.246] - Field: 'expr' [18:41:49.247] - Field: 'uuid' [18:41:49.247] - Field: 'seed' [18:41:49.247] - Field: 'version' [18:41:49.247] - Field: 'result' [18:41:49.247] - Field: 'asynchronous' [18:41:49.247] - Field: 'calls' [18:41:49.248] - Field: 'globals' [18:41:49.248] - Field: 'stdout' [18:41:49.248] - Field: 'earlySignal' [18:41:49.248] - Field: 'lazy' [18:41:49.248] - Field: 'state' [18:41:49.248] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.249] - Launch lazy future ... [18:41:49.249] Packages needed by the future expression (n = 0): [18:41:49.249] Packages needed by future strategies (n = 0): [18:41:49.250] { [18:41:49.250] { [18:41:49.250] { [18:41:49.250] ...future.startTime <- base::Sys.time() [18:41:49.250] { [18:41:49.250] { [18:41:49.250] { [18:41:49.250] { [18:41:49.250] base::local({ [18:41:49.250] has_future <- base::requireNamespace("future", [18:41:49.250] quietly = TRUE) [18:41:49.250] if (has_future) { [18:41:49.250] ns <- base::getNamespace("future") [18:41:49.250] version <- ns[[".package"]][["version"]] [18:41:49.250] if (is.null(version)) [18:41:49.250] version <- utils::packageVersion("future") [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] version <- NULL [18:41:49.250] } [18:41:49.250] if (!has_future || version < "1.8.0") { [18:41:49.250] info <- base::c(r_version = base::gsub("R version ", [18:41:49.250] "", base::R.version$version.string), [18:41:49.250] platform = base::sprintf("%s (%s-bit)", [18:41:49.250] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.250] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.250] "release", "version")], collapse = " "), [18:41:49.250] hostname = base::Sys.info()[["nodename"]]) [18:41:49.250] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.250] info) [18:41:49.250] info <- base::paste(info, collapse = "; ") [18:41:49.250] if (!has_future) { [18:41:49.250] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.250] info) [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.250] info, version) [18:41:49.250] } [18:41:49.250] base::stop(msg) [18:41:49.250] } [18:41:49.250] }) [18:41:49.250] } [18:41:49.250] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.250] base::options(mc.cores = 1L) [18:41:49.250] } [18:41:49.250] ...future.strategy.old <- future::plan("list") [18:41:49.250] options(future.plan = NULL) [18:41:49.250] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.250] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.250] } [18:41:49.250] ...future.workdir <- getwd() [18:41:49.250] } [18:41:49.250] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.250] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.250] } [18:41:49.250] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.250] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.250] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.250] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.250] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.250] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.250] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.250] base::names(...future.oldOptions)) [18:41:49.250] } [18:41:49.250] if (FALSE) { [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] if (TRUE) { [18:41:49.250] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.250] open = "w") [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.250] windows = "NUL", "/dev/null"), open = "w") [18:41:49.250] } [18:41:49.250] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.250] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.250] base::sink(type = "output", split = FALSE) [18:41:49.250] base::close(...future.stdout) [18:41:49.250] }, add = TRUE) [18:41:49.250] } [18:41:49.250] ...future.frame <- base::sys.nframe() [18:41:49.250] ...future.conditions <- base::list() [18:41:49.250] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.250] if (FALSE) { [18:41:49.250] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.250] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.250] } [18:41:49.250] ...future.result <- base::tryCatch({ [18:41:49.250] base::withCallingHandlers({ [18:41:49.250] ...future.value <- base::withVisible(base::local({ [18:41:49.250] ...future.makeSendCondition <- base::local({ [18:41:49.250] sendCondition <- NULL [18:41:49.250] function(frame = 1L) { [18:41:49.250] if (is.function(sendCondition)) [18:41:49.250] return(sendCondition) [18:41:49.250] ns <- getNamespace("parallel") [18:41:49.250] if (exists("sendData", mode = "function", [18:41:49.250] envir = ns)) { [18:41:49.250] parallel_sendData <- get("sendData", mode = "function", [18:41:49.250] envir = ns) [18:41:49.250] envir <- sys.frame(frame) [18:41:49.250] master <- NULL [18:41:49.250] while (!identical(envir, .GlobalEnv) && [18:41:49.250] !identical(envir, emptyenv())) { [18:41:49.250] if (exists("master", mode = "list", envir = envir, [18:41:49.250] inherits = FALSE)) { [18:41:49.250] master <- get("master", mode = "list", [18:41:49.250] envir = envir, inherits = FALSE) [18:41:49.250] if (inherits(master, c("SOCKnode", [18:41:49.250] "SOCK0node"))) { [18:41:49.250] sendCondition <<- function(cond) { [18:41:49.250] data <- list(type = "VALUE", value = cond, [18:41:49.250] success = TRUE) [18:41:49.250] parallel_sendData(master, data) [18:41:49.250] } [18:41:49.250] return(sendCondition) [18:41:49.250] } [18:41:49.250] } [18:41:49.250] frame <- frame + 1L [18:41:49.250] envir <- sys.frame(frame) [18:41:49.250] } [18:41:49.250] } [18:41:49.250] sendCondition <<- function(cond) NULL [18:41:49.250] } [18:41:49.250] }) [18:41:49.250] withCallingHandlers({ [18:41:49.250] { [18:41:49.250] do.call(function(...) { [18:41:49.250] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.250] if (!identical(...future.globals.maxSize.org, [18:41:49.250] ...future.globals.maxSize)) { [18:41:49.250] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.250] on.exit(options(oopts), add = TRUE) [18:41:49.250] } [18:41:49.250] { [18:41:49.250] lapply(seq_along(...future.elements_ii), [18:41:49.250] FUN = function(jj) { [18:41:49.250] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.250] ...future.FUN(...future.X_jj, ...) [18:41:49.250] }) [18:41:49.250] } [18:41:49.250] }, args = future.call.arguments) [18:41:49.250] } [18:41:49.250] }, immediateCondition = function(cond) { [18:41:49.250] sendCondition <- ...future.makeSendCondition() [18:41:49.250] sendCondition(cond) [18:41:49.250] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.250] { [18:41:49.250] inherits <- base::inherits [18:41:49.250] invokeRestart <- base::invokeRestart [18:41:49.250] is.null <- base::is.null [18:41:49.250] muffled <- FALSE [18:41:49.250] if (inherits(cond, "message")) { [18:41:49.250] muffled <- grepl(pattern, "muffleMessage") [18:41:49.250] if (muffled) [18:41:49.250] invokeRestart("muffleMessage") [18:41:49.250] } [18:41:49.250] else if (inherits(cond, "warning")) { [18:41:49.250] muffled <- grepl(pattern, "muffleWarning") [18:41:49.250] if (muffled) [18:41:49.250] invokeRestart("muffleWarning") [18:41:49.250] } [18:41:49.250] else if (inherits(cond, "condition")) { [18:41:49.250] if (!is.null(pattern)) { [18:41:49.250] computeRestarts <- base::computeRestarts [18:41:49.250] grepl <- base::grepl [18:41:49.250] restarts <- computeRestarts(cond) [18:41:49.250] for (restart in restarts) { [18:41:49.250] name <- restart$name [18:41:49.250] if (is.null(name)) [18:41:49.250] next [18:41:49.250] if (!grepl(pattern, name)) [18:41:49.250] next [18:41:49.250] invokeRestart(restart) [18:41:49.250] muffled <- TRUE [18:41:49.250] break [18:41:49.250] } [18:41:49.250] } [18:41:49.250] } [18:41:49.250] invisible(muffled) [18:41:49.250] } [18:41:49.250] muffleCondition(cond) [18:41:49.250] }) [18:41:49.250] })) [18:41:49.250] future::FutureResult(value = ...future.value$value, [18:41:49.250] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.250] ...future.rng), globalenv = if (FALSE) [18:41:49.250] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.250] ...future.globalenv.names)) [18:41:49.250] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.250] }, condition = base::local({ [18:41:49.250] c <- base::c [18:41:49.250] inherits <- base::inherits [18:41:49.250] invokeRestart <- base::invokeRestart [18:41:49.250] length <- base::length [18:41:49.250] list <- base::list [18:41:49.250] seq.int <- base::seq.int [18:41:49.250] signalCondition <- base::signalCondition [18:41:49.250] sys.calls <- base::sys.calls [18:41:49.250] `[[` <- base::`[[` [18:41:49.250] `+` <- base::`+` [18:41:49.250] `<<-` <- base::`<<-` [18:41:49.250] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.250] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.250] 3L)] [18:41:49.250] } [18:41:49.250] function(cond) { [18:41:49.250] is_error <- inherits(cond, "error") [18:41:49.250] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.250] NULL) [18:41:49.250] if (is_error) { [18:41:49.250] sessionInformation <- function() { [18:41:49.250] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.250] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.250] search = base::search(), system = base::Sys.info()) [18:41:49.250] } [18:41:49.250] ...future.conditions[[length(...future.conditions) + [18:41:49.250] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.250] cond$call), session = sessionInformation(), [18:41:49.250] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.250] signalCondition(cond) [18:41:49.250] } [18:41:49.250] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.250] "immediateCondition"))) { [18:41:49.250] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.250] ...future.conditions[[length(...future.conditions) + [18:41:49.250] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.250] if (TRUE && !signal) { [18:41:49.250] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.250] { [18:41:49.250] inherits <- base::inherits [18:41:49.250] invokeRestart <- base::invokeRestart [18:41:49.250] is.null <- base::is.null [18:41:49.250] muffled <- FALSE [18:41:49.250] if (inherits(cond, "message")) { [18:41:49.250] muffled <- grepl(pattern, "muffleMessage") [18:41:49.250] if (muffled) [18:41:49.250] invokeRestart("muffleMessage") [18:41:49.250] } [18:41:49.250] else if (inherits(cond, "warning")) { [18:41:49.250] muffled <- grepl(pattern, "muffleWarning") [18:41:49.250] if (muffled) [18:41:49.250] invokeRestart("muffleWarning") [18:41:49.250] } [18:41:49.250] else if (inherits(cond, "condition")) { [18:41:49.250] if (!is.null(pattern)) { [18:41:49.250] computeRestarts <- base::computeRestarts [18:41:49.250] grepl <- base::grepl [18:41:49.250] restarts <- computeRestarts(cond) [18:41:49.250] for (restart in restarts) { [18:41:49.250] name <- restart$name [18:41:49.250] if (is.null(name)) [18:41:49.250] next [18:41:49.250] if (!grepl(pattern, name)) [18:41:49.250] next [18:41:49.250] invokeRestart(restart) [18:41:49.250] muffled <- TRUE [18:41:49.250] break [18:41:49.250] } [18:41:49.250] } [18:41:49.250] } [18:41:49.250] invisible(muffled) [18:41:49.250] } [18:41:49.250] muffleCondition(cond, pattern = "^muffle") [18:41:49.250] } [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] if (TRUE) { [18:41:49.250] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.250] { [18:41:49.250] inherits <- base::inherits [18:41:49.250] invokeRestart <- base::invokeRestart [18:41:49.250] is.null <- base::is.null [18:41:49.250] muffled <- FALSE [18:41:49.250] if (inherits(cond, "message")) { [18:41:49.250] muffled <- grepl(pattern, "muffleMessage") [18:41:49.250] if (muffled) [18:41:49.250] invokeRestart("muffleMessage") [18:41:49.250] } [18:41:49.250] else if (inherits(cond, "warning")) { [18:41:49.250] muffled <- grepl(pattern, "muffleWarning") [18:41:49.250] if (muffled) [18:41:49.250] invokeRestart("muffleWarning") [18:41:49.250] } [18:41:49.250] else if (inherits(cond, "condition")) { [18:41:49.250] if (!is.null(pattern)) { [18:41:49.250] computeRestarts <- base::computeRestarts [18:41:49.250] grepl <- base::grepl [18:41:49.250] restarts <- computeRestarts(cond) [18:41:49.250] for (restart in restarts) { [18:41:49.250] name <- restart$name [18:41:49.250] if (is.null(name)) [18:41:49.250] next [18:41:49.250] if (!grepl(pattern, name)) [18:41:49.250] next [18:41:49.250] invokeRestart(restart) [18:41:49.250] muffled <- TRUE [18:41:49.250] break [18:41:49.250] } [18:41:49.250] } [18:41:49.250] } [18:41:49.250] invisible(muffled) [18:41:49.250] } [18:41:49.250] muffleCondition(cond, pattern = "^muffle") [18:41:49.250] } [18:41:49.250] } [18:41:49.250] } [18:41:49.250] })) [18:41:49.250] }, error = function(ex) { [18:41:49.250] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.250] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.250] ...future.rng), started = ...future.startTime, [18:41:49.250] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.250] version = "1.8"), class = "FutureResult") [18:41:49.250] }, finally = { [18:41:49.250] if (!identical(...future.workdir, getwd())) [18:41:49.250] setwd(...future.workdir) [18:41:49.250] { [18:41:49.250] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.250] ...future.oldOptions$nwarnings <- NULL [18:41:49.250] } [18:41:49.250] base::options(...future.oldOptions) [18:41:49.250] if (.Platform$OS.type == "windows") { [18:41:49.250] old_names <- names(...future.oldEnvVars) [18:41:49.250] envs <- base::Sys.getenv() [18:41:49.250] names <- names(envs) [18:41:49.250] common <- intersect(names, old_names) [18:41:49.250] added <- setdiff(names, old_names) [18:41:49.250] removed <- setdiff(old_names, names) [18:41:49.250] changed <- common[...future.oldEnvVars[common] != [18:41:49.250] envs[common]] [18:41:49.250] NAMES <- toupper(changed) [18:41:49.250] args <- list() [18:41:49.250] for (kk in seq_along(NAMES)) { [18:41:49.250] name <- changed[[kk]] [18:41:49.250] NAME <- NAMES[[kk]] [18:41:49.250] if (name != NAME && is.element(NAME, old_names)) [18:41:49.250] next [18:41:49.250] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.250] } [18:41:49.250] NAMES <- toupper(added) [18:41:49.250] for (kk in seq_along(NAMES)) { [18:41:49.250] name <- added[[kk]] [18:41:49.250] NAME <- NAMES[[kk]] [18:41:49.250] if (name != NAME && is.element(NAME, old_names)) [18:41:49.250] next [18:41:49.250] args[[name]] <- "" [18:41:49.250] } [18:41:49.250] NAMES <- toupper(removed) [18:41:49.250] for (kk in seq_along(NAMES)) { [18:41:49.250] name <- removed[[kk]] [18:41:49.250] NAME <- NAMES[[kk]] [18:41:49.250] if (name != NAME && is.element(NAME, old_names)) [18:41:49.250] next [18:41:49.250] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.250] } [18:41:49.250] if (length(args) > 0) [18:41:49.250] base::do.call(base::Sys.setenv, args = args) [18:41:49.250] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.250] } [18:41:49.250] { [18:41:49.250] if (base::length(...future.futureOptionsAdded) > [18:41:49.250] 0L) { [18:41:49.250] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.250] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.250] base::options(opts) [18:41:49.250] } [18:41:49.250] { [18:41:49.250] { [18:41:49.250] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.250] NULL [18:41:49.250] } [18:41:49.250] options(future.plan = NULL) [18:41:49.250] if (is.na(NA_character_)) [18:41:49.250] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.250] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.250] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.250] .init = FALSE) [18:41:49.250] } [18:41:49.250] } [18:41:49.250] } [18:41:49.250] }) [18:41:49.250] if (TRUE) { [18:41:49.250] base::sink(type = "output", split = FALSE) [18:41:49.250] if (TRUE) { [18:41:49.250] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.250] } [18:41:49.250] else { [18:41:49.250] ...future.result["stdout"] <- base::list(NULL) [18:41:49.250] } [18:41:49.250] base::close(...future.stdout) [18:41:49.250] ...future.stdout <- NULL [18:41:49.250] } [18:41:49.250] ...future.result$conditions <- ...future.conditions [18:41:49.250] ...future.result$finished <- base::Sys.time() [18:41:49.250] ...future.result [18:41:49.250] } [18:41:49.255] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:49.255] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:49.256] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:49.256] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.257] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.257] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:49.257] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:49.257] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.258] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.258] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.258] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.259] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:49.259] MultisessionFuture started [18:41:49.259] - Launch lazy future ... done [18:41:49.260] run() for 'MultisessionFuture' ... done [18:41:49.260] Created future: [18:41:49.272] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.273] - Validating connection of MultisessionFuture [18:41:49.273] - received message: FutureResult [18:41:49.273] - Received FutureResult [18:41:49.273] - Erased future from FutureRegistry [18:41:49.274] result() for ClusterFuture ... [18:41:49.274] - result already collected: FutureResult [18:41:49.274] result() for ClusterFuture ... done [18:41:49.274] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.260] MultisessionFuture: [18:41:49.260] Label: 'future_sapply-1' [18:41:49.260] Expression: [18:41:49.260] { [18:41:49.260] do.call(function(...) { [18:41:49.260] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.260] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.260] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.260] on.exit(options(oopts), add = TRUE) [18:41:49.260] } [18:41:49.260] { [18:41:49.260] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.260] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.260] ...future.FUN(...future.X_jj, ...) [18:41:49.260] }) [18:41:49.260] } [18:41:49.260] }, args = future.call.arguments) [18:41:49.260] } [18:41:49.260] Lazy evaluation: FALSE [18:41:49.260] Asynchronous evaluation: TRUE [18:41:49.260] Local evaluation: TRUE [18:41:49.260] Environment: R_GlobalEnv [18:41:49.260] Capture standard output: TRUE [18:41:49.260] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.260] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.260] Packages: [18:41:49.260] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.260] Resolved: TRUE [18:41:49.260] Value: [18:41:49.260] Conditions captured: [18:41:49.260] Early signaling: FALSE [18:41:49.260] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.260] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.274] Chunk #1 of 2 ... DONE [18:41:49.275] Chunk #2 of 2 ... [18:41:49.275] - Finding globals in 'X' for chunk #2 ... [18:41:49.275] getGlobalsAndPackages() ... [18:41:49.275] Searching for globals... [18:41:49.276] [18:41:49.276] Searching for globals ... DONE [18:41:49.276] - globals: [0] [18:41:49.276] getGlobalsAndPackages() ... DONE [18:41:49.276] + additional globals found: [n=0] [18:41:49.276] + additional namespaces needed: [n=0] [18:41:49.276] - Finding globals in 'X' for chunk #2 ... DONE [18:41:49.277] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.277] - seeds: [18:41:49.277] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.277] getGlobalsAndPackages() ... [18:41:49.277] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.277] Resolving globals: FALSE [18:41:49.278] Tweak future expression to call with '...' arguments ... [18:41:49.278] { [18:41:49.278] do.call(function(...) { [18:41:49.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.278] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.278] on.exit(options(oopts), add = TRUE) [18:41:49.278] } [18:41:49.278] { [18:41:49.278] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.278] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.278] ...future.FUN(...future.X_jj, ...) [18:41:49.278] }) [18:41:49.278] } [18:41:49.278] }, args = future.call.arguments) [18:41:49.278] } [18:41:49.278] Tweak future expression to call with '...' arguments ... DONE [18:41:49.279] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.279] [18:41:49.279] getGlobalsAndPackages() ... DONE [18:41:49.280] run() for 'Future' ... [18:41:49.280] - state: 'created' [18:41:49.280] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.296] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.296] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.296] - Field: 'node' [18:41:49.296] - Field: 'label' [18:41:49.296] - Field: 'local' [18:41:49.297] - Field: 'owner' [18:41:49.297] - Field: 'envir' [18:41:49.297] - Field: 'workers' [18:41:49.297] - Field: 'packages' [18:41:49.297] - Field: 'gc' [18:41:49.297] - Field: 'conditions' [18:41:49.298] - Field: 'persistent' [18:41:49.298] - Field: 'expr' [18:41:49.298] - Field: 'uuid' [18:41:49.298] - Field: 'seed' [18:41:49.298] - Field: 'version' [18:41:49.299] - Field: 'result' [18:41:49.299] - Field: 'asynchronous' [18:41:49.299] - Field: 'calls' [18:41:49.299] - Field: 'globals' [18:41:49.299] - Field: 'stdout' [18:41:49.299] - Field: 'earlySignal' [18:41:49.300] - Field: 'lazy' [18:41:49.300] - Field: 'state' [18:41:49.300] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.300] - Launch lazy future ... [18:41:49.300] Packages needed by the future expression (n = 0): [18:41:49.301] Packages needed by future strategies (n = 0): [18:41:49.301] { [18:41:49.301] { [18:41:49.301] { [18:41:49.301] ...future.startTime <- base::Sys.time() [18:41:49.301] { [18:41:49.301] { [18:41:49.301] { [18:41:49.301] { [18:41:49.301] base::local({ [18:41:49.301] has_future <- base::requireNamespace("future", [18:41:49.301] quietly = TRUE) [18:41:49.301] if (has_future) { [18:41:49.301] ns <- base::getNamespace("future") [18:41:49.301] version <- ns[[".package"]][["version"]] [18:41:49.301] if (is.null(version)) [18:41:49.301] version <- utils::packageVersion("future") [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] version <- NULL [18:41:49.301] } [18:41:49.301] if (!has_future || version < "1.8.0") { [18:41:49.301] info <- base::c(r_version = base::gsub("R version ", [18:41:49.301] "", base::R.version$version.string), [18:41:49.301] platform = base::sprintf("%s (%s-bit)", [18:41:49.301] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.301] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.301] "release", "version")], collapse = " "), [18:41:49.301] hostname = base::Sys.info()[["nodename"]]) [18:41:49.301] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.301] info) [18:41:49.301] info <- base::paste(info, collapse = "; ") [18:41:49.301] if (!has_future) { [18:41:49.301] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.301] info) [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.301] info, version) [18:41:49.301] } [18:41:49.301] base::stop(msg) [18:41:49.301] } [18:41:49.301] }) [18:41:49.301] } [18:41:49.301] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.301] base::options(mc.cores = 1L) [18:41:49.301] } [18:41:49.301] ...future.strategy.old <- future::plan("list") [18:41:49.301] options(future.plan = NULL) [18:41:49.301] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.301] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.301] } [18:41:49.301] ...future.workdir <- getwd() [18:41:49.301] } [18:41:49.301] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.301] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.301] } [18:41:49.301] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.301] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.301] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.301] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.301] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.301] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.301] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.301] base::names(...future.oldOptions)) [18:41:49.301] } [18:41:49.301] if (FALSE) { [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] if (TRUE) { [18:41:49.301] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.301] open = "w") [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.301] windows = "NUL", "/dev/null"), open = "w") [18:41:49.301] } [18:41:49.301] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.301] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.301] base::sink(type = "output", split = FALSE) [18:41:49.301] base::close(...future.stdout) [18:41:49.301] }, add = TRUE) [18:41:49.301] } [18:41:49.301] ...future.frame <- base::sys.nframe() [18:41:49.301] ...future.conditions <- base::list() [18:41:49.301] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.301] if (FALSE) { [18:41:49.301] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.301] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.301] } [18:41:49.301] ...future.result <- base::tryCatch({ [18:41:49.301] base::withCallingHandlers({ [18:41:49.301] ...future.value <- base::withVisible(base::local({ [18:41:49.301] ...future.makeSendCondition <- base::local({ [18:41:49.301] sendCondition <- NULL [18:41:49.301] function(frame = 1L) { [18:41:49.301] if (is.function(sendCondition)) [18:41:49.301] return(sendCondition) [18:41:49.301] ns <- getNamespace("parallel") [18:41:49.301] if (exists("sendData", mode = "function", [18:41:49.301] envir = ns)) { [18:41:49.301] parallel_sendData <- get("sendData", mode = "function", [18:41:49.301] envir = ns) [18:41:49.301] envir <- sys.frame(frame) [18:41:49.301] master <- NULL [18:41:49.301] while (!identical(envir, .GlobalEnv) && [18:41:49.301] !identical(envir, emptyenv())) { [18:41:49.301] if (exists("master", mode = "list", envir = envir, [18:41:49.301] inherits = FALSE)) { [18:41:49.301] master <- get("master", mode = "list", [18:41:49.301] envir = envir, inherits = FALSE) [18:41:49.301] if (inherits(master, c("SOCKnode", [18:41:49.301] "SOCK0node"))) { [18:41:49.301] sendCondition <<- function(cond) { [18:41:49.301] data <- list(type = "VALUE", value = cond, [18:41:49.301] success = TRUE) [18:41:49.301] parallel_sendData(master, data) [18:41:49.301] } [18:41:49.301] return(sendCondition) [18:41:49.301] } [18:41:49.301] } [18:41:49.301] frame <- frame + 1L [18:41:49.301] envir <- sys.frame(frame) [18:41:49.301] } [18:41:49.301] } [18:41:49.301] sendCondition <<- function(cond) NULL [18:41:49.301] } [18:41:49.301] }) [18:41:49.301] withCallingHandlers({ [18:41:49.301] { [18:41:49.301] do.call(function(...) { [18:41:49.301] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.301] if (!identical(...future.globals.maxSize.org, [18:41:49.301] ...future.globals.maxSize)) { [18:41:49.301] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.301] on.exit(options(oopts), add = TRUE) [18:41:49.301] } [18:41:49.301] { [18:41:49.301] lapply(seq_along(...future.elements_ii), [18:41:49.301] FUN = function(jj) { [18:41:49.301] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.301] ...future.FUN(...future.X_jj, ...) [18:41:49.301] }) [18:41:49.301] } [18:41:49.301] }, args = future.call.arguments) [18:41:49.301] } [18:41:49.301] }, immediateCondition = function(cond) { [18:41:49.301] sendCondition <- ...future.makeSendCondition() [18:41:49.301] sendCondition(cond) [18:41:49.301] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.301] { [18:41:49.301] inherits <- base::inherits [18:41:49.301] invokeRestart <- base::invokeRestart [18:41:49.301] is.null <- base::is.null [18:41:49.301] muffled <- FALSE [18:41:49.301] if (inherits(cond, "message")) { [18:41:49.301] muffled <- grepl(pattern, "muffleMessage") [18:41:49.301] if (muffled) [18:41:49.301] invokeRestart("muffleMessage") [18:41:49.301] } [18:41:49.301] else if (inherits(cond, "warning")) { [18:41:49.301] muffled <- grepl(pattern, "muffleWarning") [18:41:49.301] if (muffled) [18:41:49.301] invokeRestart("muffleWarning") [18:41:49.301] } [18:41:49.301] else if (inherits(cond, "condition")) { [18:41:49.301] if (!is.null(pattern)) { [18:41:49.301] computeRestarts <- base::computeRestarts [18:41:49.301] grepl <- base::grepl [18:41:49.301] restarts <- computeRestarts(cond) [18:41:49.301] for (restart in restarts) { [18:41:49.301] name <- restart$name [18:41:49.301] if (is.null(name)) [18:41:49.301] next [18:41:49.301] if (!grepl(pattern, name)) [18:41:49.301] next [18:41:49.301] invokeRestart(restart) [18:41:49.301] muffled <- TRUE [18:41:49.301] break [18:41:49.301] } [18:41:49.301] } [18:41:49.301] } [18:41:49.301] invisible(muffled) [18:41:49.301] } [18:41:49.301] muffleCondition(cond) [18:41:49.301] }) [18:41:49.301] })) [18:41:49.301] future::FutureResult(value = ...future.value$value, [18:41:49.301] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.301] ...future.rng), globalenv = if (FALSE) [18:41:49.301] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.301] ...future.globalenv.names)) [18:41:49.301] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.301] }, condition = base::local({ [18:41:49.301] c <- base::c [18:41:49.301] inherits <- base::inherits [18:41:49.301] invokeRestart <- base::invokeRestart [18:41:49.301] length <- base::length [18:41:49.301] list <- base::list [18:41:49.301] seq.int <- base::seq.int [18:41:49.301] signalCondition <- base::signalCondition [18:41:49.301] sys.calls <- base::sys.calls [18:41:49.301] `[[` <- base::`[[` [18:41:49.301] `+` <- base::`+` [18:41:49.301] `<<-` <- base::`<<-` [18:41:49.301] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.301] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.301] 3L)] [18:41:49.301] } [18:41:49.301] function(cond) { [18:41:49.301] is_error <- inherits(cond, "error") [18:41:49.301] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.301] NULL) [18:41:49.301] if (is_error) { [18:41:49.301] sessionInformation <- function() { [18:41:49.301] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.301] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.301] search = base::search(), system = base::Sys.info()) [18:41:49.301] } [18:41:49.301] ...future.conditions[[length(...future.conditions) + [18:41:49.301] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.301] cond$call), session = sessionInformation(), [18:41:49.301] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.301] signalCondition(cond) [18:41:49.301] } [18:41:49.301] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.301] "immediateCondition"))) { [18:41:49.301] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.301] ...future.conditions[[length(...future.conditions) + [18:41:49.301] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.301] if (TRUE && !signal) { [18:41:49.301] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.301] { [18:41:49.301] inherits <- base::inherits [18:41:49.301] invokeRestart <- base::invokeRestart [18:41:49.301] is.null <- base::is.null [18:41:49.301] muffled <- FALSE [18:41:49.301] if (inherits(cond, "message")) { [18:41:49.301] muffled <- grepl(pattern, "muffleMessage") [18:41:49.301] if (muffled) [18:41:49.301] invokeRestart("muffleMessage") [18:41:49.301] } [18:41:49.301] else if (inherits(cond, "warning")) { [18:41:49.301] muffled <- grepl(pattern, "muffleWarning") [18:41:49.301] if (muffled) [18:41:49.301] invokeRestart("muffleWarning") [18:41:49.301] } [18:41:49.301] else if (inherits(cond, "condition")) { [18:41:49.301] if (!is.null(pattern)) { [18:41:49.301] computeRestarts <- base::computeRestarts [18:41:49.301] grepl <- base::grepl [18:41:49.301] restarts <- computeRestarts(cond) [18:41:49.301] for (restart in restarts) { [18:41:49.301] name <- restart$name [18:41:49.301] if (is.null(name)) [18:41:49.301] next [18:41:49.301] if (!grepl(pattern, name)) [18:41:49.301] next [18:41:49.301] invokeRestart(restart) [18:41:49.301] muffled <- TRUE [18:41:49.301] break [18:41:49.301] } [18:41:49.301] } [18:41:49.301] } [18:41:49.301] invisible(muffled) [18:41:49.301] } [18:41:49.301] muffleCondition(cond, pattern = "^muffle") [18:41:49.301] } [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] if (TRUE) { [18:41:49.301] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.301] { [18:41:49.301] inherits <- base::inherits [18:41:49.301] invokeRestart <- base::invokeRestart [18:41:49.301] is.null <- base::is.null [18:41:49.301] muffled <- FALSE [18:41:49.301] if (inherits(cond, "message")) { [18:41:49.301] muffled <- grepl(pattern, "muffleMessage") [18:41:49.301] if (muffled) [18:41:49.301] invokeRestart("muffleMessage") [18:41:49.301] } [18:41:49.301] else if (inherits(cond, "warning")) { [18:41:49.301] muffled <- grepl(pattern, "muffleWarning") [18:41:49.301] if (muffled) [18:41:49.301] invokeRestart("muffleWarning") [18:41:49.301] } [18:41:49.301] else if (inherits(cond, "condition")) { [18:41:49.301] if (!is.null(pattern)) { [18:41:49.301] computeRestarts <- base::computeRestarts [18:41:49.301] grepl <- base::grepl [18:41:49.301] restarts <- computeRestarts(cond) [18:41:49.301] for (restart in restarts) { [18:41:49.301] name <- restart$name [18:41:49.301] if (is.null(name)) [18:41:49.301] next [18:41:49.301] if (!grepl(pattern, name)) [18:41:49.301] next [18:41:49.301] invokeRestart(restart) [18:41:49.301] muffled <- TRUE [18:41:49.301] break [18:41:49.301] } [18:41:49.301] } [18:41:49.301] } [18:41:49.301] invisible(muffled) [18:41:49.301] } [18:41:49.301] muffleCondition(cond, pattern = "^muffle") [18:41:49.301] } [18:41:49.301] } [18:41:49.301] } [18:41:49.301] })) [18:41:49.301] }, error = function(ex) { [18:41:49.301] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.301] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.301] ...future.rng), started = ...future.startTime, [18:41:49.301] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.301] version = "1.8"), class = "FutureResult") [18:41:49.301] }, finally = { [18:41:49.301] if (!identical(...future.workdir, getwd())) [18:41:49.301] setwd(...future.workdir) [18:41:49.301] { [18:41:49.301] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.301] ...future.oldOptions$nwarnings <- NULL [18:41:49.301] } [18:41:49.301] base::options(...future.oldOptions) [18:41:49.301] if (.Platform$OS.type == "windows") { [18:41:49.301] old_names <- names(...future.oldEnvVars) [18:41:49.301] envs <- base::Sys.getenv() [18:41:49.301] names <- names(envs) [18:41:49.301] common <- intersect(names, old_names) [18:41:49.301] added <- setdiff(names, old_names) [18:41:49.301] removed <- setdiff(old_names, names) [18:41:49.301] changed <- common[...future.oldEnvVars[common] != [18:41:49.301] envs[common]] [18:41:49.301] NAMES <- toupper(changed) [18:41:49.301] args <- list() [18:41:49.301] for (kk in seq_along(NAMES)) { [18:41:49.301] name <- changed[[kk]] [18:41:49.301] NAME <- NAMES[[kk]] [18:41:49.301] if (name != NAME && is.element(NAME, old_names)) [18:41:49.301] next [18:41:49.301] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.301] } [18:41:49.301] NAMES <- toupper(added) [18:41:49.301] for (kk in seq_along(NAMES)) { [18:41:49.301] name <- added[[kk]] [18:41:49.301] NAME <- NAMES[[kk]] [18:41:49.301] if (name != NAME && is.element(NAME, old_names)) [18:41:49.301] next [18:41:49.301] args[[name]] <- "" [18:41:49.301] } [18:41:49.301] NAMES <- toupper(removed) [18:41:49.301] for (kk in seq_along(NAMES)) { [18:41:49.301] name <- removed[[kk]] [18:41:49.301] NAME <- NAMES[[kk]] [18:41:49.301] if (name != NAME && is.element(NAME, old_names)) [18:41:49.301] next [18:41:49.301] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.301] } [18:41:49.301] if (length(args) > 0) [18:41:49.301] base::do.call(base::Sys.setenv, args = args) [18:41:49.301] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.301] } [18:41:49.301] { [18:41:49.301] if (base::length(...future.futureOptionsAdded) > [18:41:49.301] 0L) { [18:41:49.301] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.301] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.301] base::options(opts) [18:41:49.301] } [18:41:49.301] { [18:41:49.301] { [18:41:49.301] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.301] NULL [18:41:49.301] } [18:41:49.301] options(future.plan = NULL) [18:41:49.301] if (is.na(NA_character_)) [18:41:49.301] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.301] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.301] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.301] .init = FALSE) [18:41:49.301] } [18:41:49.301] } [18:41:49.301] } [18:41:49.301] }) [18:41:49.301] if (TRUE) { [18:41:49.301] base::sink(type = "output", split = FALSE) [18:41:49.301] if (TRUE) { [18:41:49.301] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.301] } [18:41:49.301] else { [18:41:49.301] ...future.result["stdout"] <- base::list(NULL) [18:41:49.301] } [18:41:49.301] base::close(...future.stdout) [18:41:49.301] ...future.stdout <- NULL [18:41:49.301] } [18:41:49.301] ...future.result$conditions <- ...future.conditions [18:41:49.301] ...future.result$finished <- base::Sys.time() [18:41:49.301] ...future.result [18:41:49.301] } [18:41:49.306] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:49.307] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:49.307] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:49.307] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.308] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.308] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:49.308] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:49.309] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.309] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.309] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.310] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.310] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:49.310] MultisessionFuture started [18:41:49.311] - Launch lazy future ... done [18:41:49.311] run() for 'MultisessionFuture' ... done [18:41:49.311] Created future: [18:41:49.325] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.325] - Validating connection of MultisessionFuture [18:41:49.325] - received message: FutureResult [18:41:49.325] - Received FutureResult [18:41:49.325] - Erased future from FutureRegistry [18:41:49.326] result() for ClusterFuture ... [18:41:49.326] - result already collected: FutureResult [18:41:49.326] result() for ClusterFuture ... done [18:41:49.326] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.311] MultisessionFuture: [18:41:49.311] Label: 'future_sapply-2' [18:41:49.311] Expression: [18:41:49.311] { [18:41:49.311] do.call(function(...) { [18:41:49.311] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.311] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.311] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.311] on.exit(options(oopts), add = TRUE) [18:41:49.311] } [18:41:49.311] { [18:41:49.311] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.311] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.311] ...future.FUN(...future.X_jj, ...) [18:41:49.311] }) [18:41:49.311] } [18:41:49.311] }, args = future.call.arguments) [18:41:49.311] } [18:41:49.311] Lazy evaluation: FALSE [18:41:49.311] Asynchronous evaluation: TRUE [18:41:49.311] Local evaluation: TRUE [18:41:49.311] Environment: R_GlobalEnv [18:41:49.311] Capture standard output: TRUE [18:41:49.311] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.311] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.311] Packages: [18:41:49.311] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.311] Resolved: TRUE [18:41:49.311] Value: [18:41:49.311] Conditions captured: [18:41:49.311] Early signaling: FALSE [18:41:49.311] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.311] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.327] Chunk #2 of 2 ... DONE [18:41:49.327] Launching 2 futures (chunks) ... DONE [18:41:49.327] Resolving 2 futures (chunks) ... [18:41:49.327] resolve() on list ... [18:41:49.327] recursive: 0 [18:41:49.327] length: 2 [18:41:49.328] [18:41:49.328] Future #1 [18:41:49.328] result() for ClusterFuture ... [18:41:49.328] - result already collected: FutureResult [18:41:49.328] result() for ClusterFuture ... done [18:41:49.328] result() for ClusterFuture ... [18:41:49.328] - result already collected: FutureResult [18:41:49.329] result() for ClusterFuture ... done [18:41:49.329] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:49.329] - nx: 2 [18:41:49.329] - relay: TRUE [18:41:49.329] - stdout: TRUE [18:41:49.329] - signal: TRUE [18:41:49.330] - resignal: FALSE [18:41:49.330] - force: TRUE [18:41:49.330] - relayed: [n=2] FALSE, FALSE [18:41:49.330] - queued futures: [n=2] FALSE, FALSE [18:41:49.330] - until=1 [18:41:49.330] - relaying element #1 [18:41:49.331] result() for ClusterFuture ... [18:41:49.331] - result already collected: FutureResult [18:41:49.331] result() for ClusterFuture ... done [18:41:49.331] result() for ClusterFuture ... [18:41:49.331] - result already collected: FutureResult [18:41:49.331] result() for ClusterFuture ... done [18:41:49.332] result() for ClusterFuture ... [18:41:49.332] - result already collected: FutureResult [18:41:49.332] result() for ClusterFuture ... done [18:41:49.332] result() for ClusterFuture ... [18:41:49.332] - result already collected: FutureResult [18:41:49.332] result() for ClusterFuture ... done [18:41:49.333] - relayed: [n=2] TRUE, FALSE [18:41:49.333] - queued futures: [n=2] TRUE, FALSE [18:41:49.333] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:49.333] length: 1 (resolved future 1) [18:41:49.333] Future #2 [18:41:49.334] result() for ClusterFuture ... [18:41:49.334] - result already collected: FutureResult [18:41:49.334] result() for ClusterFuture ... done [18:41:49.334] result() for ClusterFuture ... [18:41:49.334] - result already collected: FutureResult [18:41:49.334] result() for ClusterFuture ... done [18:41:49.335] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:49.335] - nx: 2 [18:41:49.335] - relay: TRUE [18:41:49.335] - stdout: TRUE [18:41:49.335] - signal: TRUE [18:41:49.335] - resignal: FALSE [18:41:49.336] - force: TRUE [18:41:49.336] - relayed: [n=2] TRUE, FALSE [18:41:49.336] - queued futures: [n=2] TRUE, FALSE [18:41:49.336] - until=2 [18:41:49.336] - relaying element #2 [18:41:49.336] result() for ClusterFuture ... [18:41:49.337] - result already collected: FutureResult [18:41:49.337] result() for ClusterFuture ... done [18:41:49.337] result() for ClusterFuture ... [18:41:49.337] - result already collected: FutureResult [18:41:49.340] result() for ClusterFuture ... done [18:41:49.341] result() for ClusterFuture ... [18:41:49.341] - result already collected: FutureResult [18:41:49.341] result() for ClusterFuture ... done [18:41:49.341] result() for ClusterFuture ... [18:41:49.341] - result already collected: FutureResult [18:41:49.342] result() for ClusterFuture ... done [18:41:49.342] - relayed: [n=2] TRUE, TRUE [18:41:49.342] - queued futures: [n=2] TRUE, TRUE [18:41:49.342] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:49.342] length: 0 (resolved future 2) [18:41:49.342] Relaying remaining futures [18:41:49.343] signalConditionsASAP(NULL, pos=0) ... [18:41:49.343] - nx: 2 [18:41:49.343] - relay: TRUE [18:41:49.343] - stdout: TRUE [18:41:49.343] - signal: TRUE [18:41:49.343] - resignal: FALSE [18:41:49.343] - force: TRUE [18:41:49.344] - relayed: [n=2] TRUE, TRUE [18:41:49.344] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:49.344] - relayed: [n=2] TRUE, TRUE [18:41:49.344] - queued futures: [n=2] TRUE, TRUE [18:41:49.344] signalConditionsASAP(NULL, pos=0) ... done [18:41:49.344] resolve() on list ... DONE [18:41:49.345] result() for ClusterFuture ... [18:41:49.345] - result already collected: FutureResult [18:41:49.345] result() for ClusterFuture ... done [18:41:49.345] result() for ClusterFuture ... [18:41:49.345] - result already collected: FutureResult [18:41:49.345] result() for ClusterFuture ... done [18:41:49.346] result() for ClusterFuture ... [18:41:49.346] - result already collected: FutureResult [18:41:49.346] result() for ClusterFuture ... done [18:41:49.346] result() for ClusterFuture ... [18:41:49.346] - result already collected: FutureResult [18:41:49.346] result() for ClusterFuture ... done [18:41:49.347] - Number of value chunks collected: 2 [18:41:49.347] Resolving 2 futures (chunks) ... DONE [18:41:49.347] Reducing values from 2 chunks ... [18:41:49.347] - Number of values collected after concatenation: 3 [18:41:49.347] - Number of values expected: 3 [18:41:49.347] Reducing values from 2 chunks ... DONE [18:41:49.347] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:49.350] future_lapply() ... [18:41:49.352] Number of chunks: 2 [18:41:49.353] getGlobalsAndPackagesXApply() ... [18:41:49.353] - future.globals: TRUE [18:41:49.353] getGlobalsAndPackages() ... [18:41:49.353] Searching for globals... [18:41:49.354] - globals found: [2] 'FUN', 'UseMethod' [18:41:49.355] Searching for globals ... DONE [18:41:49.355] Resolving globals: FALSE [18:41:49.355] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:49.356] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:49.356] - globals: [1] 'FUN' [18:41:49.356] [18:41:49.356] getGlobalsAndPackages() ... DONE [18:41:49.356] - globals found/used: [n=1] 'FUN' [18:41:49.357] - needed namespaces: [n=0] [18:41:49.357] Finding globals ... DONE [18:41:49.357] - use_args: TRUE [18:41:49.357] - Getting '...' globals ... [18:41:49.358] resolve() on list ... [18:41:49.358] recursive: 0 [18:41:49.358] length: 1 [18:41:49.358] elements: '...' [18:41:49.358] length: 0 (resolved future 1) [18:41:49.358] resolve() on list ... DONE [18:41:49.359] - '...' content: [n=0] [18:41:49.359] List of 1 [18:41:49.359] $ ...: list() [18:41:49.359] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.359] - attr(*, "where")=List of 1 [18:41:49.359] ..$ ...: [18:41:49.359] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.359] - attr(*, "resolved")= logi TRUE [18:41:49.359] - attr(*, "total_size")= num NA [18:41:49.362] - Getting '...' globals ... DONE [18:41:49.362] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:49.362] List of 2 [18:41:49.362] $ ...future.FUN:function (x, ...) [18:41:49.362] $ ... : list() [18:41:49.362] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.362] - attr(*, "where")=List of 2 [18:41:49.362] ..$ ...future.FUN: [18:41:49.362] ..$ ... : [18:41:49.362] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.362] - attr(*, "resolved")= logi FALSE [18:41:49.362] - attr(*, "total_size")= int 5116 [18:41:49.366] Packages to be attached in all futures: [n=0] [18:41:49.366] getGlobalsAndPackagesXApply() ... DONE [18:41:49.366] Number of futures (= number of chunks): 2 [18:41:49.366] Launching 2 futures (chunks) ... [18:41:49.366] Chunk #1 of 2 ... [18:41:49.367] - Finding globals in 'X' for chunk #1 ... [18:41:49.367] getGlobalsAndPackages() ... [18:41:49.367] Searching for globals... [18:41:49.367] [18:41:49.367] Searching for globals ... DONE [18:41:49.368] - globals: [0] [18:41:49.368] getGlobalsAndPackages() ... DONE [18:41:49.368] + additional globals found: [n=0] [18:41:49.368] + additional namespaces needed: [n=0] [18:41:49.368] - Finding globals in 'X' for chunk #1 ... DONE [18:41:49.368] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.369] - seeds: [18:41:49.369] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.369] getGlobalsAndPackages() ... [18:41:49.369] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.369] Resolving globals: FALSE [18:41:49.369] Tweak future expression to call with '...' arguments ... [18:41:49.370] { [18:41:49.370] do.call(function(...) { [18:41:49.370] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.370] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.370] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.370] on.exit(options(oopts), add = TRUE) [18:41:49.370] } [18:41:49.370] { [18:41:49.370] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.370] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.370] ...future.FUN(...future.X_jj, ...) [18:41:49.370] }) [18:41:49.370] } [18:41:49.370] }, args = future.call.arguments) [18:41:49.370] } [18:41:49.370] Tweak future expression to call with '...' arguments ... DONE [18:41:49.371] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.371] [18:41:49.371] getGlobalsAndPackages() ... DONE [18:41:49.371] run() for 'Future' ... [18:41:49.371] - state: 'created' [18:41:49.372] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.387] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.388] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.388] - Field: 'node' [18:41:49.388] - Field: 'label' [18:41:49.388] - Field: 'local' [18:41:49.388] - Field: 'owner' [18:41:49.389] - Field: 'envir' [18:41:49.389] - Field: 'workers' [18:41:49.389] - Field: 'packages' [18:41:49.389] - Field: 'gc' [18:41:49.389] - Field: 'conditions' [18:41:49.389] - Field: 'persistent' [18:41:49.390] - Field: 'expr' [18:41:49.390] - Field: 'uuid' [18:41:49.390] - Field: 'seed' [18:41:49.390] - Field: 'version' [18:41:49.390] - Field: 'result' [18:41:49.391] - Field: 'asynchronous' [18:41:49.391] - Field: 'calls' [18:41:49.391] - Field: 'globals' [18:41:49.391] - Field: 'stdout' [18:41:49.391] - Field: 'earlySignal' [18:41:49.391] - Field: 'lazy' [18:41:49.392] - Field: 'state' [18:41:49.392] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.392] - Launch lazy future ... [18:41:49.392] Packages needed by the future expression (n = 0): [18:41:49.393] Packages needed by future strategies (n = 0): [18:41:49.393] { [18:41:49.393] { [18:41:49.393] { [18:41:49.393] ...future.startTime <- base::Sys.time() [18:41:49.393] { [18:41:49.393] { [18:41:49.393] { [18:41:49.393] { [18:41:49.393] base::local({ [18:41:49.393] has_future <- base::requireNamespace("future", [18:41:49.393] quietly = TRUE) [18:41:49.393] if (has_future) { [18:41:49.393] ns <- base::getNamespace("future") [18:41:49.393] version <- ns[[".package"]][["version"]] [18:41:49.393] if (is.null(version)) [18:41:49.393] version <- utils::packageVersion("future") [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] version <- NULL [18:41:49.393] } [18:41:49.393] if (!has_future || version < "1.8.0") { [18:41:49.393] info <- base::c(r_version = base::gsub("R version ", [18:41:49.393] "", base::R.version$version.string), [18:41:49.393] platform = base::sprintf("%s (%s-bit)", [18:41:49.393] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.393] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.393] "release", "version")], collapse = " "), [18:41:49.393] hostname = base::Sys.info()[["nodename"]]) [18:41:49.393] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.393] info) [18:41:49.393] info <- base::paste(info, collapse = "; ") [18:41:49.393] if (!has_future) { [18:41:49.393] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.393] info) [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.393] info, version) [18:41:49.393] } [18:41:49.393] base::stop(msg) [18:41:49.393] } [18:41:49.393] }) [18:41:49.393] } [18:41:49.393] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.393] base::options(mc.cores = 1L) [18:41:49.393] } [18:41:49.393] ...future.strategy.old <- future::plan("list") [18:41:49.393] options(future.plan = NULL) [18:41:49.393] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.393] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.393] } [18:41:49.393] ...future.workdir <- getwd() [18:41:49.393] } [18:41:49.393] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.393] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.393] } [18:41:49.393] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.393] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.393] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.393] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.393] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.393] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.393] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.393] base::names(...future.oldOptions)) [18:41:49.393] } [18:41:49.393] if (FALSE) { [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] if (TRUE) { [18:41:49.393] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.393] open = "w") [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.393] windows = "NUL", "/dev/null"), open = "w") [18:41:49.393] } [18:41:49.393] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.393] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.393] base::sink(type = "output", split = FALSE) [18:41:49.393] base::close(...future.stdout) [18:41:49.393] }, add = TRUE) [18:41:49.393] } [18:41:49.393] ...future.frame <- base::sys.nframe() [18:41:49.393] ...future.conditions <- base::list() [18:41:49.393] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.393] if (FALSE) { [18:41:49.393] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.393] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.393] } [18:41:49.393] ...future.result <- base::tryCatch({ [18:41:49.393] base::withCallingHandlers({ [18:41:49.393] ...future.value <- base::withVisible(base::local({ [18:41:49.393] ...future.makeSendCondition <- base::local({ [18:41:49.393] sendCondition <- NULL [18:41:49.393] function(frame = 1L) { [18:41:49.393] if (is.function(sendCondition)) [18:41:49.393] return(sendCondition) [18:41:49.393] ns <- getNamespace("parallel") [18:41:49.393] if (exists("sendData", mode = "function", [18:41:49.393] envir = ns)) { [18:41:49.393] parallel_sendData <- get("sendData", mode = "function", [18:41:49.393] envir = ns) [18:41:49.393] envir <- sys.frame(frame) [18:41:49.393] master <- NULL [18:41:49.393] while (!identical(envir, .GlobalEnv) && [18:41:49.393] !identical(envir, emptyenv())) { [18:41:49.393] if (exists("master", mode = "list", envir = envir, [18:41:49.393] inherits = FALSE)) { [18:41:49.393] master <- get("master", mode = "list", [18:41:49.393] envir = envir, inherits = FALSE) [18:41:49.393] if (inherits(master, c("SOCKnode", [18:41:49.393] "SOCK0node"))) { [18:41:49.393] sendCondition <<- function(cond) { [18:41:49.393] data <- list(type = "VALUE", value = cond, [18:41:49.393] success = TRUE) [18:41:49.393] parallel_sendData(master, data) [18:41:49.393] } [18:41:49.393] return(sendCondition) [18:41:49.393] } [18:41:49.393] } [18:41:49.393] frame <- frame + 1L [18:41:49.393] envir <- sys.frame(frame) [18:41:49.393] } [18:41:49.393] } [18:41:49.393] sendCondition <<- function(cond) NULL [18:41:49.393] } [18:41:49.393] }) [18:41:49.393] withCallingHandlers({ [18:41:49.393] { [18:41:49.393] do.call(function(...) { [18:41:49.393] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.393] if (!identical(...future.globals.maxSize.org, [18:41:49.393] ...future.globals.maxSize)) { [18:41:49.393] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.393] on.exit(options(oopts), add = TRUE) [18:41:49.393] } [18:41:49.393] { [18:41:49.393] lapply(seq_along(...future.elements_ii), [18:41:49.393] FUN = function(jj) { [18:41:49.393] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.393] ...future.FUN(...future.X_jj, ...) [18:41:49.393] }) [18:41:49.393] } [18:41:49.393] }, args = future.call.arguments) [18:41:49.393] } [18:41:49.393] }, immediateCondition = function(cond) { [18:41:49.393] sendCondition <- ...future.makeSendCondition() [18:41:49.393] sendCondition(cond) [18:41:49.393] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.393] { [18:41:49.393] inherits <- base::inherits [18:41:49.393] invokeRestart <- base::invokeRestart [18:41:49.393] is.null <- base::is.null [18:41:49.393] muffled <- FALSE [18:41:49.393] if (inherits(cond, "message")) { [18:41:49.393] muffled <- grepl(pattern, "muffleMessage") [18:41:49.393] if (muffled) [18:41:49.393] invokeRestart("muffleMessage") [18:41:49.393] } [18:41:49.393] else if (inherits(cond, "warning")) { [18:41:49.393] muffled <- grepl(pattern, "muffleWarning") [18:41:49.393] if (muffled) [18:41:49.393] invokeRestart("muffleWarning") [18:41:49.393] } [18:41:49.393] else if (inherits(cond, "condition")) { [18:41:49.393] if (!is.null(pattern)) { [18:41:49.393] computeRestarts <- base::computeRestarts [18:41:49.393] grepl <- base::grepl [18:41:49.393] restarts <- computeRestarts(cond) [18:41:49.393] for (restart in restarts) { [18:41:49.393] name <- restart$name [18:41:49.393] if (is.null(name)) [18:41:49.393] next [18:41:49.393] if (!grepl(pattern, name)) [18:41:49.393] next [18:41:49.393] invokeRestart(restart) [18:41:49.393] muffled <- TRUE [18:41:49.393] break [18:41:49.393] } [18:41:49.393] } [18:41:49.393] } [18:41:49.393] invisible(muffled) [18:41:49.393] } [18:41:49.393] muffleCondition(cond) [18:41:49.393] }) [18:41:49.393] })) [18:41:49.393] future::FutureResult(value = ...future.value$value, [18:41:49.393] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.393] ...future.rng), globalenv = if (FALSE) [18:41:49.393] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.393] ...future.globalenv.names)) [18:41:49.393] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.393] }, condition = base::local({ [18:41:49.393] c <- base::c [18:41:49.393] inherits <- base::inherits [18:41:49.393] invokeRestart <- base::invokeRestart [18:41:49.393] length <- base::length [18:41:49.393] list <- base::list [18:41:49.393] seq.int <- base::seq.int [18:41:49.393] signalCondition <- base::signalCondition [18:41:49.393] sys.calls <- base::sys.calls [18:41:49.393] `[[` <- base::`[[` [18:41:49.393] `+` <- base::`+` [18:41:49.393] `<<-` <- base::`<<-` [18:41:49.393] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.393] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.393] 3L)] [18:41:49.393] } [18:41:49.393] function(cond) { [18:41:49.393] is_error <- inherits(cond, "error") [18:41:49.393] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.393] NULL) [18:41:49.393] if (is_error) { [18:41:49.393] sessionInformation <- function() { [18:41:49.393] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.393] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.393] search = base::search(), system = base::Sys.info()) [18:41:49.393] } [18:41:49.393] ...future.conditions[[length(...future.conditions) + [18:41:49.393] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.393] cond$call), session = sessionInformation(), [18:41:49.393] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.393] signalCondition(cond) [18:41:49.393] } [18:41:49.393] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.393] "immediateCondition"))) { [18:41:49.393] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.393] ...future.conditions[[length(...future.conditions) + [18:41:49.393] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.393] if (TRUE && !signal) { [18:41:49.393] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.393] { [18:41:49.393] inherits <- base::inherits [18:41:49.393] invokeRestart <- base::invokeRestart [18:41:49.393] is.null <- base::is.null [18:41:49.393] muffled <- FALSE [18:41:49.393] if (inherits(cond, "message")) { [18:41:49.393] muffled <- grepl(pattern, "muffleMessage") [18:41:49.393] if (muffled) [18:41:49.393] invokeRestart("muffleMessage") [18:41:49.393] } [18:41:49.393] else if (inherits(cond, "warning")) { [18:41:49.393] muffled <- grepl(pattern, "muffleWarning") [18:41:49.393] if (muffled) [18:41:49.393] invokeRestart("muffleWarning") [18:41:49.393] } [18:41:49.393] else if (inherits(cond, "condition")) { [18:41:49.393] if (!is.null(pattern)) { [18:41:49.393] computeRestarts <- base::computeRestarts [18:41:49.393] grepl <- base::grepl [18:41:49.393] restarts <- computeRestarts(cond) [18:41:49.393] for (restart in restarts) { [18:41:49.393] name <- restart$name [18:41:49.393] if (is.null(name)) [18:41:49.393] next [18:41:49.393] if (!grepl(pattern, name)) [18:41:49.393] next [18:41:49.393] invokeRestart(restart) [18:41:49.393] muffled <- TRUE [18:41:49.393] break [18:41:49.393] } [18:41:49.393] } [18:41:49.393] } [18:41:49.393] invisible(muffled) [18:41:49.393] } [18:41:49.393] muffleCondition(cond, pattern = "^muffle") [18:41:49.393] } [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] if (TRUE) { [18:41:49.393] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.393] { [18:41:49.393] inherits <- base::inherits [18:41:49.393] invokeRestart <- base::invokeRestart [18:41:49.393] is.null <- base::is.null [18:41:49.393] muffled <- FALSE [18:41:49.393] if (inherits(cond, "message")) { [18:41:49.393] muffled <- grepl(pattern, "muffleMessage") [18:41:49.393] if (muffled) [18:41:49.393] invokeRestart("muffleMessage") [18:41:49.393] } [18:41:49.393] else if (inherits(cond, "warning")) { [18:41:49.393] muffled <- grepl(pattern, "muffleWarning") [18:41:49.393] if (muffled) [18:41:49.393] invokeRestart("muffleWarning") [18:41:49.393] } [18:41:49.393] else if (inherits(cond, "condition")) { [18:41:49.393] if (!is.null(pattern)) { [18:41:49.393] computeRestarts <- base::computeRestarts [18:41:49.393] grepl <- base::grepl [18:41:49.393] restarts <- computeRestarts(cond) [18:41:49.393] for (restart in restarts) { [18:41:49.393] name <- restart$name [18:41:49.393] if (is.null(name)) [18:41:49.393] next [18:41:49.393] if (!grepl(pattern, name)) [18:41:49.393] next [18:41:49.393] invokeRestart(restart) [18:41:49.393] muffled <- TRUE [18:41:49.393] break [18:41:49.393] } [18:41:49.393] } [18:41:49.393] } [18:41:49.393] invisible(muffled) [18:41:49.393] } [18:41:49.393] muffleCondition(cond, pattern = "^muffle") [18:41:49.393] } [18:41:49.393] } [18:41:49.393] } [18:41:49.393] })) [18:41:49.393] }, error = function(ex) { [18:41:49.393] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.393] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.393] ...future.rng), started = ...future.startTime, [18:41:49.393] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.393] version = "1.8"), class = "FutureResult") [18:41:49.393] }, finally = { [18:41:49.393] if (!identical(...future.workdir, getwd())) [18:41:49.393] setwd(...future.workdir) [18:41:49.393] { [18:41:49.393] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.393] ...future.oldOptions$nwarnings <- NULL [18:41:49.393] } [18:41:49.393] base::options(...future.oldOptions) [18:41:49.393] if (.Platform$OS.type == "windows") { [18:41:49.393] old_names <- names(...future.oldEnvVars) [18:41:49.393] envs <- base::Sys.getenv() [18:41:49.393] names <- names(envs) [18:41:49.393] common <- intersect(names, old_names) [18:41:49.393] added <- setdiff(names, old_names) [18:41:49.393] removed <- setdiff(old_names, names) [18:41:49.393] changed <- common[...future.oldEnvVars[common] != [18:41:49.393] envs[common]] [18:41:49.393] NAMES <- toupper(changed) [18:41:49.393] args <- list() [18:41:49.393] for (kk in seq_along(NAMES)) { [18:41:49.393] name <- changed[[kk]] [18:41:49.393] NAME <- NAMES[[kk]] [18:41:49.393] if (name != NAME && is.element(NAME, old_names)) [18:41:49.393] next [18:41:49.393] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.393] } [18:41:49.393] NAMES <- toupper(added) [18:41:49.393] for (kk in seq_along(NAMES)) { [18:41:49.393] name <- added[[kk]] [18:41:49.393] NAME <- NAMES[[kk]] [18:41:49.393] if (name != NAME && is.element(NAME, old_names)) [18:41:49.393] next [18:41:49.393] args[[name]] <- "" [18:41:49.393] } [18:41:49.393] NAMES <- toupper(removed) [18:41:49.393] for (kk in seq_along(NAMES)) { [18:41:49.393] name <- removed[[kk]] [18:41:49.393] NAME <- NAMES[[kk]] [18:41:49.393] if (name != NAME && is.element(NAME, old_names)) [18:41:49.393] next [18:41:49.393] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.393] } [18:41:49.393] if (length(args) > 0) [18:41:49.393] base::do.call(base::Sys.setenv, args = args) [18:41:49.393] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.393] } [18:41:49.393] { [18:41:49.393] if (base::length(...future.futureOptionsAdded) > [18:41:49.393] 0L) { [18:41:49.393] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.393] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.393] base::options(opts) [18:41:49.393] } [18:41:49.393] { [18:41:49.393] { [18:41:49.393] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.393] NULL [18:41:49.393] } [18:41:49.393] options(future.plan = NULL) [18:41:49.393] if (is.na(NA_character_)) [18:41:49.393] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.393] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.393] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.393] .init = FALSE) [18:41:49.393] } [18:41:49.393] } [18:41:49.393] } [18:41:49.393] }) [18:41:49.393] if (TRUE) { [18:41:49.393] base::sink(type = "output", split = FALSE) [18:41:49.393] if (TRUE) { [18:41:49.393] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.393] } [18:41:49.393] else { [18:41:49.393] ...future.result["stdout"] <- base::list(NULL) [18:41:49.393] } [18:41:49.393] base::close(...future.stdout) [18:41:49.393] ...future.stdout <- NULL [18:41:49.393] } [18:41:49.393] ...future.result$conditions <- ...future.conditions [18:41:49.393] ...future.result$finished <- base::Sys.time() [18:41:49.393] ...future.result [18:41:49.393] } [18:41:49.400] Exporting 5 global objects (968 bytes) to cluster node #1 ... [18:41:49.400] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:49.400] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:49.401] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.401] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.401] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:49.402] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:49.402] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.402] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.402] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.403] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.403] Exporting 5 global objects (968 bytes) to cluster node #1 ... DONE [18:41:49.404] MultisessionFuture started [18:41:49.404] - Launch lazy future ... done [18:41:49.404] run() for 'MultisessionFuture' ... done [18:41:49.404] Created future: [18:41:49.418] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.418] - Validating connection of MultisessionFuture [18:41:49.418] - received message: FutureResult [18:41:49.418] - Received FutureResult [18:41:49.419] - Erased future from FutureRegistry [18:41:49.419] result() for ClusterFuture ... [18:41:49.419] - result already collected: FutureResult [18:41:49.419] result() for ClusterFuture ... done [18:41:49.419] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.404] MultisessionFuture: [18:41:49.404] Label: 'future_sapply-1' [18:41:49.404] Expression: [18:41:49.404] { [18:41:49.404] do.call(function(...) { [18:41:49.404] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.404] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.404] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.404] on.exit(options(oopts), add = TRUE) [18:41:49.404] } [18:41:49.404] { [18:41:49.404] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.404] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.404] ...future.FUN(...future.X_jj, ...) [18:41:49.404] }) [18:41:49.404] } [18:41:49.404] }, args = future.call.arguments) [18:41:49.404] } [18:41:49.404] Lazy evaluation: FALSE [18:41:49.404] Asynchronous evaluation: TRUE [18:41:49.404] Local evaluation: TRUE [18:41:49.404] Environment: R_GlobalEnv [18:41:49.404] Capture standard output: TRUE [18:41:49.404] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.404] Globals: 5 objects totaling 518 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.404] Packages: [18:41:49.404] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.404] Resolved: TRUE [18:41:49.404] Value: [18:41:49.404] Conditions captured: [18:41:49.404] Early signaling: FALSE [18:41:49.404] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.404] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.420] Chunk #1 of 2 ... DONE [18:41:49.420] Chunk #2 of 2 ... [18:41:49.420] - Finding globals in 'X' for chunk #2 ... [18:41:49.420] getGlobalsAndPackages() ... [18:41:49.420] Searching for globals... [18:41:49.421] [18:41:49.421] Searching for globals ... DONE [18:41:49.421] - globals: [0] [18:41:49.421] getGlobalsAndPackages() ... DONE [18:41:49.421] + additional globals found: [n=0] [18:41:49.422] + additional namespaces needed: [n=0] [18:41:49.422] - Finding globals in 'X' for chunk #2 ... DONE [18:41:49.422] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.422] - seeds: [18:41:49.422] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.422] getGlobalsAndPackages() ... [18:41:49.422] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.423] Resolving globals: FALSE [18:41:49.423] Tweak future expression to call with '...' arguments ... [18:41:49.423] { [18:41:49.423] do.call(function(...) { [18:41:49.423] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.423] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.423] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.423] on.exit(options(oopts), add = TRUE) [18:41:49.423] } [18:41:49.423] { [18:41:49.423] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.423] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.423] ...future.FUN(...future.X_jj, ...) [18:41:49.423] }) [18:41:49.423] } [18:41:49.423] }, args = future.call.arguments) [18:41:49.423] } [18:41:49.423] Tweak future expression to call with '...' arguments ... DONE [18:41:49.424] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.424] [18:41:49.424] getGlobalsAndPackages() ... DONE [18:41:49.425] run() for 'Future' ... [18:41:49.425] - state: 'created' [18:41:49.425] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.440] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.440] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.441] - Field: 'node' [18:41:49.441] - Field: 'label' [18:41:49.441] - Field: 'local' [18:41:49.441] - Field: 'owner' [18:41:49.441] - Field: 'envir' [18:41:49.441] - Field: 'workers' [18:41:49.442] - Field: 'packages' [18:41:49.442] - Field: 'gc' [18:41:49.442] - Field: 'conditions' [18:41:49.442] - Field: 'persistent' [18:41:49.442] - Field: 'expr' [18:41:49.443] - Field: 'uuid' [18:41:49.443] - Field: 'seed' [18:41:49.443] - Field: 'version' [18:41:49.443] - Field: 'result' [18:41:49.443] - Field: 'asynchronous' [18:41:49.444] - Field: 'calls' [18:41:49.444] - Field: 'globals' [18:41:49.444] - Field: 'stdout' [18:41:49.444] - Field: 'earlySignal' [18:41:49.444] - Field: 'lazy' [18:41:49.445] - Field: 'state' [18:41:49.445] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.445] - Launch lazy future ... [18:41:49.445] Packages needed by the future expression (n = 0): [18:41:49.446] Packages needed by future strategies (n = 0): [18:41:49.446] { [18:41:49.446] { [18:41:49.446] { [18:41:49.446] ...future.startTime <- base::Sys.time() [18:41:49.446] { [18:41:49.446] { [18:41:49.446] { [18:41:49.446] { [18:41:49.446] base::local({ [18:41:49.446] has_future <- base::requireNamespace("future", [18:41:49.446] quietly = TRUE) [18:41:49.446] if (has_future) { [18:41:49.446] ns <- base::getNamespace("future") [18:41:49.446] version <- ns[[".package"]][["version"]] [18:41:49.446] if (is.null(version)) [18:41:49.446] version <- utils::packageVersion("future") [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] version <- NULL [18:41:49.446] } [18:41:49.446] if (!has_future || version < "1.8.0") { [18:41:49.446] info <- base::c(r_version = base::gsub("R version ", [18:41:49.446] "", base::R.version$version.string), [18:41:49.446] platform = base::sprintf("%s (%s-bit)", [18:41:49.446] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.446] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.446] "release", "version")], collapse = " "), [18:41:49.446] hostname = base::Sys.info()[["nodename"]]) [18:41:49.446] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.446] info) [18:41:49.446] info <- base::paste(info, collapse = "; ") [18:41:49.446] if (!has_future) { [18:41:49.446] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.446] info) [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.446] info, version) [18:41:49.446] } [18:41:49.446] base::stop(msg) [18:41:49.446] } [18:41:49.446] }) [18:41:49.446] } [18:41:49.446] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.446] base::options(mc.cores = 1L) [18:41:49.446] } [18:41:49.446] ...future.strategy.old <- future::plan("list") [18:41:49.446] options(future.plan = NULL) [18:41:49.446] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.446] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.446] } [18:41:49.446] ...future.workdir <- getwd() [18:41:49.446] } [18:41:49.446] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.446] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.446] } [18:41:49.446] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.446] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.446] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.446] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.446] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.446] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.446] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.446] base::names(...future.oldOptions)) [18:41:49.446] } [18:41:49.446] if (FALSE) { [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] if (TRUE) { [18:41:49.446] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.446] open = "w") [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.446] windows = "NUL", "/dev/null"), open = "w") [18:41:49.446] } [18:41:49.446] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.446] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.446] base::sink(type = "output", split = FALSE) [18:41:49.446] base::close(...future.stdout) [18:41:49.446] }, add = TRUE) [18:41:49.446] } [18:41:49.446] ...future.frame <- base::sys.nframe() [18:41:49.446] ...future.conditions <- base::list() [18:41:49.446] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.446] if (FALSE) { [18:41:49.446] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.446] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.446] } [18:41:49.446] ...future.result <- base::tryCatch({ [18:41:49.446] base::withCallingHandlers({ [18:41:49.446] ...future.value <- base::withVisible(base::local({ [18:41:49.446] ...future.makeSendCondition <- base::local({ [18:41:49.446] sendCondition <- NULL [18:41:49.446] function(frame = 1L) { [18:41:49.446] if (is.function(sendCondition)) [18:41:49.446] return(sendCondition) [18:41:49.446] ns <- getNamespace("parallel") [18:41:49.446] if (exists("sendData", mode = "function", [18:41:49.446] envir = ns)) { [18:41:49.446] parallel_sendData <- get("sendData", mode = "function", [18:41:49.446] envir = ns) [18:41:49.446] envir <- sys.frame(frame) [18:41:49.446] master <- NULL [18:41:49.446] while (!identical(envir, .GlobalEnv) && [18:41:49.446] !identical(envir, emptyenv())) { [18:41:49.446] if (exists("master", mode = "list", envir = envir, [18:41:49.446] inherits = FALSE)) { [18:41:49.446] master <- get("master", mode = "list", [18:41:49.446] envir = envir, inherits = FALSE) [18:41:49.446] if (inherits(master, c("SOCKnode", [18:41:49.446] "SOCK0node"))) { [18:41:49.446] sendCondition <<- function(cond) { [18:41:49.446] data <- list(type = "VALUE", value = cond, [18:41:49.446] success = TRUE) [18:41:49.446] parallel_sendData(master, data) [18:41:49.446] } [18:41:49.446] return(sendCondition) [18:41:49.446] } [18:41:49.446] } [18:41:49.446] frame <- frame + 1L [18:41:49.446] envir <- sys.frame(frame) [18:41:49.446] } [18:41:49.446] } [18:41:49.446] sendCondition <<- function(cond) NULL [18:41:49.446] } [18:41:49.446] }) [18:41:49.446] withCallingHandlers({ [18:41:49.446] { [18:41:49.446] do.call(function(...) { [18:41:49.446] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.446] if (!identical(...future.globals.maxSize.org, [18:41:49.446] ...future.globals.maxSize)) { [18:41:49.446] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.446] on.exit(options(oopts), add = TRUE) [18:41:49.446] } [18:41:49.446] { [18:41:49.446] lapply(seq_along(...future.elements_ii), [18:41:49.446] FUN = function(jj) { [18:41:49.446] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.446] ...future.FUN(...future.X_jj, ...) [18:41:49.446] }) [18:41:49.446] } [18:41:49.446] }, args = future.call.arguments) [18:41:49.446] } [18:41:49.446] }, immediateCondition = function(cond) { [18:41:49.446] sendCondition <- ...future.makeSendCondition() [18:41:49.446] sendCondition(cond) [18:41:49.446] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.446] { [18:41:49.446] inherits <- base::inherits [18:41:49.446] invokeRestart <- base::invokeRestart [18:41:49.446] is.null <- base::is.null [18:41:49.446] muffled <- FALSE [18:41:49.446] if (inherits(cond, "message")) { [18:41:49.446] muffled <- grepl(pattern, "muffleMessage") [18:41:49.446] if (muffled) [18:41:49.446] invokeRestart("muffleMessage") [18:41:49.446] } [18:41:49.446] else if (inherits(cond, "warning")) { [18:41:49.446] muffled <- grepl(pattern, "muffleWarning") [18:41:49.446] if (muffled) [18:41:49.446] invokeRestart("muffleWarning") [18:41:49.446] } [18:41:49.446] else if (inherits(cond, "condition")) { [18:41:49.446] if (!is.null(pattern)) { [18:41:49.446] computeRestarts <- base::computeRestarts [18:41:49.446] grepl <- base::grepl [18:41:49.446] restarts <- computeRestarts(cond) [18:41:49.446] for (restart in restarts) { [18:41:49.446] name <- restart$name [18:41:49.446] if (is.null(name)) [18:41:49.446] next [18:41:49.446] if (!grepl(pattern, name)) [18:41:49.446] next [18:41:49.446] invokeRestart(restart) [18:41:49.446] muffled <- TRUE [18:41:49.446] break [18:41:49.446] } [18:41:49.446] } [18:41:49.446] } [18:41:49.446] invisible(muffled) [18:41:49.446] } [18:41:49.446] muffleCondition(cond) [18:41:49.446] }) [18:41:49.446] })) [18:41:49.446] future::FutureResult(value = ...future.value$value, [18:41:49.446] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.446] ...future.rng), globalenv = if (FALSE) [18:41:49.446] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.446] ...future.globalenv.names)) [18:41:49.446] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.446] }, condition = base::local({ [18:41:49.446] c <- base::c [18:41:49.446] inherits <- base::inherits [18:41:49.446] invokeRestart <- base::invokeRestart [18:41:49.446] length <- base::length [18:41:49.446] list <- base::list [18:41:49.446] seq.int <- base::seq.int [18:41:49.446] signalCondition <- base::signalCondition [18:41:49.446] sys.calls <- base::sys.calls [18:41:49.446] `[[` <- base::`[[` [18:41:49.446] `+` <- base::`+` [18:41:49.446] `<<-` <- base::`<<-` [18:41:49.446] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.446] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.446] 3L)] [18:41:49.446] } [18:41:49.446] function(cond) { [18:41:49.446] is_error <- inherits(cond, "error") [18:41:49.446] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.446] NULL) [18:41:49.446] if (is_error) { [18:41:49.446] sessionInformation <- function() { [18:41:49.446] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.446] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.446] search = base::search(), system = base::Sys.info()) [18:41:49.446] } [18:41:49.446] ...future.conditions[[length(...future.conditions) + [18:41:49.446] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.446] cond$call), session = sessionInformation(), [18:41:49.446] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.446] signalCondition(cond) [18:41:49.446] } [18:41:49.446] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.446] "immediateCondition"))) { [18:41:49.446] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.446] ...future.conditions[[length(...future.conditions) + [18:41:49.446] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.446] if (TRUE && !signal) { [18:41:49.446] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.446] { [18:41:49.446] inherits <- base::inherits [18:41:49.446] invokeRestart <- base::invokeRestart [18:41:49.446] is.null <- base::is.null [18:41:49.446] muffled <- FALSE [18:41:49.446] if (inherits(cond, "message")) { [18:41:49.446] muffled <- grepl(pattern, "muffleMessage") [18:41:49.446] if (muffled) [18:41:49.446] invokeRestart("muffleMessage") [18:41:49.446] } [18:41:49.446] else if (inherits(cond, "warning")) { [18:41:49.446] muffled <- grepl(pattern, "muffleWarning") [18:41:49.446] if (muffled) [18:41:49.446] invokeRestart("muffleWarning") [18:41:49.446] } [18:41:49.446] else if (inherits(cond, "condition")) { [18:41:49.446] if (!is.null(pattern)) { [18:41:49.446] computeRestarts <- base::computeRestarts [18:41:49.446] grepl <- base::grepl [18:41:49.446] restarts <- computeRestarts(cond) [18:41:49.446] for (restart in restarts) { [18:41:49.446] name <- restart$name [18:41:49.446] if (is.null(name)) [18:41:49.446] next [18:41:49.446] if (!grepl(pattern, name)) [18:41:49.446] next [18:41:49.446] invokeRestart(restart) [18:41:49.446] muffled <- TRUE [18:41:49.446] break [18:41:49.446] } [18:41:49.446] } [18:41:49.446] } [18:41:49.446] invisible(muffled) [18:41:49.446] } [18:41:49.446] muffleCondition(cond, pattern = "^muffle") [18:41:49.446] } [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] if (TRUE) { [18:41:49.446] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.446] { [18:41:49.446] inherits <- base::inherits [18:41:49.446] invokeRestart <- base::invokeRestart [18:41:49.446] is.null <- base::is.null [18:41:49.446] muffled <- FALSE [18:41:49.446] if (inherits(cond, "message")) { [18:41:49.446] muffled <- grepl(pattern, "muffleMessage") [18:41:49.446] if (muffled) [18:41:49.446] invokeRestart("muffleMessage") [18:41:49.446] } [18:41:49.446] else if (inherits(cond, "warning")) { [18:41:49.446] muffled <- grepl(pattern, "muffleWarning") [18:41:49.446] if (muffled) [18:41:49.446] invokeRestart("muffleWarning") [18:41:49.446] } [18:41:49.446] else if (inherits(cond, "condition")) { [18:41:49.446] if (!is.null(pattern)) { [18:41:49.446] computeRestarts <- base::computeRestarts [18:41:49.446] grepl <- base::grepl [18:41:49.446] restarts <- computeRestarts(cond) [18:41:49.446] for (restart in restarts) { [18:41:49.446] name <- restart$name [18:41:49.446] if (is.null(name)) [18:41:49.446] next [18:41:49.446] if (!grepl(pattern, name)) [18:41:49.446] next [18:41:49.446] invokeRestart(restart) [18:41:49.446] muffled <- TRUE [18:41:49.446] break [18:41:49.446] } [18:41:49.446] } [18:41:49.446] } [18:41:49.446] invisible(muffled) [18:41:49.446] } [18:41:49.446] muffleCondition(cond, pattern = "^muffle") [18:41:49.446] } [18:41:49.446] } [18:41:49.446] } [18:41:49.446] })) [18:41:49.446] }, error = function(ex) { [18:41:49.446] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.446] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.446] ...future.rng), started = ...future.startTime, [18:41:49.446] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.446] version = "1.8"), class = "FutureResult") [18:41:49.446] }, finally = { [18:41:49.446] if (!identical(...future.workdir, getwd())) [18:41:49.446] setwd(...future.workdir) [18:41:49.446] { [18:41:49.446] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.446] ...future.oldOptions$nwarnings <- NULL [18:41:49.446] } [18:41:49.446] base::options(...future.oldOptions) [18:41:49.446] if (.Platform$OS.type == "windows") { [18:41:49.446] old_names <- names(...future.oldEnvVars) [18:41:49.446] envs <- base::Sys.getenv() [18:41:49.446] names <- names(envs) [18:41:49.446] common <- intersect(names, old_names) [18:41:49.446] added <- setdiff(names, old_names) [18:41:49.446] removed <- setdiff(old_names, names) [18:41:49.446] changed <- common[...future.oldEnvVars[common] != [18:41:49.446] envs[common]] [18:41:49.446] NAMES <- toupper(changed) [18:41:49.446] args <- list() [18:41:49.446] for (kk in seq_along(NAMES)) { [18:41:49.446] name <- changed[[kk]] [18:41:49.446] NAME <- NAMES[[kk]] [18:41:49.446] if (name != NAME && is.element(NAME, old_names)) [18:41:49.446] next [18:41:49.446] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.446] } [18:41:49.446] NAMES <- toupper(added) [18:41:49.446] for (kk in seq_along(NAMES)) { [18:41:49.446] name <- added[[kk]] [18:41:49.446] NAME <- NAMES[[kk]] [18:41:49.446] if (name != NAME && is.element(NAME, old_names)) [18:41:49.446] next [18:41:49.446] args[[name]] <- "" [18:41:49.446] } [18:41:49.446] NAMES <- toupper(removed) [18:41:49.446] for (kk in seq_along(NAMES)) { [18:41:49.446] name <- removed[[kk]] [18:41:49.446] NAME <- NAMES[[kk]] [18:41:49.446] if (name != NAME && is.element(NAME, old_names)) [18:41:49.446] next [18:41:49.446] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.446] } [18:41:49.446] if (length(args) > 0) [18:41:49.446] base::do.call(base::Sys.setenv, args = args) [18:41:49.446] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.446] } [18:41:49.446] { [18:41:49.446] if (base::length(...future.futureOptionsAdded) > [18:41:49.446] 0L) { [18:41:49.446] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.446] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.446] base::options(opts) [18:41:49.446] } [18:41:49.446] { [18:41:49.446] { [18:41:49.446] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.446] NULL [18:41:49.446] } [18:41:49.446] options(future.plan = NULL) [18:41:49.446] if (is.na(NA_character_)) [18:41:49.446] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.446] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.446] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.446] .init = FALSE) [18:41:49.446] } [18:41:49.446] } [18:41:49.446] } [18:41:49.446] }) [18:41:49.446] if (TRUE) { [18:41:49.446] base::sink(type = "output", split = FALSE) [18:41:49.446] if (TRUE) { [18:41:49.446] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.446] } [18:41:49.446] else { [18:41:49.446] ...future.result["stdout"] <- base::list(NULL) [18:41:49.446] } [18:41:49.446] base::close(...future.stdout) [18:41:49.446] ...future.stdout <- NULL [18:41:49.446] } [18:41:49.446] ...future.result$conditions <- ...future.conditions [18:41:49.446] ...future.result$finished <- base::Sys.time() [18:41:49.446] ...future.result [18:41:49.446] } [18:41:49.452] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:49.452] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:49.453] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:49.453] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.454] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.454] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:49.454] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:49.455] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.455] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.455] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.456] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.456] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:49.457] MultisessionFuture started [18:41:49.457] - Launch lazy future ... done [18:41:49.457] run() for 'MultisessionFuture' ... done [18:41:49.457] Created future: [18:41:49.470] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.470] - Validating connection of MultisessionFuture [18:41:49.470] - received message: FutureResult [18:41:49.471] - Received FutureResult [18:41:49.471] - Erased future from FutureRegistry [18:41:49.471] result() for ClusterFuture ... [18:41:49.471] - result already collected: FutureResult [18:41:49.471] result() for ClusterFuture ... done [18:41:49.471] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.457] MultisessionFuture: [18:41:49.457] Label: 'future_sapply-2' [18:41:49.457] Expression: [18:41:49.457] { [18:41:49.457] do.call(function(...) { [18:41:49.457] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.457] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.457] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.457] on.exit(options(oopts), add = TRUE) [18:41:49.457] } [18:41:49.457] { [18:41:49.457] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.457] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.457] ...future.FUN(...future.X_jj, ...) [18:41:49.457] }) [18:41:49.457] } [18:41:49.457] }, args = future.call.arguments) [18:41:49.457] } [18:41:49.457] Lazy evaluation: FALSE [18:41:49.457] Asynchronous evaluation: TRUE [18:41:49.457] Local evaluation: TRUE [18:41:49.457] Environment: R_GlobalEnv [18:41:49.457] Capture standard output: TRUE [18:41:49.457] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.457] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.457] Packages: [18:41:49.457] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.457] Resolved: TRUE [18:41:49.457] Value: [18:41:49.457] Conditions captured: [18:41:49.457] Early signaling: FALSE [18:41:49.457] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.457] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.472] Chunk #2 of 2 ... DONE [18:41:49.472] Launching 2 futures (chunks) ... DONE [18:41:49.472] Resolving 2 futures (chunks) ... [18:41:49.473] resolve() on list ... [18:41:49.473] recursive: 0 [18:41:49.473] length: 2 [18:41:49.473] [18:41:49.473] Future #1 [18:41:49.474] result() for ClusterFuture ... [18:41:49.474] - result already collected: FutureResult [18:41:49.474] result() for ClusterFuture ... done [18:41:49.474] result() for ClusterFuture ... [18:41:49.474] - result already collected: FutureResult [18:41:49.474] result() for ClusterFuture ... done [18:41:49.475] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:49.475] - nx: 2 [18:41:49.475] - relay: TRUE [18:41:49.475] - stdout: TRUE [18:41:49.475] - signal: TRUE [18:41:49.475] - resignal: FALSE [18:41:49.476] - force: TRUE [18:41:49.476] - relayed: [n=2] FALSE, FALSE [18:41:49.476] - queued futures: [n=2] FALSE, FALSE [18:41:49.476] - until=1 [18:41:49.476] - relaying element #1 [18:41:49.477] result() for ClusterFuture ... [18:41:49.477] - result already collected: FutureResult [18:41:49.477] result() for ClusterFuture ... done [18:41:49.477] result() for ClusterFuture ... [18:41:49.477] - result already collected: FutureResult [18:41:49.477] result() for ClusterFuture ... done [18:41:49.478] result() for ClusterFuture ... [18:41:49.478] - result already collected: FutureResult [18:41:49.478] result() for ClusterFuture ... done [18:41:49.478] result() for ClusterFuture ... [18:41:49.478] - result already collected: FutureResult [18:41:49.479] result() for ClusterFuture ... done [18:41:49.479] - relayed: [n=2] TRUE, FALSE [18:41:49.479] - queued futures: [n=2] TRUE, FALSE [18:41:49.479] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:49.479] length: 1 (resolved future 1) [18:41:49.480] Future #2 [18:41:49.480] result() for ClusterFuture ... [18:41:49.480] - result already collected: FutureResult [18:41:49.480] result() for ClusterFuture ... done [18:41:49.480] result() for ClusterFuture ... [18:41:49.481] - result already collected: FutureResult [18:41:49.481] result() for ClusterFuture ... done [18:41:49.481] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:49.481] - nx: 2 [18:41:49.481] - relay: TRUE [18:41:49.481] - stdout: TRUE [18:41:49.482] - signal: TRUE [18:41:49.482] - resignal: FALSE [18:41:49.482] - force: TRUE [18:41:49.482] - relayed: [n=2] TRUE, FALSE [18:41:49.482] - queued futures: [n=2] TRUE, FALSE [18:41:49.482] - until=2 [18:41:49.483] - relaying element #2 [18:41:49.483] result() for ClusterFuture ... [18:41:49.483] - result already collected: FutureResult [18:41:49.483] result() for ClusterFuture ... done [18:41:49.483] result() for ClusterFuture ... [18:41:49.484] - result already collected: FutureResult [18:41:49.484] result() for ClusterFuture ... done [18:41:49.484] result() for ClusterFuture ... [18:41:49.484] - result already collected: FutureResult [18:41:49.484] result() for ClusterFuture ... done [18:41:49.485] result() for ClusterFuture ... [18:41:49.485] - result already collected: FutureResult [18:41:49.485] result() for ClusterFuture ... done [18:41:49.485] - relayed: [n=2] TRUE, TRUE [18:41:49.485] - queued futures: [n=2] TRUE, TRUE [18:41:49.485] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:49.486] length: 0 (resolved future 2) [18:41:49.486] Relaying remaining futures [18:41:49.486] signalConditionsASAP(NULL, pos=0) ... [18:41:49.486] - nx: 2 [18:41:49.486] - relay: TRUE [18:41:49.487] - stdout: TRUE [18:41:49.487] - signal: TRUE [18:41:49.487] - resignal: FALSE [18:41:49.487] - force: TRUE [18:41:49.487] - relayed: [n=2] TRUE, TRUE [18:41:49.487] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:49.488] - relayed: [n=2] TRUE, TRUE [18:41:49.488] - queued futures: [n=2] TRUE, TRUE [18:41:49.488] signalConditionsASAP(NULL, pos=0) ... done [18:41:49.488] resolve() on list ... DONE [18:41:49.488] result() for ClusterFuture ... [18:41:49.489] - result already collected: FutureResult [18:41:49.489] result() for ClusterFuture ... done [18:41:49.489] result() for ClusterFuture ... [18:41:49.490] - result already collected: FutureResult [18:41:49.490] result() for ClusterFuture ... done [18:41:49.490] result() for ClusterFuture ... [18:41:49.491] - result already collected: FutureResult [18:41:49.491] result() for ClusterFuture ... done [18:41:49.492] result() for ClusterFuture ... [18:41:49.492] - result already collected: FutureResult [18:41:49.492] result() for ClusterFuture ... done [18:41:49.493] - Number of value chunks collected: 2 [18:41:49.493] Resolving 2 futures (chunks) ... DONE [18:41:49.493] Reducing values from 2 chunks ... [18:41:49.493] - Number of values collected after concatenation: 3 [18:41:49.493] - Number of values expected: 3 [18:41:49.494] Reducing values from 2 chunks ... DONE [18:41:49.494] future_lapply() ... DONE List of 2 $ y0: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named num [1:3] 1 2 3 ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:49.496] future_lapply() ... [18:41:49.500] Number of chunks: 2 [18:41:49.500] getGlobalsAndPackagesXApply() ... [18:41:49.500] - future.globals: TRUE [18:41:49.501] getGlobalsAndPackages() ... [18:41:49.501] Searching for globals... [18:41:49.503] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:49.503] Searching for globals ... DONE [18:41:49.503] Resolving globals: FALSE [18:41:49.504] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:49.505] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:49.505] - globals: [1] 'FUN' [18:41:49.505] [18:41:49.506] getGlobalsAndPackages() ... DONE [18:41:49.506] - globals found/used: [n=1] 'FUN' [18:41:49.506] - needed namespaces: [n=0] [18:41:49.507] Finding globals ... DONE [18:41:49.507] - use_args: TRUE [18:41:49.507] - Getting '...' globals ... [18:41:49.508] resolve() on list ... [18:41:49.508] recursive: 0 [18:41:49.508] length: 1 [18:41:49.508] elements: '...' [18:41:49.509] length: 0 (resolved future 1) [18:41:49.509] resolve() on list ... DONE [18:41:49.509] - '...' content: [n=0] [18:41:49.509] List of 1 [18:41:49.509] $ ...: list() [18:41:49.509] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.509] - attr(*, "where")=List of 1 [18:41:49.509] ..$ ...: [18:41:49.509] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.509] - attr(*, "resolved")= logi TRUE [18:41:49.509] - attr(*, "total_size")= num NA [18:41:49.516] - Getting '...' globals ... DONE [18:41:49.516] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:49.516] List of 2 [18:41:49.516] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:49.516] $ ... : list() [18:41:49.516] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.516] - attr(*, "where")=List of 2 [18:41:49.516] ..$ ...future.FUN: [18:41:49.516] ..$ ... : [18:41:49.516] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.516] - attr(*, "resolved")= logi FALSE [18:41:49.516] - attr(*, "total_size")= int 6598 [18:41:49.520] Packages to be attached in all futures: [n=0] [18:41:49.520] getGlobalsAndPackagesXApply() ... DONE [18:41:49.521] Number of futures (= number of chunks): 2 [18:41:49.521] Launching 2 futures (chunks) ... [18:41:49.521] Chunk #1 of 2 ... [18:41:49.521] - Finding globals in 'X' for chunk #1 ... [18:41:49.521] getGlobalsAndPackages() ... [18:41:49.522] Searching for globals... [18:41:49.522] [18:41:49.522] Searching for globals ... DONE [18:41:49.522] - globals: [0] [18:41:49.522] getGlobalsAndPackages() ... DONE [18:41:49.523] + additional globals found: [n=0] [18:41:49.523] + additional namespaces needed: [n=0] [18:41:49.523] - Finding globals in 'X' for chunk #1 ... DONE [18:41:49.523] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.523] - seeds: [18:41:49.523] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.524] getGlobalsAndPackages() ... [18:41:49.524] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.524] Resolving globals: FALSE [18:41:49.524] Tweak future expression to call with '...' arguments ... [18:41:49.524] { [18:41:49.524] do.call(function(...) { [18:41:49.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.524] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.524] on.exit(options(oopts), add = TRUE) [18:41:49.524] } [18:41:49.524] { [18:41:49.524] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.524] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.524] ...future.FUN(...future.X_jj, ...) [18:41:49.524] }) [18:41:49.524] } [18:41:49.524] }, args = future.call.arguments) [18:41:49.524] } [18:41:49.525] Tweak future expression to call with '...' arguments ... DONE [18:41:49.526] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.526] [18:41:49.526] getGlobalsAndPackages() ... DONE [18:41:49.526] run() for 'Future' ... [18:41:49.527] - state: 'created' [18:41:49.527] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.544] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.544] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.544] - Field: 'node' [18:41:49.544] - Field: 'label' [18:41:49.544] - Field: 'local' [18:41:49.544] - Field: 'owner' [18:41:49.545] - Field: 'envir' [18:41:49.545] - Field: 'workers' [18:41:49.545] - Field: 'packages' [18:41:49.545] - Field: 'gc' [18:41:49.545] - Field: 'conditions' [18:41:49.546] - Field: 'persistent' [18:41:49.546] - Field: 'expr' [18:41:49.546] - Field: 'uuid' [18:41:49.546] - Field: 'seed' [18:41:49.546] - Field: 'version' [18:41:49.546] - Field: 'result' [18:41:49.547] - Field: 'asynchronous' [18:41:49.547] - Field: 'calls' [18:41:49.547] - Field: 'globals' [18:41:49.547] - Field: 'stdout' [18:41:49.547] - Field: 'earlySignal' [18:41:49.547] - Field: 'lazy' [18:41:49.548] - Field: 'state' [18:41:49.548] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.548] - Launch lazy future ... [18:41:49.548] Packages needed by the future expression (n = 0): [18:41:49.549] Packages needed by future strategies (n = 0): [18:41:49.549] { [18:41:49.549] { [18:41:49.549] { [18:41:49.549] ...future.startTime <- base::Sys.time() [18:41:49.549] { [18:41:49.549] { [18:41:49.549] { [18:41:49.549] { [18:41:49.549] base::local({ [18:41:49.549] has_future <- base::requireNamespace("future", [18:41:49.549] quietly = TRUE) [18:41:49.549] if (has_future) { [18:41:49.549] ns <- base::getNamespace("future") [18:41:49.549] version <- ns[[".package"]][["version"]] [18:41:49.549] if (is.null(version)) [18:41:49.549] version <- utils::packageVersion("future") [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] version <- NULL [18:41:49.549] } [18:41:49.549] if (!has_future || version < "1.8.0") { [18:41:49.549] info <- base::c(r_version = base::gsub("R version ", [18:41:49.549] "", base::R.version$version.string), [18:41:49.549] platform = base::sprintf("%s (%s-bit)", [18:41:49.549] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.549] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.549] "release", "version")], collapse = " "), [18:41:49.549] hostname = base::Sys.info()[["nodename"]]) [18:41:49.549] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.549] info) [18:41:49.549] info <- base::paste(info, collapse = "; ") [18:41:49.549] if (!has_future) { [18:41:49.549] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.549] info) [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.549] info, version) [18:41:49.549] } [18:41:49.549] base::stop(msg) [18:41:49.549] } [18:41:49.549] }) [18:41:49.549] } [18:41:49.549] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.549] base::options(mc.cores = 1L) [18:41:49.549] } [18:41:49.549] ...future.strategy.old <- future::plan("list") [18:41:49.549] options(future.plan = NULL) [18:41:49.549] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.549] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.549] } [18:41:49.549] ...future.workdir <- getwd() [18:41:49.549] } [18:41:49.549] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.549] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.549] } [18:41:49.549] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.549] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.549] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.549] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.549] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.549] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.549] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.549] base::names(...future.oldOptions)) [18:41:49.549] } [18:41:49.549] if (FALSE) { [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] if (TRUE) { [18:41:49.549] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.549] open = "w") [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.549] windows = "NUL", "/dev/null"), open = "w") [18:41:49.549] } [18:41:49.549] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.549] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.549] base::sink(type = "output", split = FALSE) [18:41:49.549] base::close(...future.stdout) [18:41:49.549] }, add = TRUE) [18:41:49.549] } [18:41:49.549] ...future.frame <- base::sys.nframe() [18:41:49.549] ...future.conditions <- base::list() [18:41:49.549] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.549] if (FALSE) { [18:41:49.549] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.549] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.549] } [18:41:49.549] ...future.result <- base::tryCatch({ [18:41:49.549] base::withCallingHandlers({ [18:41:49.549] ...future.value <- base::withVisible(base::local({ [18:41:49.549] ...future.makeSendCondition <- base::local({ [18:41:49.549] sendCondition <- NULL [18:41:49.549] function(frame = 1L) { [18:41:49.549] if (is.function(sendCondition)) [18:41:49.549] return(sendCondition) [18:41:49.549] ns <- getNamespace("parallel") [18:41:49.549] if (exists("sendData", mode = "function", [18:41:49.549] envir = ns)) { [18:41:49.549] parallel_sendData <- get("sendData", mode = "function", [18:41:49.549] envir = ns) [18:41:49.549] envir <- sys.frame(frame) [18:41:49.549] master <- NULL [18:41:49.549] while (!identical(envir, .GlobalEnv) && [18:41:49.549] !identical(envir, emptyenv())) { [18:41:49.549] if (exists("master", mode = "list", envir = envir, [18:41:49.549] inherits = FALSE)) { [18:41:49.549] master <- get("master", mode = "list", [18:41:49.549] envir = envir, inherits = FALSE) [18:41:49.549] if (inherits(master, c("SOCKnode", [18:41:49.549] "SOCK0node"))) { [18:41:49.549] sendCondition <<- function(cond) { [18:41:49.549] data <- list(type = "VALUE", value = cond, [18:41:49.549] success = TRUE) [18:41:49.549] parallel_sendData(master, data) [18:41:49.549] } [18:41:49.549] return(sendCondition) [18:41:49.549] } [18:41:49.549] } [18:41:49.549] frame <- frame + 1L [18:41:49.549] envir <- sys.frame(frame) [18:41:49.549] } [18:41:49.549] } [18:41:49.549] sendCondition <<- function(cond) NULL [18:41:49.549] } [18:41:49.549] }) [18:41:49.549] withCallingHandlers({ [18:41:49.549] { [18:41:49.549] do.call(function(...) { [18:41:49.549] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.549] if (!identical(...future.globals.maxSize.org, [18:41:49.549] ...future.globals.maxSize)) { [18:41:49.549] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.549] on.exit(options(oopts), add = TRUE) [18:41:49.549] } [18:41:49.549] { [18:41:49.549] lapply(seq_along(...future.elements_ii), [18:41:49.549] FUN = function(jj) { [18:41:49.549] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.549] ...future.FUN(...future.X_jj, ...) [18:41:49.549] }) [18:41:49.549] } [18:41:49.549] }, args = future.call.arguments) [18:41:49.549] } [18:41:49.549] }, immediateCondition = function(cond) { [18:41:49.549] sendCondition <- ...future.makeSendCondition() [18:41:49.549] sendCondition(cond) [18:41:49.549] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.549] { [18:41:49.549] inherits <- base::inherits [18:41:49.549] invokeRestart <- base::invokeRestart [18:41:49.549] is.null <- base::is.null [18:41:49.549] muffled <- FALSE [18:41:49.549] if (inherits(cond, "message")) { [18:41:49.549] muffled <- grepl(pattern, "muffleMessage") [18:41:49.549] if (muffled) [18:41:49.549] invokeRestart("muffleMessage") [18:41:49.549] } [18:41:49.549] else if (inherits(cond, "warning")) { [18:41:49.549] muffled <- grepl(pattern, "muffleWarning") [18:41:49.549] if (muffled) [18:41:49.549] invokeRestart("muffleWarning") [18:41:49.549] } [18:41:49.549] else if (inherits(cond, "condition")) { [18:41:49.549] if (!is.null(pattern)) { [18:41:49.549] computeRestarts <- base::computeRestarts [18:41:49.549] grepl <- base::grepl [18:41:49.549] restarts <- computeRestarts(cond) [18:41:49.549] for (restart in restarts) { [18:41:49.549] name <- restart$name [18:41:49.549] if (is.null(name)) [18:41:49.549] next [18:41:49.549] if (!grepl(pattern, name)) [18:41:49.549] next [18:41:49.549] invokeRestart(restart) [18:41:49.549] muffled <- TRUE [18:41:49.549] break [18:41:49.549] } [18:41:49.549] } [18:41:49.549] } [18:41:49.549] invisible(muffled) [18:41:49.549] } [18:41:49.549] muffleCondition(cond) [18:41:49.549] }) [18:41:49.549] })) [18:41:49.549] future::FutureResult(value = ...future.value$value, [18:41:49.549] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.549] ...future.rng), globalenv = if (FALSE) [18:41:49.549] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.549] ...future.globalenv.names)) [18:41:49.549] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.549] }, condition = base::local({ [18:41:49.549] c <- base::c [18:41:49.549] inherits <- base::inherits [18:41:49.549] invokeRestart <- base::invokeRestart [18:41:49.549] length <- base::length [18:41:49.549] list <- base::list [18:41:49.549] seq.int <- base::seq.int [18:41:49.549] signalCondition <- base::signalCondition [18:41:49.549] sys.calls <- base::sys.calls [18:41:49.549] `[[` <- base::`[[` [18:41:49.549] `+` <- base::`+` [18:41:49.549] `<<-` <- base::`<<-` [18:41:49.549] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.549] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.549] 3L)] [18:41:49.549] } [18:41:49.549] function(cond) { [18:41:49.549] is_error <- inherits(cond, "error") [18:41:49.549] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.549] NULL) [18:41:49.549] if (is_error) { [18:41:49.549] sessionInformation <- function() { [18:41:49.549] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.549] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.549] search = base::search(), system = base::Sys.info()) [18:41:49.549] } [18:41:49.549] ...future.conditions[[length(...future.conditions) + [18:41:49.549] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.549] cond$call), session = sessionInformation(), [18:41:49.549] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.549] signalCondition(cond) [18:41:49.549] } [18:41:49.549] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.549] "immediateCondition"))) { [18:41:49.549] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.549] ...future.conditions[[length(...future.conditions) + [18:41:49.549] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.549] if (TRUE && !signal) { [18:41:49.549] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.549] { [18:41:49.549] inherits <- base::inherits [18:41:49.549] invokeRestart <- base::invokeRestart [18:41:49.549] is.null <- base::is.null [18:41:49.549] muffled <- FALSE [18:41:49.549] if (inherits(cond, "message")) { [18:41:49.549] muffled <- grepl(pattern, "muffleMessage") [18:41:49.549] if (muffled) [18:41:49.549] invokeRestart("muffleMessage") [18:41:49.549] } [18:41:49.549] else if (inherits(cond, "warning")) { [18:41:49.549] muffled <- grepl(pattern, "muffleWarning") [18:41:49.549] if (muffled) [18:41:49.549] invokeRestart("muffleWarning") [18:41:49.549] } [18:41:49.549] else if (inherits(cond, "condition")) { [18:41:49.549] if (!is.null(pattern)) { [18:41:49.549] computeRestarts <- base::computeRestarts [18:41:49.549] grepl <- base::grepl [18:41:49.549] restarts <- computeRestarts(cond) [18:41:49.549] for (restart in restarts) { [18:41:49.549] name <- restart$name [18:41:49.549] if (is.null(name)) [18:41:49.549] next [18:41:49.549] if (!grepl(pattern, name)) [18:41:49.549] next [18:41:49.549] invokeRestart(restart) [18:41:49.549] muffled <- TRUE [18:41:49.549] break [18:41:49.549] } [18:41:49.549] } [18:41:49.549] } [18:41:49.549] invisible(muffled) [18:41:49.549] } [18:41:49.549] muffleCondition(cond, pattern = "^muffle") [18:41:49.549] } [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] if (TRUE) { [18:41:49.549] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.549] { [18:41:49.549] inherits <- base::inherits [18:41:49.549] invokeRestart <- base::invokeRestart [18:41:49.549] is.null <- base::is.null [18:41:49.549] muffled <- FALSE [18:41:49.549] if (inherits(cond, "message")) { [18:41:49.549] muffled <- grepl(pattern, "muffleMessage") [18:41:49.549] if (muffled) [18:41:49.549] invokeRestart("muffleMessage") [18:41:49.549] } [18:41:49.549] else if (inherits(cond, "warning")) { [18:41:49.549] muffled <- grepl(pattern, "muffleWarning") [18:41:49.549] if (muffled) [18:41:49.549] invokeRestart("muffleWarning") [18:41:49.549] } [18:41:49.549] else if (inherits(cond, "condition")) { [18:41:49.549] if (!is.null(pattern)) { [18:41:49.549] computeRestarts <- base::computeRestarts [18:41:49.549] grepl <- base::grepl [18:41:49.549] restarts <- computeRestarts(cond) [18:41:49.549] for (restart in restarts) { [18:41:49.549] name <- restart$name [18:41:49.549] if (is.null(name)) [18:41:49.549] next [18:41:49.549] if (!grepl(pattern, name)) [18:41:49.549] next [18:41:49.549] invokeRestart(restart) [18:41:49.549] muffled <- TRUE [18:41:49.549] break [18:41:49.549] } [18:41:49.549] } [18:41:49.549] } [18:41:49.549] invisible(muffled) [18:41:49.549] } [18:41:49.549] muffleCondition(cond, pattern = "^muffle") [18:41:49.549] } [18:41:49.549] } [18:41:49.549] } [18:41:49.549] })) [18:41:49.549] }, error = function(ex) { [18:41:49.549] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.549] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.549] ...future.rng), started = ...future.startTime, [18:41:49.549] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.549] version = "1.8"), class = "FutureResult") [18:41:49.549] }, finally = { [18:41:49.549] if (!identical(...future.workdir, getwd())) [18:41:49.549] setwd(...future.workdir) [18:41:49.549] { [18:41:49.549] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.549] ...future.oldOptions$nwarnings <- NULL [18:41:49.549] } [18:41:49.549] base::options(...future.oldOptions) [18:41:49.549] if (.Platform$OS.type == "windows") { [18:41:49.549] old_names <- names(...future.oldEnvVars) [18:41:49.549] envs <- base::Sys.getenv() [18:41:49.549] names <- names(envs) [18:41:49.549] common <- intersect(names, old_names) [18:41:49.549] added <- setdiff(names, old_names) [18:41:49.549] removed <- setdiff(old_names, names) [18:41:49.549] changed <- common[...future.oldEnvVars[common] != [18:41:49.549] envs[common]] [18:41:49.549] NAMES <- toupper(changed) [18:41:49.549] args <- list() [18:41:49.549] for (kk in seq_along(NAMES)) { [18:41:49.549] name <- changed[[kk]] [18:41:49.549] NAME <- NAMES[[kk]] [18:41:49.549] if (name != NAME && is.element(NAME, old_names)) [18:41:49.549] next [18:41:49.549] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.549] } [18:41:49.549] NAMES <- toupper(added) [18:41:49.549] for (kk in seq_along(NAMES)) { [18:41:49.549] name <- added[[kk]] [18:41:49.549] NAME <- NAMES[[kk]] [18:41:49.549] if (name != NAME && is.element(NAME, old_names)) [18:41:49.549] next [18:41:49.549] args[[name]] <- "" [18:41:49.549] } [18:41:49.549] NAMES <- toupper(removed) [18:41:49.549] for (kk in seq_along(NAMES)) { [18:41:49.549] name <- removed[[kk]] [18:41:49.549] NAME <- NAMES[[kk]] [18:41:49.549] if (name != NAME && is.element(NAME, old_names)) [18:41:49.549] next [18:41:49.549] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.549] } [18:41:49.549] if (length(args) > 0) [18:41:49.549] base::do.call(base::Sys.setenv, args = args) [18:41:49.549] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.549] } [18:41:49.549] { [18:41:49.549] if (base::length(...future.futureOptionsAdded) > [18:41:49.549] 0L) { [18:41:49.549] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.549] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.549] base::options(opts) [18:41:49.549] } [18:41:49.549] { [18:41:49.549] { [18:41:49.549] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.549] NULL [18:41:49.549] } [18:41:49.549] options(future.plan = NULL) [18:41:49.549] if (is.na(NA_character_)) [18:41:49.549] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.549] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.549] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.549] .init = FALSE) [18:41:49.549] } [18:41:49.549] } [18:41:49.549] } [18:41:49.549] }) [18:41:49.549] if (TRUE) { [18:41:49.549] base::sink(type = "output", split = FALSE) [18:41:49.549] if (TRUE) { [18:41:49.549] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.549] } [18:41:49.549] else { [18:41:49.549] ...future.result["stdout"] <- base::list(NULL) [18:41:49.549] } [18:41:49.549] base::close(...future.stdout) [18:41:49.549] ...future.stdout <- NULL [18:41:49.549] } [18:41:49.549] ...future.result$conditions <- ...future.conditions [18:41:49.549] ...future.result$finished <- base::Sys.time() [18:41:49.549] ...future.result [18:41:49.549] } [18:41:49.555] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... [18:41:49.555] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:49.555] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:49.555] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.556] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.556] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:49.556] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:49.557] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.557] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.557] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.558] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.558] Exporting 5 global objects (1.44 KiB) to cluster node #1 ... DONE [18:41:49.558] MultisessionFuture started [18:41:49.559] - Launch lazy future ... done [18:41:49.559] run() for 'MultisessionFuture' ... done [18:41:49.559] Created future: [18:41:49.573] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.573] - Validating connection of MultisessionFuture [18:41:49.573] - received message: FutureResult [18:41:49.574] - Received FutureResult [18:41:49.574] - Erased future from FutureRegistry [18:41:49.574] result() for ClusterFuture ... [18:41:49.575] - result already collected: FutureResult [18:41:49.575] result() for ClusterFuture ... done [18:41:49.575] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.559] MultisessionFuture: [18:41:49.559] Label: 'future_sapply-1' [18:41:49.559] Expression: [18:41:49.559] { [18:41:49.559] do.call(function(...) { [18:41:49.559] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.559] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.559] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.559] on.exit(options(oopts), add = TRUE) [18:41:49.559] } [18:41:49.559] { [18:41:49.559] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.559] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.559] ...future.FUN(...future.X_jj, ...) [18:41:49.559] }) [18:41:49.559] } [18:41:49.559] }, args = future.call.arguments) [18:41:49.559] } [18:41:49.559] Lazy evaluation: FALSE [18:41:49.559] Asynchronous evaluation: TRUE [18:41:49.559] Local evaluation: TRUE [18:41:49.559] Environment: R_GlobalEnv [18:41:49.559] Capture standard output: TRUE [18:41:49.559] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.559] Globals: 5 objects totaling 1.00 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.559] Packages: [18:41:49.559] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.559] Resolved: TRUE [18:41:49.559] Value: [18:41:49.559] Conditions captured: [18:41:49.559] Early signaling: FALSE [18:41:49.559] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.559] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.576] Chunk #1 of 2 ... DONE [18:41:49.576] Chunk #2 of 2 ... [18:41:49.576] - Finding globals in 'X' for chunk #2 ... [18:41:49.577] getGlobalsAndPackages() ... [18:41:49.577] Searching for globals... [18:41:49.577] [18:41:49.578] Searching for globals ... DONE [18:41:49.578] - globals: [0] [18:41:49.578] getGlobalsAndPackages() ... DONE [18:41:49.578] + additional globals found: [n=0] [18:41:49.579] + additional namespaces needed: [n=0] [18:41:49.579] - Finding globals in 'X' for chunk #2 ... DONE [18:41:49.579] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.579] - seeds: [18:41:49.580] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.580] getGlobalsAndPackages() ... [18:41:49.580] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.581] Resolving globals: FALSE [18:41:49.581] Tweak future expression to call with '...' arguments ... [18:41:49.581] { [18:41:49.581] do.call(function(...) { [18:41:49.581] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.581] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.581] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.581] on.exit(options(oopts), add = TRUE) [18:41:49.581] } [18:41:49.581] { [18:41:49.581] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.581] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.581] ...future.FUN(...future.X_jj, ...) [18:41:49.581] }) [18:41:49.581] } [18:41:49.581] }, args = future.call.arguments) [18:41:49.581] } [18:41:49.582] Tweak future expression to call with '...' arguments ... DONE [18:41:49.583] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.583] [18:41:49.583] getGlobalsAndPackages() ... DONE [18:41:49.584] run() for 'Future' ... [18:41:49.584] - state: 'created' [18:41:49.584] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.605] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.605] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.605] - Field: 'node' [18:41:49.605] - Field: 'label' [18:41:49.606] - Field: 'local' [18:41:49.606] - Field: 'owner' [18:41:49.606] - Field: 'envir' [18:41:49.607] - Field: 'workers' [18:41:49.607] - Field: 'packages' [18:41:49.607] - Field: 'gc' [18:41:49.607] - Field: 'conditions' [18:41:49.608] - Field: 'persistent' [18:41:49.608] - Field: 'expr' [18:41:49.608] - Field: 'uuid' [18:41:49.609] - Field: 'seed' [18:41:49.609] - Field: 'version' [18:41:49.609] - Field: 'result' [18:41:49.609] - Field: 'asynchronous' [18:41:49.610] - Field: 'calls' [18:41:49.610] - Field: 'globals' [18:41:49.610] - Field: 'stdout' [18:41:49.611] - Field: 'earlySignal' [18:41:49.611] - Field: 'lazy' [18:41:49.611] - Field: 'state' [18:41:49.612] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.612] - Launch lazy future ... [18:41:49.612] Packages needed by the future expression (n = 0): [18:41:49.613] Packages needed by future strategies (n = 0): [18:41:49.614] { [18:41:49.614] { [18:41:49.614] { [18:41:49.614] ...future.startTime <- base::Sys.time() [18:41:49.614] { [18:41:49.614] { [18:41:49.614] { [18:41:49.614] { [18:41:49.614] base::local({ [18:41:49.614] has_future <- base::requireNamespace("future", [18:41:49.614] quietly = TRUE) [18:41:49.614] if (has_future) { [18:41:49.614] ns <- base::getNamespace("future") [18:41:49.614] version <- ns[[".package"]][["version"]] [18:41:49.614] if (is.null(version)) [18:41:49.614] version <- utils::packageVersion("future") [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] version <- NULL [18:41:49.614] } [18:41:49.614] if (!has_future || version < "1.8.0") { [18:41:49.614] info <- base::c(r_version = base::gsub("R version ", [18:41:49.614] "", base::R.version$version.string), [18:41:49.614] platform = base::sprintf("%s (%s-bit)", [18:41:49.614] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.614] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.614] "release", "version")], collapse = " "), [18:41:49.614] hostname = base::Sys.info()[["nodename"]]) [18:41:49.614] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.614] info) [18:41:49.614] info <- base::paste(info, collapse = "; ") [18:41:49.614] if (!has_future) { [18:41:49.614] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.614] info) [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.614] info, version) [18:41:49.614] } [18:41:49.614] base::stop(msg) [18:41:49.614] } [18:41:49.614] }) [18:41:49.614] } [18:41:49.614] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.614] base::options(mc.cores = 1L) [18:41:49.614] } [18:41:49.614] ...future.strategy.old <- future::plan("list") [18:41:49.614] options(future.plan = NULL) [18:41:49.614] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.614] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.614] } [18:41:49.614] ...future.workdir <- getwd() [18:41:49.614] } [18:41:49.614] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.614] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.614] } [18:41:49.614] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.614] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.614] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.614] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.614] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.614] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.614] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.614] base::names(...future.oldOptions)) [18:41:49.614] } [18:41:49.614] if (FALSE) { [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] if (TRUE) { [18:41:49.614] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.614] open = "w") [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.614] windows = "NUL", "/dev/null"), open = "w") [18:41:49.614] } [18:41:49.614] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.614] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.614] base::sink(type = "output", split = FALSE) [18:41:49.614] base::close(...future.stdout) [18:41:49.614] }, add = TRUE) [18:41:49.614] } [18:41:49.614] ...future.frame <- base::sys.nframe() [18:41:49.614] ...future.conditions <- base::list() [18:41:49.614] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.614] if (FALSE) { [18:41:49.614] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.614] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.614] } [18:41:49.614] ...future.result <- base::tryCatch({ [18:41:49.614] base::withCallingHandlers({ [18:41:49.614] ...future.value <- base::withVisible(base::local({ [18:41:49.614] ...future.makeSendCondition <- base::local({ [18:41:49.614] sendCondition <- NULL [18:41:49.614] function(frame = 1L) { [18:41:49.614] if (is.function(sendCondition)) [18:41:49.614] return(sendCondition) [18:41:49.614] ns <- getNamespace("parallel") [18:41:49.614] if (exists("sendData", mode = "function", [18:41:49.614] envir = ns)) { [18:41:49.614] parallel_sendData <- get("sendData", mode = "function", [18:41:49.614] envir = ns) [18:41:49.614] envir <- sys.frame(frame) [18:41:49.614] master <- NULL [18:41:49.614] while (!identical(envir, .GlobalEnv) && [18:41:49.614] !identical(envir, emptyenv())) { [18:41:49.614] if (exists("master", mode = "list", envir = envir, [18:41:49.614] inherits = FALSE)) { [18:41:49.614] master <- get("master", mode = "list", [18:41:49.614] envir = envir, inherits = FALSE) [18:41:49.614] if (inherits(master, c("SOCKnode", [18:41:49.614] "SOCK0node"))) { [18:41:49.614] sendCondition <<- function(cond) { [18:41:49.614] data <- list(type = "VALUE", value = cond, [18:41:49.614] success = TRUE) [18:41:49.614] parallel_sendData(master, data) [18:41:49.614] } [18:41:49.614] return(sendCondition) [18:41:49.614] } [18:41:49.614] } [18:41:49.614] frame <- frame + 1L [18:41:49.614] envir <- sys.frame(frame) [18:41:49.614] } [18:41:49.614] } [18:41:49.614] sendCondition <<- function(cond) NULL [18:41:49.614] } [18:41:49.614] }) [18:41:49.614] withCallingHandlers({ [18:41:49.614] { [18:41:49.614] do.call(function(...) { [18:41:49.614] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.614] if (!identical(...future.globals.maxSize.org, [18:41:49.614] ...future.globals.maxSize)) { [18:41:49.614] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.614] on.exit(options(oopts), add = TRUE) [18:41:49.614] } [18:41:49.614] { [18:41:49.614] lapply(seq_along(...future.elements_ii), [18:41:49.614] FUN = function(jj) { [18:41:49.614] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.614] ...future.FUN(...future.X_jj, ...) [18:41:49.614] }) [18:41:49.614] } [18:41:49.614] }, args = future.call.arguments) [18:41:49.614] } [18:41:49.614] }, immediateCondition = function(cond) { [18:41:49.614] sendCondition <- ...future.makeSendCondition() [18:41:49.614] sendCondition(cond) [18:41:49.614] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.614] { [18:41:49.614] inherits <- base::inherits [18:41:49.614] invokeRestart <- base::invokeRestart [18:41:49.614] is.null <- base::is.null [18:41:49.614] muffled <- FALSE [18:41:49.614] if (inherits(cond, "message")) { [18:41:49.614] muffled <- grepl(pattern, "muffleMessage") [18:41:49.614] if (muffled) [18:41:49.614] invokeRestart("muffleMessage") [18:41:49.614] } [18:41:49.614] else if (inherits(cond, "warning")) { [18:41:49.614] muffled <- grepl(pattern, "muffleWarning") [18:41:49.614] if (muffled) [18:41:49.614] invokeRestart("muffleWarning") [18:41:49.614] } [18:41:49.614] else if (inherits(cond, "condition")) { [18:41:49.614] if (!is.null(pattern)) { [18:41:49.614] computeRestarts <- base::computeRestarts [18:41:49.614] grepl <- base::grepl [18:41:49.614] restarts <- computeRestarts(cond) [18:41:49.614] for (restart in restarts) { [18:41:49.614] name <- restart$name [18:41:49.614] if (is.null(name)) [18:41:49.614] next [18:41:49.614] if (!grepl(pattern, name)) [18:41:49.614] next [18:41:49.614] invokeRestart(restart) [18:41:49.614] muffled <- TRUE [18:41:49.614] break [18:41:49.614] } [18:41:49.614] } [18:41:49.614] } [18:41:49.614] invisible(muffled) [18:41:49.614] } [18:41:49.614] muffleCondition(cond) [18:41:49.614] }) [18:41:49.614] })) [18:41:49.614] future::FutureResult(value = ...future.value$value, [18:41:49.614] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.614] ...future.rng), globalenv = if (FALSE) [18:41:49.614] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.614] ...future.globalenv.names)) [18:41:49.614] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.614] }, condition = base::local({ [18:41:49.614] c <- base::c [18:41:49.614] inherits <- base::inherits [18:41:49.614] invokeRestart <- base::invokeRestart [18:41:49.614] length <- base::length [18:41:49.614] list <- base::list [18:41:49.614] seq.int <- base::seq.int [18:41:49.614] signalCondition <- base::signalCondition [18:41:49.614] sys.calls <- base::sys.calls [18:41:49.614] `[[` <- base::`[[` [18:41:49.614] `+` <- base::`+` [18:41:49.614] `<<-` <- base::`<<-` [18:41:49.614] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.614] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.614] 3L)] [18:41:49.614] } [18:41:49.614] function(cond) { [18:41:49.614] is_error <- inherits(cond, "error") [18:41:49.614] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.614] NULL) [18:41:49.614] if (is_error) { [18:41:49.614] sessionInformation <- function() { [18:41:49.614] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.614] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.614] search = base::search(), system = base::Sys.info()) [18:41:49.614] } [18:41:49.614] ...future.conditions[[length(...future.conditions) + [18:41:49.614] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.614] cond$call), session = sessionInformation(), [18:41:49.614] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.614] signalCondition(cond) [18:41:49.614] } [18:41:49.614] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.614] "immediateCondition"))) { [18:41:49.614] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.614] ...future.conditions[[length(...future.conditions) + [18:41:49.614] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.614] if (TRUE && !signal) { [18:41:49.614] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.614] { [18:41:49.614] inherits <- base::inherits [18:41:49.614] invokeRestart <- base::invokeRestart [18:41:49.614] is.null <- base::is.null [18:41:49.614] muffled <- FALSE [18:41:49.614] if (inherits(cond, "message")) { [18:41:49.614] muffled <- grepl(pattern, "muffleMessage") [18:41:49.614] if (muffled) [18:41:49.614] invokeRestart("muffleMessage") [18:41:49.614] } [18:41:49.614] else if (inherits(cond, "warning")) { [18:41:49.614] muffled <- grepl(pattern, "muffleWarning") [18:41:49.614] if (muffled) [18:41:49.614] invokeRestart("muffleWarning") [18:41:49.614] } [18:41:49.614] else if (inherits(cond, "condition")) { [18:41:49.614] if (!is.null(pattern)) { [18:41:49.614] computeRestarts <- base::computeRestarts [18:41:49.614] grepl <- base::grepl [18:41:49.614] restarts <- computeRestarts(cond) [18:41:49.614] for (restart in restarts) { [18:41:49.614] name <- restart$name [18:41:49.614] if (is.null(name)) [18:41:49.614] next [18:41:49.614] if (!grepl(pattern, name)) [18:41:49.614] next [18:41:49.614] invokeRestart(restart) [18:41:49.614] muffled <- TRUE [18:41:49.614] break [18:41:49.614] } [18:41:49.614] } [18:41:49.614] } [18:41:49.614] invisible(muffled) [18:41:49.614] } [18:41:49.614] muffleCondition(cond, pattern = "^muffle") [18:41:49.614] } [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] if (TRUE) { [18:41:49.614] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.614] { [18:41:49.614] inherits <- base::inherits [18:41:49.614] invokeRestart <- base::invokeRestart [18:41:49.614] is.null <- base::is.null [18:41:49.614] muffled <- FALSE [18:41:49.614] if (inherits(cond, "message")) { [18:41:49.614] muffled <- grepl(pattern, "muffleMessage") [18:41:49.614] if (muffled) [18:41:49.614] invokeRestart("muffleMessage") [18:41:49.614] } [18:41:49.614] else if (inherits(cond, "warning")) { [18:41:49.614] muffled <- grepl(pattern, "muffleWarning") [18:41:49.614] if (muffled) [18:41:49.614] invokeRestart("muffleWarning") [18:41:49.614] } [18:41:49.614] else if (inherits(cond, "condition")) { [18:41:49.614] if (!is.null(pattern)) { [18:41:49.614] computeRestarts <- base::computeRestarts [18:41:49.614] grepl <- base::grepl [18:41:49.614] restarts <- computeRestarts(cond) [18:41:49.614] for (restart in restarts) { [18:41:49.614] name <- restart$name [18:41:49.614] if (is.null(name)) [18:41:49.614] next [18:41:49.614] if (!grepl(pattern, name)) [18:41:49.614] next [18:41:49.614] invokeRestart(restart) [18:41:49.614] muffled <- TRUE [18:41:49.614] break [18:41:49.614] } [18:41:49.614] } [18:41:49.614] } [18:41:49.614] invisible(muffled) [18:41:49.614] } [18:41:49.614] muffleCondition(cond, pattern = "^muffle") [18:41:49.614] } [18:41:49.614] } [18:41:49.614] } [18:41:49.614] })) [18:41:49.614] }, error = function(ex) { [18:41:49.614] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.614] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.614] ...future.rng), started = ...future.startTime, [18:41:49.614] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.614] version = "1.8"), class = "FutureResult") [18:41:49.614] }, finally = { [18:41:49.614] if (!identical(...future.workdir, getwd())) [18:41:49.614] setwd(...future.workdir) [18:41:49.614] { [18:41:49.614] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.614] ...future.oldOptions$nwarnings <- NULL [18:41:49.614] } [18:41:49.614] base::options(...future.oldOptions) [18:41:49.614] if (.Platform$OS.type == "windows") { [18:41:49.614] old_names <- names(...future.oldEnvVars) [18:41:49.614] envs <- base::Sys.getenv() [18:41:49.614] names <- names(envs) [18:41:49.614] common <- intersect(names, old_names) [18:41:49.614] added <- setdiff(names, old_names) [18:41:49.614] removed <- setdiff(old_names, names) [18:41:49.614] changed <- common[...future.oldEnvVars[common] != [18:41:49.614] envs[common]] [18:41:49.614] NAMES <- toupper(changed) [18:41:49.614] args <- list() [18:41:49.614] for (kk in seq_along(NAMES)) { [18:41:49.614] name <- changed[[kk]] [18:41:49.614] NAME <- NAMES[[kk]] [18:41:49.614] if (name != NAME && is.element(NAME, old_names)) [18:41:49.614] next [18:41:49.614] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.614] } [18:41:49.614] NAMES <- toupper(added) [18:41:49.614] for (kk in seq_along(NAMES)) { [18:41:49.614] name <- added[[kk]] [18:41:49.614] NAME <- NAMES[[kk]] [18:41:49.614] if (name != NAME && is.element(NAME, old_names)) [18:41:49.614] next [18:41:49.614] args[[name]] <- "" [18:41:49.614] } [18:41:49.614] NAMES <- toupper(removed) [18:41:49.614] for (kk in seq_along(NAMES)) { [18:41:49.614] name <- removed[[kk]] [18:41:49.614] NAME <- NAMES[[kk]] [18:41:49.614] if (name != NAME && is.element(NAME, old_names)) [18:41:49.614] next [18:41:49.614] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.614] } [18:41:49.614] if (length(args) > 0) [18:41:49.614] base::do.call(base::Sys.setenv, args = args) [18:41:49.614] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.614] } [18:41:49.614] { [18:41:49.614] if (base::length(...future.futureOptionsAdded) > [18:41:49.614] 0L) { [18:41:49.614] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.614] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.614] base::options(opts) [18:41:49.614] } [18:41:49.614] { [18:41:49.614] { [18:41:49.614] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.614] NULL [18:41:49.614] } [18:41:49.614] options(future.plan = NULL) [18:41:49.614] if (is.na(NA_character_)) [18:41:49.614] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.614] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.614] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.614] .init = FALSE) [18:41:49.614] } [18:41:49.614] } [18:41:49.614] } [18:41:49.614] }) [18:41:49.614] if (TRUE) { [18:41:49.614] base::sink(type = "output", split = FALSE) [18:41:49.614] if (TRUE) { [18:41:49.614] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.614] } [18:41:49.614] else { [18:41:49.614] ...future.result["stdout"] <- base::list(NULL) [18:41:49.614] } [18:41:49.614] base::close(...future.stdout) [18:41:49.614] ...future.stdout <- NULL [18:41:49.614] } [18:41:49.614] ...future.result$conditions <- ...future.conditions [18:41:49.614] ...future.result$finished <- base::Sys.time() [18:41:49.614] ...future.result [18:41:49.614] } [18:41:49.622] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:49.623] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:49.623] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:49.624] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.624] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.625] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:49.625] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:49.625] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.626] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.626] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.627] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.627] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:49.628] MultisessionFuture started [18:41:49.628] - Launch lazy future ... done [18:41:49.629] run() for 'MultisessionFuture' ... done [18:41:49.629] Created future: [18:41:49.642] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.642] - Validating connection of MultisessionFuture [18:41:49.643] - received message: FutureResult [18:41:49.643] - Received FutureResult [18:41:49.644] - Erased future from FutureRegistry [18:41:49.644] result() for ClusterFuture ... [18:41:49.644] - result already collected: FutureResult [18:41:49.644] result() for ClusterFuture ... done [18:41:49.645] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.629] MultisessionFuture: [18:41:49.629] Label: 'future_sapply-2' [18:41:49.629] Expression: [18:41:49.629] { [18:41:49.629] do.call(function(...) { [18:41:49.629] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.629] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.629] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.629] on.exit(options(oopts), add = TRUE) [18:41:49.629] } [18:41:49.629] { [18:41:49.629] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.629] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.629] ...future.FUN(...future.X_jj, ...) [18:41:49.629] }) [18:41:49.629] } [18:41:49.629] }, args = future.call.arguments) [18:41:49.629] } [18:41:49.629] Lazy evaluation: FALSE [18:41:49.629] Asynchronous evaluation: TRUE [18:41:49.629] Local evaluation: TRUE [18:41:49.629] Environment: R_GlobalEnv [18:41:49.629] Capture standard output: TRUE [18:41:49.629] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.629] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.629] Packages: [18:41:49.629] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.629] Resolved: TRUE [18:41:49.629] Value: [18:41:49.629] Conditions captured: [18:41:49.629] Early signaling: FALSE [18:41:49.629] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.629] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.645] Chunk #2 of 2 ... DONE [18:41:49.646] Launching 2 futures (chunks) ... DONE [18:41:49.646] Resolving 2 futures (chunks) ... [18:41:49.646] resolve() on list ... [18:41:49.647] recursive: 0 [18:41:49.647] length: 2 [18:41:49.647] [18:41:49.647] Future #1 [18:41:49.648] result() for ClusterFuture ... [18:41:49.648] - result already collected: FutureResult [18:41:49.648] result() for ClusterFuture ... done [18:41:49.648] result() for ClusterFuture ... [18:41:49.649] - result already collected: FutureResult [18:41:49.649] result() for ClusterFuture ... done [18:41:49.649] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:49.649] - nx: 2 [18:41:49.650] - relay: TRUE [18:41:49.650] - stdout: TRUE [18:41:49.650] - signal: TRUE [18:41:49.650] - resignal: FALSE [18:41:49.651] - force: TRUE [18:41:49.651] - relayed: [n=2] FALSE, FALSE [18:41:49.651] - queued futures: [n=2] FALSE, FALSE [18:41:49.651] - until=1 [18:41:49.652] - relaying element #1 [18:41:49.652] result() for ClusterFuture ... [18:41:49.652] - result already collected: FutureResult [18:41:49.652] result() for ClusterFuture ... done [18:41:49.653] result() for ClusterFuture ... [18:41:49.653] - result already collected: FutureResult [18:41:49.653] result() for ClusterFuture ... done [18:41:49.653] result() for ClusterFuture ... [18:41:49.654] - result already collected: FutureResult [18:41:49.654] result() for ClusterFuture ... done [18:41:49.654] result() for ClusterFuture ... [18:41:49.654] - result already collected: FutureResult [18:41:49.655] result() for ClusterFuture ... done [18:41:49.655] - relayed: [n=2] TRUE, FALSE [18:41:49.655] - queued futures: [n=2] TRUE, FALSE [18:41:49.655] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:49.656] length: 1 (resolved future 1) [18:41:49.656] Future #2 [18:41:49.656] result() for ClusterFuture ... [18:41:49.656] - result already collected: FutureResult [18:41:49.657] result() for ClusterFuture ... done [18:41:49.657] result() for ClusterFuture ... [18:41:49.657] - result already collected: FutureResult [18:41:49.657] result() for ClusterFuture ... done [18:41:49.658] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:49.658] - nx: 2 [18:41:49.658] - relay: TRUE [18:41:49.658] - stdout: TRUE [18:41:49.659] - signal: TRUE [18:41:49.659] - resignal: FALSE [18:41:49.659] - force: TRUE [18:41:49.659] - relayed: [n=2] TRUE, FALSE [18:41:49.660] - queued futures: [n=2] TRUE, FALSE [18:41:49.660] - until=2 [18:41:49.660] - relaying element #2 [18:41:49.660] result() for ClusterFuture ... [18:41:49.661] - result already collected: FutureResult [18:41:49.661] result() for ClusterFuture ... done [18:41:49.661] result() for ClusterFuture ... [18:41:49.661] - result already collected: FutureResult [18:41:49.662] result() for ClusterFuture ... done [18:41:49.662] result() for ClusterFuture ... [18:41:49.662] - result already collected: FutureResult [18:41:49.663] result() for ClusterFuture ... done [18:41:49.663] result() for ClusterFuture ... [18:41:49.663] - result already collected: FutureResult [18:41:49.663] result() for ClusterFuture ... done [18:41:49.664] - relayed: [n=2] TRUE, TRUE [18:41:49.664] - queued futures: [n=2] TRUE, TRUE [18:41:49.664] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:49.664] length: 0 (resolved future 2) [18:41:49.665] Relaying remaining futures [18:41:49.665] signalConditionsASAP(NULL, pos=0) ... [18:41:49.665] - nx: 2 [18:41:49.665] - relay: TRUE [18:41:49.666] - stdout: TRUE [18:41:49.666] - signal: TRUE [18:41:49.666] - resignal: FALSE [18:41:49.666] - force: TRUE [18:41:49.667] - relayed: [n=2] TRUE, TRUE [18:41:49.667] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:49.667] - relayed: [n=2] TRUE, TRUE [18:41:49.668] - queued futures: [n=2] TRUE, TRUE [18:41:49.668] signalConditionsASAP(NULL, pos=0) ... done [18:41:49.668] resolve() on list ... DONE [18:41:49.668] result() for ClusterFuture ... [18:41:49.669] - result already collected: FutureResult [18:41:49.669] result() for ClusterFuture ... done [18:41:49.669] result() for ClusterFuture ... [18:41:49.669] - result already collected: FutureResult [18:41:49.670] result() for ClusterFuture ... done [18:41:49.670] result() for ClusterFuture ... [18:41:49.670] - result already collected: FutureResult [18:41:49.670] result() for ClusterFuture ... done [18:41:49.671] result() for ClusterFuture ... [18:41:49.671] - result already collected: FutureResult [18:41:49.671] result() for ClusterFuture ... done [18:41:49.671] - Number of value chunks collected: 2 [18:41:49.672] Resolving 2 futures (chunks) ... DONE [18:41:49.672] Reducing values from 2 chunks ... [18:41:49.672] - Number of values collected after concatenation: 3 [18:41:49.672] - Number of values expected: 3 [18:41:49.673] Reducing values from 2 chunks ... DONE [18:41:49.673] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" $ y1: num [1:3, 1:5, 1:3] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:3] "a" "b" "c" [18:41:49.679] future_lapply() ... [18:41:49.684] Number of chunks: 2 [18:41:49.685] getGlobalsAndPackagesXApply() ... [18:41:49.685] - future.globals: TRUE [18:41:49.685] getGlobalsAndPackages() ... [18:41:49.685] Searching for globals... [18:41:49.687] - globals found: [1] 'FUN' [18:41:49.688] Searching for globals ... DONE [18:41:49.688] Resolving globals: FALSE [18:41:49.689] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:49.689] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:49.690] - globals: [1] 'FUN' [18:41:49.690] [18:41:49.690] getGlobalsAndPackages() ... DONE [18:41:49.690] - globals found/used: [n=1] 'FUN' [18:41:49.691] - needed namespaces: [n=0] [18:41:49.691] Finding globals ... DONE [18:41:49.691] - use_args: TRUE [18:41:49.692] - Getting '...' globals ... [18:41:49.692] resolve() on list ... [18:41:49.693] recursive: 0 [18:41:49.693] length: 1 [18:41:49.693] elements: '...' [18:41:49.693] length: 0 (resolved future 1) [18:41:49.694] resolve() on list ... DONE [18:41:49.694] - '...' content: [n=0] [18:41:49.694] List of 1 [18:41:49.694] $ ...: list() [18:41:49.694] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.694] - attr(*, "where")=List of 1 [18:41:49.694] ..$ ...: [18:41:49.694] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.694] - attr(*, "resolved")= logi TRUE [18:41:49.694] - attr(*, "total_size")= num NA [18:41:49.699] - Getting '...' globals ... DONE [18:41:49.699] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:49.700] List of 2 [18:41:49.700] $ ...future.FUN:function (x) [18:41:49.700] $ ... : list() [18:41:49.700] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.700] - attr(*, "where")=List of 2 [18:41:49.700] ..$ ...future.FUN: [18:41:49.700] ..$ ... : [18:41:49.700] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.700] - attr(*, "resolved")= logi FALSE [18:41:49.700] - attr(*, "total_size")= int 4942 [18:41:49.705] Packages to be attached in all futures: [n=0] [18:41:49.705] getGlobalsAndPackagesXApply() ... DONE [18:41:49.706] Number of futures (= number of chunks): 2 [18:41:49.706] Launching 2 futures (chunks) ... [18:41:49.706] Chunk #1 of 2 ... [18:41:49.706] - Finding globals in 'X' for chunk #1 ... [18:41:49.707] getGlobalsAndPackages() ... [18:41:49.707] Searching for globals... [18:41:49.708] [18:41:49.708] Searching for globals ... DONE [18:41:49.708] - globals: [0] [18:41:49.708] getGlobalsAndPackages() ... DONE [18:41:49.709] + additional globals found: [n=0] [18:41:49.709] + additional namespaces needed: [n=0] [18:41:49.709] - Finding globals in 'X' for chunk #1 ... DONE [18:41:49.709] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.710] - seeds: [18:41:49.710] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.710] getGlobalsAndPackages() ... [18:41:49.710] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.711] Resolving globals: FALSE [18:41:49.711] Tweak future expression to call with '...' arguments ... [18:41:49.711] { [18:41:49.711] do.call(function(...) { [18:41:49.711] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.711] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.711] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.711] on.exit(options(oopts), add = TRUE) [18:41:49.711] } [18:41:49.711] { [18:41:49.711] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.711] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.711] ...future.FUN(...future.X_jj, ...) [18:41:49.711] }) [18:41:49.711] } [18:41:49.711] }, args = future.call.arguments) [18:41:49.711] } [18:41:49.712] Tweak future expression to call with '...' arguments ... DONE [18:41:49.713] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.713] [18:41:49.713] getGlobalsAndPackages() ... DONE [18:41:49.714] run() for 'Future' ... [18:41:49.714] - state: 'created' [18:41:49.715] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.733] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.733] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.734] - Field: 'node' [18:41:49.734] - Field: 'label' [18:41:49.734] - Field: 'local' [18:41:49.734] - Field: 'owner' [18:41:49.734] - Field: 'envir' [18:41:49.734] - Field: 'workers' [18:41:49.735] - Field: 'packages' [18:41:49.735] - Field: 'gc' [18:41:49.735] - Field: 'conditions' [18:41:49.735] - Field: 'persistent' [18:41:49.735] - Field: 'expr' [18:41:49.736] - Field: 'uuid' [18:41:49.736] - Field: 'seed' [18:41:49.736] - Field: 'version' [18:41:49.736] - Field: 'result' [18:41:49.736] - Field: 'asynchronous' [18:41:49.736] - Field: 'calls' [18:41:49.737] - Field: 'globals' [18:41:49.737] - Field: 'stdout' [18:41:49.737] - Field: 'earlySignal' [18:41:49.737] - Field: 'lazy' [18:41:49.737] - Field: 'state' [18:41:49.737] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.738] - Launch lazy future ... [18:41:49.738] Packages needed by the future expression (n = 0): [18:41:49.743] Packages needed by future strategies (n = 0): [18:41:49.744] { [18:41:49.744] { [18:41:49.744] { [18:41:49.744] ...future.startTime <- base::Sys.time() [18:41:49.744] { [18:41:49.744] { [18:41:49.744] { [18:41:49.744] { [18:41:49.744] base::local({ [18:41:49.744] has_future <- base::requireNamespace("future", [18:41:49.744] quietly = TRUE) [18:41:49.744] if (has_future) { [18:41:49.744] ns <- base::getNamespace("future") [18:41:49.744] version <- ns[[".package"]][["version"]] [18:41:49.744] if (is.null(version)) [18:41:49.744] version <- utils::packageVersion("future") [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] version <- NULL [18:41:49.744] } [18:41:49.744] if (!has_future || version < "1.8.0") { [18:41:49.744] info <- base::c(r_version = base::gsub("R version ", [18:41:49.744] "", base::R.version$version.string), [18:41:49.744] platform = base::sprintf("%s (%s-bit)", [18:41:49.744] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.744] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.744] "release", "version")], collapse = " "), [18:41:49.744] hostname = base::Sys.info()[["nodename"]]) [18:41:49.744] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.744] info) [18:41:49.744] info <- base::paste(info, collapse = "; ") [18:41:49.744] if (!has_future) { [18:41:49.744] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.744] info) [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.744] info, version) [18:41:49.744] } [18:41:49.744] base::stop(msg) [18:41:49.744] } [18:41:49.744] }) [18:41:49.744] } [18:41:49.744] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.744] base::options(mc.cores = 1L) [18:41:49.744] } [18:41:49.744] ...future.strategy.old <- future::plan("list") [18:41:49.744] options(future.plan = NULL) [18:41:49.744] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.744] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.744] } [18:41:49.744] ...future.workdir <- getwd() [18:41:49.744] } [18:41:49.744] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.744] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.744] } [18:41:49.744] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.744] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.744] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.744] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.744] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.744] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.744] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.744] base::names(...future.oldOptions)) [18:41:49.744] } [18:41:49.744] if (FALSE) { [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] if (TRUE) { [18:41:49.744] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.744] open = "w") [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.744] windows = "NUL", "/dev/null"), open = "w") [18:41:49.744] } [18:41:49.744] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.744] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.744] base::sink(type = "output", split = FALSE) [18:41:49.744] base::close(...future.stdout) [18:41:49.744] }, add = TRUE) [18:41:49.744] } [18:41:49.744] ...future.frame <- base::sys.nframe() [18:41:49.744] ...future.conditions <- base::list() [18:41:49.744] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.744] if (FALSE) { [18:41:49.744] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.744] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.744] } [18:41:49.744] ...future.result <- base::tryCatch({ [18:41:49.744] base::withCallingHandlers({ [18:41:49.744] ...future.value <- base::withVisible(base::local({ [18:41:49.744] ...future.makeSendCondition <- base::local({ [18:41:49.744] sendCondition <- NULL [18:41:49.744] function(frame = 1L) { [18:41:49.744] if (is.function(sendCondition)) [18:41:49.744] return(sendCondition) [18:41:49.744] ns <- getNamespace("parallel") [18:41:49.744] if (exists("sendData", mode = "function", [18:41:49.744] envir = ns)) { [18:41:49.744] parallel_sendData <- get("sendData", mode = "function", [18:41:49.744] envir = ns) [18:41:49.744] envir <- sys.frame(frame) [18:41:49.744] master <- NULL [18:41:49.744] while (!identical(envir, .GlobalEnv) && [18:41:49.744] !identical(envir, emptyenv())) { [18:41:49.744] if (exists("master", mode = "list", envir = envir, [18:41:49.744] inherits = FALSE)) { [18:41:49.744] master <- get("master", mode = "list", [18:41:49.744] envir = envir, inherits = FALSE) [18:41:49.744] if (inherits(master, c("SOCKnode", [18:41:49.744] "SOCK0node"))) { [18:41:49.744] sendCondition <<- function(cond) { [18:41:49.744] data <- list(type = "VALUE", value = cond, [18:41:49.744] success = TRUE) [18:41:49.744] parallel_sendData(master, data) [18:41:49.744] } [18:41:49.744] return(sendCondition) [18:41:49.744] } [18:41:49.744] } [18:41:49.744] frame <- frame + 1L [18:41:49.744] envir <- sys.frame(frame) [18:41:49.744] } [18:41:49.744] } [18:41:49.744] sendCondition <<- function(cond) NULL [18:41:49.744] } [18:41:49.744] }) [18:41:49.744] withCallingHandlers({ [18:41:49.744] { [18:41:49.744] do.call(function(...) { [18:41:49.744] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.744] if (!identical(...future.globals.maxSize.org, [18:41:49.744] ...future.globals.maxSize)) { [18:41:49.744] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.744] on.exit(options(oopts), add = TRUE) [18:41:49.744] } [18:41:49.744] { [18:41:49.744] lapply(seq_along(...future.elements_ii), [18:41:49.744] FUN = function(jj) { [18:41:49.744] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.744] ...future.FUN(...future.X_jj, ...) [18:41:49.744] }) [18:41:49.744] } [18:41:49.744] }, args = future.call.arguments) [18:41:49.744] } [18:41:49.744] }, immediateCondition = function(cond) { [18:41:49.744] sendCondition <- ...future.makeSendCondition() [18:41:49.744] sendCondition(cond) [18:41:49.744] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.744] { [18:41:49.744] inherits <- base::inherits [18:41:49.744] invokeRestart <- base::invokeRestart [18:41:49.744] is.null <- base::is.null [18:41:49.744] muffled <- FALSE [18:41:49.744] if (inherits(cond, "message")) { [18:41:49.744] muffled <- grepl(pattern, "muffleMessage") [18:41:49.744] if (muffled) [18:41:49.744] invokeRestart("muffleMessage") [18:41:49.744] } [18:41:49.744] else if (inherits(cond, "warning")) { [18:41:49.744] muffled <- grepl(pattern, "muffleWarning") [18:41:49.744] if (muffled) [18:41:49.744] invokeRestart("muffleWarning") [18:41:49.744] } [18:41:49.744] else if (inherits(cond, "condition")) { [18:41:49.744] if (!is.null(pattern)) { [18:41:49.744] computeRestarts <- base::computeRestarts [18:41:49.744] grepl <- base::grepl [18:41:49.744] restarts <- computeRestarts(cond) [18:41:49.744] for (restart in restarts) { [18:41:49.744] name <- restart$name [18:41:49.744] if (is.null(name)) [18:41:49.744] next [18:41:49.744] if (!grepl(pattern, name)) [18:41:49.744] next [18:41:49.744] invokeRestart(restart) [18:41:49.744] muffled <- TRUE [18:41:49.744] break [18:41:49.744] } [18:41:49.744] } [18:41:49.744] } [18:41:49.744] invisible(muffled) [18:41:49.744] } [18:41:49.744] muffleCondition(cond) [18:41:49.744] }) [18:41:49.744] })) [18:41:49.744] future::FutureResult(value = ...future.value$value, [18:41:49.744] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.744] ...future.rng), globalenv = if (FALSE) [18:41:49.744] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.744] ...future.globalenv.names)) [18:41:49.744] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.744] }, condition = base::local({ [18:41:49.744] c <- base::c [18:41:49.744] inherits <- base::inherits [18:41:49.744] invokeRestart <- base::invokeRestart [18:41:49.744] length <- base::length [18:41:49.744] list <- base::list [18:41:49.744] seq.int <- base::seq.int [18:41:49.744] signalCondition <- base::signalCondition [18:41:49.744] sys.calls <- base::sys.calls [18:41:49.744] `[[` <- base::`[[` [18:41:49.744] `+` <- base::`+` [18:41:49.744] `<<-` <- base::`<<-` [18:41:49.744] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.744] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.744] 3L)] [18:41:49.744] } [18:41:49.744] function(cond) { [18:41:49.744] is_error <- inherits(cond, "error") [18:41:49.744] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.744] NULL) [18:41:49.744] if (is_error) { [18:41:49.744] sessionInformation <- function() { [18:41:49.744] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.744] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.744] search = base::search(), system = base::Sys.info()) [18:41:49.744] } [18:41:49.744] ...future.conditions[[length(...future.conditions) + [18:41:49.744] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.744] cond$call), session = sessionInformation(), [18:41:49.744] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.744] signalCondition(cond) [18:41:49.744] } [18:41:49.744] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.744] "immediateCondition"))) { [18:41:49.744] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.744] ...future.conditions[[length(...future.conditions) + [18:41:49.744] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.744] if (TRUE && !signal) { [18:41:49.744] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.744] { [18:41:49.744] inherits <- base::inherits [18:41:49.744] invokeRestart <- base::invokeRestart [18:41:49.744] is.null <- base::is.null [18:41:49.744] muffled <- FALSE [18:41:49.744] if (inherits(cond, "message")) { [18:41:49.744] muffled <- grepl(pattern, "muffleMessage") [18:41:49.744] if (muffled) [18:41:49.744] invokeRestart("muffleMessage") [18:41:49.744] } [18:41:49.744] else if (inherits(cond, "warning")) { [18:41:49.744] muffled <- grepl(pattern, "muffleWarning") [18:41:49.744] if (muffled) [18:41:49.744] invokeRestart("muffleWarning") [18:41:49.744] } [18:41:49.744] else if (inherits(cond, "condition")) { [18:41:49.744] if (!is.null(pattern)) { [18:41:49.744] computeRestarts <- base::computeRestarts [18:41:49.744] grepl <- base::grepl [18:41:49.744] restarts <- computeRestarts(cond) [18:41:49.744] for (restart in restarts) { [18:41:49.744] name <- restart$name [18:41:49.744] if (is.null(name)) [18:41:49.744] next [18:41:49.744] if (!grepl(pattern, name)) [18:41:49.744] next [18:41:49.744] invokeRestart(restart) [18:41:49.744] muffled <- TRUE [18:41:49.744] break [18:41:49.744] } [18:41:49.744] } [18:41:49.744] } [18:41:49.744] invisible(muffled) [18:41:49.744] } [18:41:49.744] muffleCondition(cond, pattern = "^muffle") [18:41:49.744] } [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] if (TRUE) { [18:41:49.744] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.744] { [18:41:49.744] inherits <- base::inherits [18:41:49.744] invokeRestart <- base::invokeRestart [18:41:49.744] is.null <- base::is.null [18:41:49.744] muffled <- FALSE [18:41:49.744] if (inherits(cond, "message")) { [18:41:49.744] muffled <- grepl(pattern, "muffleMessage") [18:41:49.744] if (muffled) [18:41:49.744] invokeRestart("muffleMessage") [18:41:49.744] } [18:41:49.744] else if (inherits(cond, "warning")) { [18:41:49.744] muffled <- grepl(pattern, "muffleWarning") [18:41:49.744] if (muffled) [18:41:49.744] invokeRestart("muffleWarning") [18:41:49.744] } [18:41:49.744] else if (inherits(cond, "condition")) { [18:41:49.744] if (!is.null(pattern)) { [18:41:49.744] computeRestarts <- base::computeRestarts [18:41:49.744] grepl <- base::grepl [18:41:49.744] restarts <- computeRestarts(cond) [18:41:49.744] for (restart in restarts) { [18:41:49.744] name <- restart$name [18:41:49.744] if (is.null(name)) [18:41:49.744] next [18:41:49.744] if (!grepl(pattern, name)) [18:41:49.744] next [18:41:49.744] invokeRestart(restart) [18:41:49.744] muffled <- TRUE [18:41:49.744] break [18:41:49.744] } [18:41:49.744] } [18:41:49.744] } [18:41:49.744] invisible(muffled) [18:41:49.744] } [18:41:49.744] muffleCondition(cond, pattern = "^muffle") [18:41:49.744] } [18:41:49.744] } [18:41:49.744] } [18:41:49.744] })) [18:41:49.744] }, error = function(ex) { [18:41:49.744] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.744] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.744] ...future.rng), started = ...future.startTime, [18:41:49.744] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.744] version = "1.8"), class = "FutureResult") [18:41:49.744] }, finally = { [18:41:49.744] if (!identical(...future.workdir, getwd())) [18:41:49.744] setwd(...future.workdir) [18:41:49.744] { [18:41:49.744] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.744] ...future.oldOptions$nwarnings <- NULL [18:41:49.744] } [18:41:49.744] base::options(...future.oldOptions) [18:41:49.744] if (.Platform$OS.type == "windows") { [18:41:49.744] old_names <- names(...future.oldEnvVars) [18:41:49.744] envs <- base::Sys.getenv() [18:41:49.744] names <- names(envs) [18:41:49.744] common <- intersect(names, old_names) [18:41:49.744] added <- setdiff(names, old_names) [18:41:49.744] removed <- setdiff(old_names, names) [18:41:49.744] changed <- common[...future.oldEnvVars[common] != [18:41:49.744] envs[common]] [18:41:49.744] NAMES <- toupper(changed) [18:41:49.744] args <- list() [18:41:49.744] for (kk in seq_along(NAMES)) { [18:41:49.744] name <- changed[[kk]] [18:41:49.744] NAME <- NAMES[[kk]] [18:41:49.744] if (name != NAME && is.element(NAME, old_names)) [18:41:49.744] next [18:41:49.744] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.744] } [18:41:49.744] NAMES <- toupper(added) [18:41:49.744] for (kk in seq_along(NAMES)) { [18:41:49.744] name <- added[[kk]] [18:41:49.744] NAME <- NAMES[[kk]] [18:41:49.744] if (name != NAME && is.element(NAME, old_names)) [18:41:49.744] next [18:41:49.744] args[[name]] <- "" [18:41:49.744] } [18:41:49.744] NAMES <- toupper(removed) [18:41:49.744] for (kk in seq_along(NAMES)) { [18:41:49.744] name <- removed[[kk]] [18:41:49.744] NAME <- NAMES[[kk]] [18:41:49.744] if (name != NAME && is.element(NAME, old_names)) [18:41:49.744] next [18:41:49.744] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.744] } [18:41:49.744] if (length(args) > 0) [18:41:49.744] base::do.call(base::Sys.setenv, args = args) [18:41:49.744] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.744] } [18:41:49.744] { [18:41:49.744] if (base::length(...future.futureOptionsAdded) > [18:41:49.744] 0L) { [18:41:49.744] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.744] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.744] base::options(opts) [18:41:49.744] } [18:41:49.744] { [18:41:49.744] { [18:41:49.744] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.744] NULL [18:41:49.744] } [18:41:49.744] options(future.plan = NULL) [18:41:49.744] if (is.na(NA_character_)) [18:41:49.744] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.744] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.744] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.744] .init = FALSE) [18:41:49.744] } [18:41:49.744] } [18:41:49.744] } [18:41:49.744] }) [18:41:49.744] if (TRUE) { [18:41:49.744] base::sink(type = "output", split = FALSE) [18:41:49.744] if (TRUE) { [18:41:49.744] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.744] } [18:41:49.744] else { [18:41:49.744] ...future.result["stdout"] <- base::list(NULL) [18:41:49.744] } [18:41:49.744] base::close(...future.stdout) [18:41:49.744] ...future.stdout <- NULL [18:41:49.744] } [18:41:49.744] ...future.result$conditions <- ...future.conditions [18:41:49.744] ...future.result$finished <- base::Sys.time() [18:41:49.744] ...future.result [18:41:49.744] } [18:41:49.752] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:49.753] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:49.753] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:49.754] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.754] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.755] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:49.755] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:49.756] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.756] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.756] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.757] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.757] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:49.758] MultisessionFuture started [18:41:49.759] - Launch lazy future ... done [18:41:49.759] run() for 'MultisessionFuture' ... done [18:41:49.759] Created future: [18:41:49.772] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.772] - Validating connection of MultisessionFuture [18:41:49.772] - received message: FutureResult [18:41:49.773] - Received FutureResult [18:41:49.773] - Erased future from FutureRegistry [18:41:49.773] result() for ClusterFuture ... [18:41:49.773] - result already collected: FutureResult [18:41:49.774] result() for ClusterFuture ... done [18:41:49.774] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.759] MultisessionFuture: [18:41:49.759] Label: 'future_sapply-1' [18:41:49.759] Expression: [18:41:49.759] { [18:41:49.759] do.call(function(...) { [18:41:49.759] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.759] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.759] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.759] on.exit(options(oopts), add = TRUE) [18:41:49.759] } [18:41:49.759] { [18:41:49.759] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.759] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.759] ...future.FUN(...future.X_jj, ...) [18:41:49.759] }) [18:41:49.759] } [18:41:49.759] }, args = future.call.arguments) [18:41:49.759] } [18:41:49.759] Lazy evaluation: FALSE [18:41:49.759] Asynchronous evaluation: TRUE [18:41:49.759] Local evaluation: TRUE [18:41:49.759] Environment: R_GlobalEnv [18:41:49.759] Capture standard output: TRUE [18:41:49.759] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.759] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.759] Packages: [18:41:49.759] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.759] Resolved: TRUE [18:41:49.759] Value: [18:41:49.759] Conditions captured: [18:41:49.759] Early signaling: FALSE [18:41:49.759] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.759] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.775] Chunk #1 of 2 ... DONE [18:41:49.775] Chunk #2 of 2 ... [18:41:49.775] - Finding globals in 'X' for chunk #2 ... [18:41:49.775] getGlobalsAndPackages() ... [18:41:49.776] Searching for globals... [18:41:49.776] [18:41:49.776] Searching for globals ... DONE [18:41:49.777] - globals: [0] [18:41:49.777] getGlobalsAndPackages() ... DONE [18:41:49.777] + additional globals found: [n=0] [18:41:49.777] + additional namespaces needed: [n=0] [18:41:49.778] - Finding globals in 'X' for chunk #2 ... DONE [18:41:49.778] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.778] - seeds: [18:41:49.778] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.779] getGlobalsAndPackages() ... [18:41:49.779] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.779] Resolving globals: FALSE [18:41:49.780] Tweak future expression to call with '...' arguments ... [18:41:49.780] { [18:41:49.780] do.call(function(...) { [18:41:49.780] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.780] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.780] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.780] on.exit(options(oopts), add = TRUE) [18:41:49.780] } [18:41:49.780] { [18:41:49.780] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.780] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.780] ...future.FUN(...future.X_jj, ...) [18:41:49.780] }) [18:41:49.780] } [18:41:49.780] }, args = future.call.arguments) [18:41:49.780] } [18:41:49.781] Tweak future expression to call with '...' arguments ... DONE [18:41:49.781] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.782] [18:41:49.782] getGlobalsAndPackages() ... DONE [18:41:49.782] run() for 'Future' ... [18:41:49.783] - state: 'created' [18:41:49.783] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.803] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.804] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.804] - Field: 'node' [18:41:49.804] - Field: 'label' [18:41:49.805] - Field: 'local' [18:41:49.805] - Field: 'owner' [18:41:49.805] - Field: 'envir' [18:41:49.805] - Field: 'workers' [18:41:49.806] - Field: 'packages' [18:41:49.806] - Field: 'gc' [18:41:49.806] - Field: 'conditions' [18:41:49.807] - Field: 'persistent' [18:41:49.807] - Field: 'expr' [18:41:49.807] - Field: 'uuid' [18:41:49.807] - Field: 'seed' [18:41:49.808] - Field: 'version' [18:41:49.808] - Field: 'result' [18:41:49.808] - Field: 'asynchronous' [18:41:49.808] - Field: 'calls' [18:41:49.809] - Field: 'globals' [18:41:49.809] - Field: 'stdout' [18:41:49.809] - Field: 'earlySignal' [18:41:49.810] - Field: 'lazy' [18:41:49.810] - Field: 'state' [18:41:49.810] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.810] - Launch lazy future ... [18:41:49.811] Packages needed by the future expression (n = 0): [18:41:49.811] Packages needed by future strategies (n = 0): [18:41:49.812] { [18:41:49.812] { [18:41:49.812] { [18:41:49.812] ...future.startTime <- base::Sys.time() [18:41:49.812] { [18:41:49.812] { [18:41:49.812] { [18:41:49.812] { [18:41:49.812] base::local({ [18:41:49.812] has_future <- base::requireNamespace("future", [18:41:49.812] quietly = TRUE) [18:41:49.812] if (has_future) { [18:41:49.812] ns <- base::getNamespace("future") [18:41:49.812] version <- ns[[".package"]][["version"]] [18:41:49.812] if (is.null(version)) [18:41:49.812] version <- utils::packageVersion("future") [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] version <- NULL [18:41:49.812] } [18:41:49.812] if (!has_future || version < "1.8.0") { [18:41:49.812] info <- base::c(r_version = base::gsub("R version ", [18:41:49.812] "", base::R.version$version.string), [18:41:49.812] platform = base::sprintf("%s (%s-bit)", [18:41:49.812] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.812] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.812] "release", "version")], collapse = " "), [18:41:49.812] hostname = base::Sys.info()[["nodename"]]) [18:41:49.812] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.812] info) [18:41:49.812] info <- base::paste(info, collapse = "; ") [18:41:49.812] if (!has_future) { [18:41:49.812] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.812] info) [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.812] info, version) [18:41:49.812] } [18:41:49.812] base::stop(msg) [18:41:49.812] } [18:41:49.812] }) [18:41:49.812] } [18:41:49.812] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.812] base::options(mc.cores = 1L) [18:41:49.812] } [18:41:49.812] ...future.strategy.old <- future::plan("list") [18:41:49.812] options(future.plan = NULL) [18:41:49.812] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.812] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.812] } [18:41:49.812] ...future.workdir <- getwd() [18:41:49.812] } [18:41:49.812] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.812] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.812] } [18:41:49.812] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.812] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.812] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.812] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.812] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.812] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.812] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.812] base::names(...future.oldOptions)) [18:41:49.812] } [18:41:49.812] if (FALSE) { [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] if (TRUE) { [18:41:49.812] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.812] open = "w") [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.812] windows = "NUL", "/dev/null"), open = "w") [18:41:49.812] } [18:41:49.812] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.812] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.812] base::sink(type = "output", split = FALSE) [18:41:49.812] base::close(...future.stdout) [18:41:49.812] }, add = TRUE) [18:41:49.812] } [18:41:49.812] ...future.frame <- base::sys.nframe() [18:41:49.812] ...future.conditions <- base::list() [18:41:49.812] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.812] if (FALSE) { [18:41:49.812] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.812] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.812] } [18:41:49.812] ...future.result <- base::tryCatch({ [18:41:49.812] base::withCallingHandlers({ [18:41:49.812] ...future.value <- base::withVisible(base::local({ [18:41:49.812] ...future.makeSendCondition <- base::local({ [18:41:49.812] sendCondition <- NULL [18:41:49.812] function(frame = 1L) { [18:41:49.812] if (is.function(sendCondition)) [18:41:49.812] return(sendCondition) [18:41:49.812] ns <- getNamespace("parallel") [18:41:49.812] if (exists("sendData", mode = "function", [18:41:49.812] envir = ns)) { [18:41:49.812] parallel_sendData <- get("sendData", mode = "function", [18:41:49.812] envir = ns) [18:41:49.812] envir <- sys.frame(frame) [18:41:49.812] master <- NULL [18:41:49.812] while (!identical(envir, .GlobalEnv) && [18:41:49.812] !identical(envir, emptyenv())) { [18:41:49.812] if (exists("master", mode = "list", envir = envir, [18:41:49.812] inherits = FALSE)) { [18:41:49.812] master <- get("master", mode = "list", [18:41:49.812] envir = envir, inherits = FALSE) [18:41:49.812] if (inherits(master, c("SOCKnode", [18:41:49.812] "SOCK0node"))) { [18:41:49.812] sendCondition <<- function(cond) { [18:41:49.812] data <- list(type = "VALUE", value = cond, [18:41:49.812] success = TRUE) [18:41:49.812] parallel_sendData(master, data) [18:41:49.812] } [18:41:49.812] return(sendCondition) [18:41:49.812] } [18:41:49.812] } [18:41:49.812] frame <- frame + 1L [18:41:49.812] envir <- sys.frame(frame) [18:41:49.812] } [18:41:49.812] } [18:41:49.812] sendCondition <<- function(cond) NULL [18:41:49.812] } [18:41:49.812] }) [18:41:49.812] withCallingHandlers({ [18:41:49.812] { [18:41:49.812] do.call(function(...) { [18:41:49.812] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.812] if (!identical(...future.globals.maxSize.org, [18:41:49.812] ...future.globals.maxSize)) { [18:41:49.812] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.812] on.exit(options(oopts), add = TRUE) [18:41:49.812] } [18:41:49.812] { [18:41:49.812] lapply(seq_along(...future.elements_ii), [18:41:49.812] FUN = function(jj) { [18:41:49.812] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.812] ...future.FUN(...future.X_jj, ...) [18:41:49.812] }) [18:41:49.812] } [18:41:49.812] }, args = future.call.arguments) [18:41:49.812] } [18:41:49.812] }, immediateCondition = function(cond) { [18:41:49.812] sendCondition <- ...future.makeSendCondition() [18:41:49.812] sendCondition(cond) [18:41:49.812] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.812] { [18:41:49.812] inherits <- base::inherits [18:41:49.812] invokeRestart <- base::invokeRestart [18:41:49.812] is.null <- base::is.null [18:41:49.812] muffled <- FALSE [18:41:49.812] if (inherits(cond, "message")) { [18:41:49.812] muffled <- grepl(pattern, "muffleMessage") [18:41:49.812] if (muffled) [18:41:49.812] invokeRestart("muffleMessage") [18:41:49.812] } [18:41:49.812] else if (inherits(cond, "warning")) { [18:41:49.812] muffled <- grepl(pattern, "muffleWarning") [18:41:49.812] if (muffled) [18:41:49.812] invokeRestart("muffleWarning") [18:41:49.812] } [18:41:49.812] else if (inherits(cond, "condition")) { [18:41:49.812] if (!is.null(pattern)) { [18:41:49.812] computeRestarts <- base::computeRestarts [18:41:49.812] grepl <- base::grepl [18:41:49.812] restarts <- computeRestarts(cond) [18:41:49.812] for (restart in restarts) { [18:41:49.812] name <- restart$name [18:41:49.812] if (is.null(name)) [18:41:49.812] next [18:41:49.812] if (!grepl(pattern, name)) [18:41:49.812] next [18:41:49.812] invokeRestart(restart) [18:41:49.812] muffled <- TRUE [18:41:49.812] break [18:41:49.812] } [18:41:49.812] } [18:41:49.812] } [18:41:49.812] invisible(muffled) [18:41:49.812] } [18:41:49.812] muffleCondition(cond) [18:41:49.812] }) [18:41:49.812] })) [18:41:49.812] future::FutureResult(value = ...future.value$value, [18:41:49.812] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.812] ...future.rng), globalenv = if (FALSE) [18:41:49.812] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.812] ...future.globalenv.names)) [18:41:49.812] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.812] }, condition = base::local({ [18:41:49.812] c <- base::c [18:41:49.812] inherits <- base::inherits [18:41:49.812] invokeRestart <- base::invokeRestart [18:41:49.812] length <- base::length [18:41:49.812] list <- base::list [18:41:49.812] seq.int <- base::seq.int [18:41:49.812] signalCondition <- base::signalCondition [18:41:49.812] sys.calls <- base::sys.calls [18:41:49.812] `[[` <- base::`[[` [18:41:49.812] `+` <- base::`+` [18:41:49.812] `<<-` <- base::`<<-` [18:41:49.812] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.812] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.812] 3L)] [18:41:49.812] } [18:41:49.812] function(cond) { [18:41:49.812] is_error <- inherits(cond, "error") [18:41:49.812] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.812] NULL) [18:41:49.812] if (is_error) { [18:41:49.812] sessionInformation <- function() { [18:41:49.812] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.812] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.812] search = base::search(), system = base::Sys.info()) [18:41:49.812] } [18:41:49.812] ...future.conditions[[length(...future.conditions) + [18:41:49.812] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.812] cond$call), session = sessionInformation(), [18:41:49.812] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.812] signalCondition(cond) [18:41:49.812] } [18:41:49.812] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.812] "immediateCondition"))) { [18:41:49.812] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.812] ...future.conditions[[length(...future.conditions) + [18:41:49.812] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.812] if (TRUE && !signal) { [18:41:49.812] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.812] { [18:41:49.812] inherits <- base::inherits [18:41:49.812] invokeRestart <- base::invokeRestart [18:41:49.812] is.null <- base::is.null [18:41:49.812] muffled <- FALSE [18:41:49.812] if (inherits(cond, "message")) { [18:41:49.812] muffled <- grepl(pattern, "muffleMessage") [18:41:49.812] if (muffled) [18:41:49.812] invokeRestart("muffleMessage") [18:41:49.812] } [18:41:49.812] else if (inherits(cond, "warning")) { [18:41:49.812] muffled <- grepl(pattern, "muffleWarning") [18:41:49.812] if (muffled) [18:41:49.812] invokeRestart("muffleWarning") [18:41:49.812] } [18:41:49.812] else if (inherits(cond, "condition")) { [18:41:49.812] if (!is.null(pattern)) { [18:41:49.812] computeRestarts <- base::computeRestarts [18:41:49.812] grepl <- base::grepl [18:41:49.812] restarts <- computeRestarts(cond) [18:41:49.812] for (restart in restarts) { [18:41:49.812] name <- restart$name [18:41:49.812] if (is.null(name)) [18:41:49.812] next [18:41:49.812] if (!grepl(pattern, name)) [18:41:49.812] next [18:41:49.812] invokeRestart(restart) [18:41:49.812] muffled <- TRUE [18:41:49.812] break [18:41:49.812] } [18:41:49.812] } [18:41:49.812] } [18:41:49.812] invisible(muffled) [18:41:49.812] } [18:41:49.812] muffleCondition(cond, pattern = "^muffle") [18:41:49.812] } [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] if (TRUE) { [18:41:49.812] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.812] { [18:41:49.812] inherits <- base::inherits [18:41:49.812] invokeRestart <- base::invokeRestart [18:41:49.812] is.null <- base::is.null [18:41:49.812] muffled <- FALSE [18:41:49.812] if (inherits(cond, "message")) { [18:41:49.812] muffled <- grepl(pattern, "muffleMessage") [18:41:49.812] if (muffled) [18:41:49.812] invokeRestart("muffleMessage") [18:41:49.812] } [18:41:49.812] else if (inherits(cond, "warning")) { [18:41:49.812] muffled <- grepl(pattern, "muffleWarning") [18:41:49.812] if (muffled) [18:41:49.812] invokeRestart("muffleWarning") [18:41:49.812] } [18:41:49.812] else if (inherits(cond, "condition")) { [18:41:49.812] if (!is.null(pattern)) { [18:41:49.812] computeRestarts <- base::computeRestarts [18:41:49.812] grepl <- base::grepl [18:41:49.812] restarts <- computeRestarts(cond) [18:41:49.812] for (restart in restarts) { [18:41:49.812] name <- restart$name [18:41:49.812] if (is.null(name)) [18:41:49.812] next [18:41:49.812] if (!grepl(pattern, name)) [18:41:49.812] next [18:41:49.812] invokeRestart(restart) [18:41:49.812] muffled <- TRUE [18:41:49.812] break [18:41:49.812] } [18:41:49.812] } [18:41:49.812] } [18:41:49.812] invisible(muffled) [18:41:49.812] } [18:41:49.812] muffleCondition(cond, pattern = "^muffle") [18:41:49.812] } [18:41:49.812] } [18:41:49.812] } [18:41:49.812] })) [18:41:49.812] }, error = function(ex) { [18:41:49.812] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.812] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.812] ...future.rng), started = ...future.startTime, [18:41:49.812] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.812] version = "1.8"), class = "FutureResult") [18:41:49.812] }, finally = { [18:41:49.812] if (!identical(...future.workdir, getwd())) [18:41:49.812] setwd(...future.workdir) [18:41:49.812] { [18:41:49.812] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.812] ...future.oldOptions$nwarnings <- NULL [18:41:49.812] } [18:41:49.812] base::options(...future.oldOptions) [18:41:49.812] if (.Platform$OS.type == "windows") { [18:41:49.812] old_names <- names(...future.oldEnvVars) [18:41:49.812] envs <- base::Sys.getenv() [18:41:49.812] names <- names(envs) [18:41:49.812] common <- intersect(names, old_names) [18:41:49.812] added <- setdiff(names, old_names) [18:41:49.812] removed <- setdiff(old_names, names) [18:41:49.812] changed <- common[...future.oldEnvVars[common] != [18:41:49.812] envs[common]] [18:41:49.812] NAMES <- toupper(changed) [18:41:49.812] args <- list() [18:41:49.812] for (kk in seq_along(NAMES)) { [18:41:49.812] name <- changed[[kk]] [18:41:49.812] NAME <- NAMES[[kk]] [18:41:49.812] if (name != NAME && is.element(NAME, old_names)) [18:41:49.812] next [18:41:49.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.812] } [18:41:49.812] NAMES <- toupper(added) [18:41:49.812] for (kk in seq_along(NAMES)) { [18:41:49.812] name <- added[[kk]] [18:41:49.812] NAME <- NAMES[[kk]] [18:41:49.812] if (name != NAME && is.element(NAME, old_names)) [18:41:49.812] next [18:41:49.812] args[[name]] <- "" [18:41:49.812] } [18:41:49.812] NAMES <- toupper(removed) [18:41:49.812] for (kk in seq_along(NAMES)) { [18:41:49.812] name <- removed[[kk]] [18:41:49.812] NAME <- NAMES[[kk]] [18:41:49.812] if (name != NAME && is.element(NAME, old_names)) [18:41:49.812] next [18:41:49.812] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.812] } [18:41:49.812] if (length(args) > 0) [18:41:49.812] base::do.call(base::Sys.setenv, args = args) [18:41:49.812] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.812] } [18:41:49.812] { [18:41:49.812] if (base::length(...future.futureOptionsAdded) > [18:41:49.812] 0L) { [18:41:49.812] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.812] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.812] base::options(opts) [18:41:49.812] } [18:41:49.812] { [18:41:49.812] { [18:41:49.812] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.812] NULL [18:41:49.812] } [18:41:49.812] options(future.plan = NULL) [18:41:49.812] if (is.na(NA_character_)) [18:41:49.812] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.812] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.812] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.812] .init = FALSE) [18:41:49.812] } [18:41:49.812] } [18:41:49.812] } [18:41:49.812] }) [18:41:49.812] if (TRUE) { [18:41:49.812] base::sink(type = "output", split = FALSE) [18:41:49.812] if (TRUE) { [18:41:49.812] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.812] } [18:41:49.812] else { [18:41:49.812] ...future.result["stdout"] <- base::list(NULL) [18:41:49.812] } [18:41:49.812] base::close(...future.stdout) [18:41:49.812] ...future.stdout <- NULL [18:41:49.812] } [18:41:49.812] ...future.result$conditions <- ...future.conditions [18:41:49.812] ...future.result$finished <- base::Sys.time() [18:41:49.812] ...future.result [18:41:49.812] } [18:41:49.821] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:49.821] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:49.821] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:49.822] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.822] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.823] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:49.823] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:49.823] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.824] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.824] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.825] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.825] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:49.826] MultisessionFuture started [18:41:49.826] - Launch lazy future ... done [18:41:49.827] run() for 'MultisessionFuture' ... done [18:41:49.827] Created future: [18:41:49.841] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.841] - Validating connection of MultisessionFuture [18:41:49.841] - received message: FutureResult [18:41:49.842] - Received FutureResult [18:41:49.842] - Erased future from FutureRegistry [18:41:49.842] result() for ClusterFuture ... [18:41:49.842] - result already collected: FutureResult [18:41:49.843] result() for ClusterFuture ... done [18:41:49.843] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.827] MultisessionFuture: [18:41:49.827] Label: 'future_sapply-2' [18:41:49.827] Expression: [18:41:49.827] { [18:41:49.827] do.call(function(...) { [18:41:49.827] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.827] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.827] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.827] on.exit(options(oopts), add = TRUE) [18:41:49.827] } [18:41:49.827] { [18:41:49.827] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.827] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.827] ...future.FUN(...future.X_jj, ...) [18:41:49.827] }) [18:41:49.827] } [18:41:49.827] }, args = future.call.arguments) [18:41:49.827] } [18:41:49.827] Lazy evaluation: FALSE [18:41:49.827] Asynchronous evaluation: TRUE [18:41:49.827] Local evaluation: TRUE [18:41:49.827] Environment: R_GlobalEnv [18:41:49.827] Capture standard output: TRUE [18:41:49.827] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.827] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.827] Packages: [18:41:49.827] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.827] Resolved: TRUE [18:41:49.827] Value: [18:41:49.827] Conditions captured: [18:41:49.827] Early signaling: FALSE [18:41:49.827] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.827] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.844] Chunk #2 of 2 ... DONE [18:41:49.844] Launching 2 futures (chunks) ... DONE [18:41:49.844] Resolving 2 futures (chunks) ... [18:41:49.845] resolve() on list ... [18:41:49.845] recursive: 0 [18:41:49.845] length: 2 [18:41:49.845] [18:41:49.846] Future #1 [18:41:49.846] result() for ClusterFuture ... [18:41:49.846] - result already collected: FutureResult [18:41:49.846] result() for ClusterFuture ... done [18:41:49.847] result() for ClusterFuture ... [18:41:49.847] - result already collected: FutureResult [18:41:49.847] result() for ClusterFuture ... done [18:41:49.847] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:49.848] - nx: 2 [18:41:49.848] - relay: TRUE [18:41:49.848] - stdout: TRUE [18:41:49.848] - signal: TRUE [18:41:49.849] - resignal: FALSE [18:41:49.849] - force: TRUE [18:41:49.849] - relayed: [n=2] FALSE, FALSE [18:41:49.849] - queued futures: [n=2] FALSE, FALSE [18:41:49.850] - until=1 [18:41:49.850] - relaying element #1 [18:41:49.850] result() for ClusterFuture ... [18:41:49.850] - result already collected: FutureResult [18:41:49.851] result() for ClusterFuture ... done [18:41:49.851] result() for ClusterFuture ... [18:41:49.851] - result already collected: FutureResult [18:41:49.851] result() for ClusterFuture ... done [18:41:49.852] result() for ClusterFuture ... [18:41:49.852] - result already collected: FutureResult [18:41:49.852] result() for ClusterFuture ... done [18:41:49.853] result() for ClusterFuture ... [18:41:49.853] - result already collected: FutureResult [18:41:49.853] result() for ClusterFuture ... done [18:41:49.853] - relayed: [n=2] TRUE, FALSE [18:41:49.854] - queued futures: [n=2] TRUE, FALSE [18:41:49.854] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:49.854] length: 1 (resolved future 1) [18:41:49.854] Future #2 [18:41:49.855] result() for ClusterFuture ... [18:41:49.855] - result already collected: FutureResult [18:41:49.855] result() for ClusterFuture ... done [18:41:49.855] result() for ClusterFuture ... [18:41:49.856] - result already collected: FutureResult [18:41:49.856] result() for ClusterFuture ... done [18:41:49.856] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:49.856] - nx: 2 [18:41:49.857] - relay: TRUE [18:41:49.857] - stdout: TRUE [18:41:49.857] - signal: TRUE [18:41:49.857] - resignal: FALSE [18:41:49.858] - force: TRUE [18:41:49.858] - relayed: [n=2] TRUE, FALSE [18:41:49.858] - queued futures: [n=2] TRUE, FALSE [18:41:49.858] - until=2 [18:41:49.859] - relaying element #2 [18:41:49.859] result() for ClusterFuture ... [18:41:49.859] - result already collected: FutureResult [18:41:49.859] result() for ClusterFuture ... done [18:41:49.860] result() for ClusterFuture ... [18:41:49.860] - result already collected: FutureResult [18:41:49.860] result() for ClusterFuture ... done [18:41:49.860] result() for ClusterFuture ... [18:41:49.861] - result already collected: FutureResult [18:41:49.861] result() for ClusterFuture ... done [18:41:49.861] result() for ClusterFuture ... [18:41:49.861] - result already collected: FutureResult [18:41:49.862] result() for ClusterFuture ... done [18:41:49.862] - relayed: [n=2] TRUE, TRUE [18:41:49.862] - queued futures: [n=2] TRUE, TRUE [18:41:49.862] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:49.863] length: 0 (resolved future 2) [18:41:49.863] Relaying remaining futures [18:41:49.863] signalConditionsASAP(NULL, pos=0) ... [18:41:49.864] - nx: 2 [18:41:49.864] - relay: TRUE [18:41:49.864] - stdout: TRUE [18:41:49.864] - signal: TRUE [18:41:49.864] - resignal: FALSE [18:41:49.865] - force: TRUE [18:41:49.865] - relayed: [n=2] TRUE, TRUE [18:41:49.865] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:49.866] - relayed: [n=2] TRUE, TRUE [18:41:49.866] - queued futures: [n=2] TRUE, TRUE [18:41:49.866] signalConditionsASAP(NULL, pos=0) ... done [18:41:49.866] resolve() on list ... DONE [18:41:49.867] result() for ClusterFuture ... [18:41:49.867] - result already collected: FutureResult [18:41:49.867] result() for ClusterFuture ... done [18:41:49.867] result() for ClusterFuture ... [18:41:49.868] - result already collected: FutureResult [18:41:49.868] result() for ClusterFuture ... done [18:41:49.868] result() for ClusterFuture ... [18:41:49.868] - result already collected: FutureResult [18:41:49.869] result() for ClusterFuture ... done [18:41:49.869] result() for ClusterFuture ... [18:41:49.869] - result already collected: FutureResult [18:41:49.869] result() for ClusterFuture ... done [18:41:49.870] - Number of value chunks collected: 2 [18:41:49.870] Resolving 2 futures (chunks) ... DONE [18:41:49.870] Reducing values from 2 chunks ... [18:41:49.870] - Number of values collected after concatenation: 6 [18:41:49.871] - Number of values expected: 6 [18:41:49.871] Reducing values from 2 chunks ... DONE [18:41:49.871] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y1:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y2:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 [18:41:49.889] future_lapply() ... [18:41:49.894] Number of chunks: 2 [18:41:49.894] getGlobalsAndPackagesXApply() ... [18:41:49.894] - future.globals: TRUE [18:41:49.894] getGlobalsAndPackages() ... [18:41:49.895] Searching for globals... [18:41:49.897] - globals found: [2] 'FUN', 'UseMethod' [18:41:49.897] Searching for globals ... DONE [18:41:49.897] Resolving globals: FALSE [18:41:49.898] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:49.898] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:49.899] - globals: [1] 'FUN' [18:41:49.899] [18:41:49.899] getGlobalsAndPackages() ... DONE [18:41:49.899] - globals found/used: [n=1] 'FUN' [18:41:49.900] - needed namespaces: [n=0] [18:41:49.900] Finding globals ... DONE [18:41:49.900] - use_args: TRUE [18:41:49.900] - Getting '...' globals ... [18:41:49.901] resolve() on list ... [18:41:49.901] recursive: 0 [18:41:49.902] length: 1 [18:41:49.902] elements: '...' [18:41:49.902] length: 0 (resolved future 1) [18:41:49.902] resolve() on list ... DONE [18:41:49.903] - '...' content: [n=0] [18:41:49.903] List of 1 [18:41:49.903] $ ...: list() [18:41:49.903] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.903] - attr(*, "where")=List of 1 [18:41:49.903] ..$ ...: [18:41:49.903] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.903] - attr(*, "resolved")= logi TRUE [18:41:49.903] - attr(*, "total_size")= num NA [18:41:49.907] - Getting '...' globals ... DONE [18:41:49.908] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:49.908] List of 2 [18:41:49.908] $ ...future.FUN:function (x, ...) [18:41:49.908] $ ... : list() [18:41:49.908] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:49.908] - attr(*, "where")=List of 2 [18:41:49.908] ..$ ...future.FUN: [18:41:49.908] ..$ ... : [18:41:49.908] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:49.908] - attr(*, "resolved")= logi FALSE [18:41:49.908] - attr(*, "total_size")= int 5182 [18:41:49.914] Packages to be attached in all futures: [n=0] [18:41:49.914] getGlobalsAndPackagesXApply() ... DONE [18:41:49.914] Number of futures (= number of chunks): 2 [18:41:49.915] Launching 2 futures (chunks) ... [18:41:49.915] Chunk #1 of 2 ... [18:41:49.915] - Finding globals in 'X' for chunk #1 ... [18:41:49.915] getGlobalsAndPackages() ... [18:41:49.916] Searching for globals... [18:41:49.916] [18:41:49.916] Searching for globals ... DONE [18:41:49.917] - globals: [0] [18:41:49.917] getGlobalsAndPackages() ... DONE [18:41:49.917] + additional globals found: [n=0] [18:41:49.918] + additional namespaces needed: [n=0] [18:41:49.918] - Finding globals in 'X' for chunk #1 ... DONE [18:41:49.918] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.918] - seeds: [18:41:49.919] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.919] getGlobalsAndPackages() ... [18:41:49.919] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.919] Resolving globals: FALSE [18:41:49.920] Tweak future expression to call with '...' arguments ... [18:41:49.920] { [18:41:49.920] do.call(function(...) { [18:41:49.920] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.920] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.920] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.920] on.exit(options(oopts), add = TRUE) [18:41:49.920] } [18:41:49.920] { [18:41:49.920] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.920] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.920] ...future.FUN(...future.X_jj, ...) [18:41:49.920] }) [18:41:49.920] } [18:41:49.920] }, args = future.call.arguments) [18:41:49.920] } [18:41:49.921] Tweak future expression to call with '...' arguments ... DONE [18:41:49.922] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.922] [18:41:49.922] getGlobalsAndPackages() ... DONE [18:41:49.923] run() for 'Future' ... [18:41:49.923] - state: 'created' [18:41:49.923] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:49.944] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.944] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:49.944] - Field: 'node' [18:41:49.945] - Field: 'label' [18:41:49.945] - Field: 'local' [18:41:49.945] - Field: 'owner' [18:41:49.945] - Field: 'envir' [18:41:49.946] - Field: 'workers' [18:41:49.946] - Field: 'packages' [18:41:49.946] - Field: 'gc' [18:41:49.947] - Field: 'conditions' [18:41:49.947] - Field: 'persistent' [18:41:49.947] - Field: 'expr' [18:41:49.948] - Field: 'uuid' [18:41:49.948] - Field: 'seed' [18:41:49.948] - Field: 'version' [18:41:49.948] - Field: 'result' [18:41:49.949] - Field: 'asynchronous' [18:41:49.949] - Field: 'calls' [18:41:49.949] - Field: 'globals' [18:41:49.950] - Field: 'stdout' [18:41:49.950] - Field: 'earlySignal' [18:41:49.950] - Field: 'lazy' [18:41:49.950] - Field: 'state' [18:41:49.951] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:49.951] - Launch lazy future ... [18:41:49.952] Packages needed by the future expression (n = 0): [18:41:49.952] Packages needed by future strategies (n = 0): [18:41:49.953] { [18:41:49.953] { [18:41:49.953] { [18:41:49.953] ...future.startTime <- base::Sys.time() [18:41:49.953] { [18:41:49.953] { [18:41:49.953] { [18:41:49.953] { [18:41:49.953] base::local({ [18:41:49.953] has_future <- base::requireNamespace("future", [18:41:49.953] quietly = TRUE) [18:41:49.953] if (has_future) { [18:41:49.953] ns <- base::getNamespace("future") [18:41:49.953] version <- ns[[".package"]][["version"]] [18:41:49.953] if (is.null(version)) [18:41:49.953] version <- utils::packageVersion("future") [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] version <- NULL [18:41:49.953] } [18:41:49.953] if (!has_future || version < "1.8.0") { [18:41:49.953] info <- base::c(r_version = base::gsub("R version ", [18:41:49.953] "", base::R.version$version.string), [18:41:49.953] platform = base::sprintf("%s (%s-bit)", [18:41:49.953] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:49.953] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:49.953] "release", "version")], collapse = " "), [18:41:49.953] hostname = base::Sys.info()[["nodename"]]) [18:41:49.953] info <- base::sprintf("%s: %s", base::names(info), [18:41:49.953] info) [18:41:49.953] info <- base::paste(info, collapse = "; ") [18:41:49.953] if (!has_future) { [18:41:49.953] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:49.953] info) [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:49.953] info, version) [18:41:49.953] } [18:41:49.953] base::stop(msg) [18:41:49.953] } [18:41:49.953] }) [18:41:49.953] } [18:41:49.953] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:49.953] base::options(mc.cores = 1L) [18:41:49.953] } [18:41:49.953] ...future.strategy.old <- future::plan("list") [18:41:49.953] options(future.plan = NULL) [18:41:49.953] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.953] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:49.953] } [18:41:49.953] ...future.workdir <- getwd() [18:41:49.953] } [18:41:49.953] ...future.oldOptions <- base::as.list(base::.Options) [18:41:49.953] ...future.oldEnvVars <- base::Sys.getenv() [18:41:49.953] } [18:41:49.953] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:49.953] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:49.953] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:49.953] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:49.953] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:49.953] future.stdout.windows.reencode = NULL, width = 80L) [18:41:49.953] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:49.953] base::names(...future.oldOptions)) [18:41:49.953] } [18:41:49.953] if (FALSE) { [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] if (TRUE) { [18:41:49.953] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:49.953] open = "w") [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:49.953] windows = "NUL", "/dev/null"), open = "w") [18:41:49.953] } [18:41:49.953] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:49.953] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:49.953] base::sink(type = "output", split = FALSE) [18:41:49.953] base::close(...future.stdout) [18:41:49.953] }, add = TRUE) [18:41:49.953] } [18:41:49.953] ...future.frame <- base::sys.nframe() [18:41:49.953] ...future.conditions <- base::list() [18:41:49.953] ...future.rng <- base::globalenv()$.Random.seed [18:41:49.953] if (FALSE) { [18:41:49.953] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:49.953] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:49.953] } [18:41:49.953] ...future.result <- base::tryCatch({ [18:41:49.953] base::withCallingHandlers({ [18:41:49.953] ...future.value <- base::withVisible(base::local({ [18:41:49.953] ...future.makeSendCondition <- base::local({ [18:41:49.953] sendCondition <- NULL [18:41:49.953] function(frame = 1L) { [18:41:49.953] if (is.function(sendCondition)) [18:41:49.953] return(sendCondition) [18:41:49.953] ns <- getNamespace("parallel") [18:41:49.953] if (exists("sendData", mode = "function", [18:41:49.953] envir = ns)) { [18:41:49.953] parallel_sendData <- get("sendData", mode = "function", [18:41:49.953] envir = ns) [18:41:49.953] envir <- sys.frame(frame) [18:41:49.953] master <- NULL [18:41:49.953] while (!identical(envir, .GlobalEnv) && [18:41:49.953] !identical(envir, emptyenv())) { [18:41:49.953] if (exists("master", mode = "list", envir = envir, [18:41:49.953] inherits = FALSE)) { [18:41:49.953] master <- get("master", mode = "list", [18:41:49.953] envir = envir, inherits = FALSE) [18:41:49.953] if (inherits(master, c("SOCKnode", [18:41:49.953] "SOCK0node"))) { [18:41:49.953] sendCondition <<- function(cond) { [18:41:49.953] data <- list(type = "VALUE", value = cond, [18:41:49.953] success = TRUE) [18:41:49.953] parallel_sendData(master, data) [18:41:49.953] } [18:41:49.953] return(sendCondition) [18:41:49.953] } [18:41:49.953] } [18:41:49.953] frame <- frame + 1L [18:41:49.953] envir <- sys.frame(frame) [18:41:49.953] } [18:41:49.953] } [18:41:49.953] sendCondition <<- function(cond) NULL [18:41:49.953] } [18:41:49.953] }) [18:41:49.953] withCallingHandlers({ [18:41:49.953] { [18:41:49.953] do.call(function(...) { [18:41:49.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.953] if (!identical(...future.globals.maxSize.org, [18:41:49.953] ...future.globals.maxSize)) { [18:41:49.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.953] on.exit(options(oopts), add = TRUE) [18:41:49.953] } [18:41:49.953] { [18:41:49.953] lapply(seq_along(...future.elements_ii), [18:41:49.953] FUN = function(jj) { [18:41:49.953] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.953] ...future.FUN(...future.X_jj, ...) [18:41:49.953] }) [18:41:49.953] } [18:41:49.953] }, args = future.call.arguments) [18:41:49.953] } [18:41:49.953] }, immediateCondition = function(cond) { [18:41:49.953] sendCondition <- ...future.makeSendCondition() [18:41:49.953] sendCondition(cond) [18:41:49.953] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.953] { [18:41:49.953] inherits <- base::inherits [18:41:49.953] invokeRestart <- base::invokeRestart [18:41:49.953] is.null <- base::is.null [18:41:49.953] muffled <- FALSE [18:41:49.953] if (inherits(cond, "message")) { [18:41:49.953] muffled <- grepl(pattern, "muffleMessage") [18:41:49.953] if (muffled) [18:41:49.953] invokeRestart("muffleMessage") [18:41:49.953] } [18:41:49.953] else if (inherits(cond, "warning")) { [18:41:49.953] muffled <- grepl(pattern, "muffleWarning") [18:41:49.953] if (muffled) [18:41:49.953] invokeRestart("muffleWarning") [18:41:49.953] } [18:41:49.953] else if (inherits(cond, "condition")) { [18:41:49.953] if (!is.null(pattern)) { [18:41:49.953] computeRestarts <- base::computeRestarts [18:41:49.953] grepl <- base::grepl [18:41:49.953] restarts <- computeRestarts(cond) [18:41:49.953] for (restart in restarts) { [18:41:49.953] name <- restart$name [18:41:49.953] if (is.null(name)) [18:41:49.953] next [18:41:49.953] if (!grepl(pattern, name)) [18:41:49.953] next [18:41:49.953] invokeRestart(restart) [18:41:49.953] muffled <- TRUE [18:41:49.953] break [18:41:49.953] } [18:41:49.953] } [18:41:49.953] } [18:41:49.953] invisible(muffled) [18:41:49.953] } [18:41:49.953] muffleCondition(cond) [18:41:49.953] }) [18:41:49.953] })) [18:41:49.953] future::FutureResult(value = ...future.value$value, [18:41:49.953] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.953] ...future.rng), globalenv = if (FALSE) [18:41:49.953] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:49.953] ...future.globalenv.names)) [18:41:49.953] else NULL, started = ...future.startTime, version = "1.8") [18:41:49.953] }, condition = base::local({ [18:41:49.953] c <- base::c [18:41:49.953] inherits <- base::inherits [18:41:49.953] invokeRestart <- base::invokeRestart [18:41:49.953] length <- base::length [18:41:49.953] list <- base::list [18:41:49.953] seq.int <- base::seq.int [18:41:49.953] signalCondition <- base::signalCondition [18:41:49.953] sys.calls <- base::sys.calls [18:41:49.953] `[[` <- base::`[[` [18:41:49.953] `+` <- base::`+` [18:41:49.953] `<<-` <- base::`<<-` [18:41:49.953] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:49.953] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:49.953] 3L)] [18:41:49.953] } [18:41:49.953] function(cond) { [18:41:49.953] is_error <- inherits(cond, "error") [18:41:49.953] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:49.953] NULL) [18:41:49.953] if (is_error) { [18:41:49.953] sessionInformation <- function() { [18:41:49.953] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:49.953] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:49.953] search = base::search(), system = base::Sys.info()) [18:41:49.953] } [18:41:49.953] ...future.conditions[[length(...future.conditions) + [18:41:49.953] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:49.953] cond$call), session = sessionInformation(), [18:41:49.953] timestamp = base::Sys.time(), signaled = 0L) [18:41:49.953] signalCondition(cond) [18:41:49.953] } [18:41:49.953] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:49.953] "immediateCondition"))) { [18:41:49.953] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:49.953] ...future.conditions[[length(...future.conditions) + [18:41:49.953] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:49.953] if (TRUE && !signal) { [18:41:49.953] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.953] { [18:41:49.953] inherits <- base::inherits [18:41:49.953] invokeRestart <- base::invokeRestart [18:41:49.953] is.null <- base::is.null [18:41:49.953] muffled <- FALSE [18:41:49.953] if (inherits(cond, "message")) { [18:41:49.953] muffled <- grepl(pattern, "muffleMessage") [18:41:49.953] if (muffled) [18:41:49.953] invokeRestart("muffleMessage") [18:41:49.953] } [18:41:49.953] else if (inherits(cond, "warning")) { [18:41:49.953] muffled <- grepl(pattern, "muffleWarning") [18:41:49.953] if (muffled) [18:41:49.953] invokeRestart("muffleWarning") [18:41:49.953] } [18:41:49.953] else if (inherits(cond, "condition")) { [18:41:49.953] if (!is.null(pattern)) { [18:41:49.953] computeRestarts <- base::computeRestarts [18:41:49.953] grepl <- base::grepl [18:41:49.953] restarts <- computeRestarts(cond) [18:41:49.953] for (restart in restarts) { [18:41:49.953] name <- restart$name [18:41:49.953] if (is.null(name)) [18:41:49.953] next [18:41:49.953] if (!grepl(pattern, name)) [18:41:49.953] next [18:41:49.953] invokeRestart(restart) [18:41:49.953] muffled <- TRUE [18:41:49.953] break [18:41:49.953] } [18:41:49.953] } [18:41:49.953] } [18:41:49.953] invisible(muffled) [18:41:49.953] } [18:41:49.953] muffleCondition(cond, pattern = "^muffle") [18:41:49.953] } [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] if (TRUE) { [18:41:49.953] muffleCondition <- function (cond, pattern = "^muffle") [18:41:49.953] { [18:41:49.953] inherits <- base::inherits [18:41:49.953] invokeRestart <- base::invokeRestart [18:41:49.953] is.null <- base::is.null [18:41:49.953] muffled <- FALSE [18:41:49.953] if (inherits(cond, "message")) { [18:41:49.953] muffled <- grepl(pattern, "muffleMessage") [18:41:49.953] if (muffled) [18:41:49.953] invokeRestart("muffleMessage") [18:41:49.953] } [18:41:49.953] else if (inherits(cond, "warning")) { [18:41:49.953] muffled <- grepl(pattern, "muffleWarning") [18:41:49.953] if (muffled) [18:41:49.953] invokeRestart("muffleWarning") [18:41:49.953] } [18:41:49.953] else if (inherits(cond, "condition")) { [18:41:49.953] if (!is.null(pattern)) { [18:41:49.953] computeRestarts <- base::computeRestarts [18:41:49.953] grepl <- base::grepl [18:41:49.953] restarts <- computeRestarts(cond) [18:41:49.953] for (restart in restarts) { [18:41:49.953] name <- restart$name [18:41:49.953] if (is.null(name)) [18:41:49.953] next [18:41:49.953] if (!grepl(pattern, name)) [18:41:49.953] next [18:41:49.953] invokeRestart(restart) [18:41:49.953] muffled <- TRUE [18:41:49.953] break [18:41:49.953] } [18:41:49.953] } [18:41:49.953] } [18:41:49.953] invisible(muffled) [18:41:49.953] } [18:41:49.953] muffleCondition(cond, pattern = "^muffle") [18:41:49.953] } [18:41:49.953] } [18:41:49.953] } [18:41:49.953] })) [18:41:49.953] }, error = function(ex) { [18:41:49.953] base::structure(base::list(value = NULL, visible = NULL, [18:41:49.953] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:49.953] ...future.rng), started = ...future.startTime, [18:41:49.953] finished = Sys.time(), session_uuid = NA_character_, [18:41:49.953] version = "1.8"), class = "FutureResult") [18:41:49.953] }, finally = { [18:41:49.953] if (!identical(...future.workdir, getwd())) [18:41:49.953] setwd(...future.workdir) [18:41:49.953] { [18:41:49.953] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:49.953] ...future.oldOptions$nwarnings <- NULL [18:41:49.953] } [18:41:49.953] base::options(...future.oldOptions) [18:41:49.953] if (.Platform$OS.type == "windows") { [18:41:49.953] old_names <- names(...future.oldEnvVars) [18:41:49.953] envs <- base::Sys.getenv() [18:41:49.953] names <- names(envs) [18:41:49.953] common <- intersect(names, old_names) [18:41:49.953] added <- setdiff(names, old_names) [18:41:49.953] removed <- setdiff(old_names, names) [18:41:49.953] changed <- common[...future.oldEnvVars[common] != [18:41:49.953] envs[common]] [18:41:49.953] NAMES <- toupper(changed) [18:41:49.953] args <- list() [18:41:49.953] for (kk in seq_along(NAMES)) { [18:41:49.953] name <- changed[[kk]] [18:41:49.953] NAME <- NAMES[[kk]] [18:41:49.953] if (name != NAME && is.element(NAME, old_names)) [18:41:49.953] next [18:41:49.953] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.953] } [18:41:49.953] NAMES <- toupper(added) [18:41:49.953] for (kk in seq_along(NAMES)) { [18:41:49.953] name <- added[[kk]] [18:41:49.953] NAME <- NAMES[[kk]] [18:41:49.953] if (name != NAME && is.element(NAME, old_names)) [18:41:49.953] next [18:41:49.953] args[[name]] <- "" [18:41:49.953] } [18:41:49.953] NAMES <- toupper(removed) [18:41:49.953] for (kk in seq_along(NAMES)) { [18:41:49.953] name <- removed[[kk]] [18:41:49.953] NAME <- NAMES[[kk]] [18:41:49.953] if (name != NAME && is.element(NAME, old_names)) [18:41:49.953] next [18:41:49.953] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:49.953] } [18:41:49.953] if (length(args) > 0) [18:41:49.953] base::do.call(base::Sys.setenv, args = args) [18:41:49.953] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:49.953] } [18:41:49.953] { [18:41:49.953] if (base::length(...future.futureOptionsAdded) > [18:41:49.953] 0L) { [18:41:49.953] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:49.953] base::names(opts) <- ...future.futureOptionsAdded [18:41:49.953] base::options(opts) [18:41:49.953] } [18:41:49.953] { [18:41:49.953] { [18:41:49.953] base::options(mc.cores = ...future.mc.cores.old) [18:41:49.953] NULL [18:41:49.953] } [18:41:49.953] options(future.plan = NULL) [18:41:49.953] if (is.na(NA_character_)) [18:41:49.953] Sys.unsetenv("R_FUTURE_PLAN") [18:41:49.953] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:49.953] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:49.953] .init = FALSE) [18:41:49.953] } [18:41:49.953] } [18:41:49.953] } [18:41:49.953] }) [18:41:49.953] if (TRUE) { [18:41:49.953] base::sink(type = "output", split = FALSE) [18:41:49.953] if (TRUE) { [18:41:49.953] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:49.953] } [18:41:49.953] else { [18:41:49.953] ...future.result["stdout"] <- base::list(NULL) [18:41:49.953] } [18:41:49.953] base::close(...future.stdout) [18:41:49.953] ...future.stdout <- NULL [18:41:49.953] } [18:41:49.953] ...future.result$conditions <- ...future.conditions [18:41:49.953] ...future.result$finished <- base::Sys.time() [18:41:49.953] ...future.result [18:41:49.953] } [18:41:49.962] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:49.962] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:49.963] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:49.963] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:49.963] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:49.964] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:49.964] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:49.965] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:49.965] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:49.966] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:49.966] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:49.966] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:49.967] MultisessionFuture started [18:41:49.968] - Launch lazy future ... done [18:41:49.968] run() for 'MultisessionFuture' ... done [18:41:49.968] Created future: [18:41:49.982] receiveMessageFromWorker() for ClusterFuture ... [18:41:49.982] - Validating connection of MultisessionFuture [18:41:49.982] - received message: FutureResult [18:41:49.983] - Received FutureResult [18:41:49.983] - Erased future from FutureRegistry [18:41:49.983] result() for ClusterFuture ... [18:41:49.984] - result already collected: FutureResult [18:41:49.984] result() for ClusterFuture ... done [18:41:49.984] receiveMessageFromWorker() for ClusterFuture ... done [18:41:49.969] MultisessionFuture: [18:41:49.969] Label: 'future_sapply-1' [18:41:49.969] Expression: [18:41:49.969] { [18:41:49.969] do.call(function(...) { [18:41:49.969] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.969] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.969] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.969] on.exit(options(oopts), add = TRUE) [18:41:49.969] } [18:41:49.969] { [18:41:49.969] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.969] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.969] ...future.FUN(...future.X_jj, ...) [18:41:49.969] }) [18:41:49.969] } [18:41:49.969] }, args = future.call.arguments) [18:41:49.969] } [18:41:49.969] Lazy evaluation: FALSE [18:41:49.969] Asynchronous evaluation: TRUE [18:41:49.969] Local evaluation: TRUE [18:41:49.969] Environment: R_GlobalEnv [18:41:49.969] Capture standard output: TRUE [18:41:49.969] Capture condition classes: 'condition' (excluding 'nothing') [18:41:49.969] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:49.969] Packages: [18:41:49.969] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:49.969] Resolved: TRUE [18:41:49.969] Value: [18:41:49.969] Conditions captured: [18:41:49.969] Early signaling: FALSE [18:41:49.969] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:49.969] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:49.985] Chunk #1 of 2 ... DONE [18:41:49.985] Chunk #2 of 2 ... [18:41:49.985] - Finding globals in 'X' for chunk #2 ... [18:41:49.986] getGlobalsAndPackages() ... [18:41:49.986] Searching for globals... [18:41:49.991] [18:41:49.992] Searching for globals ... DONE [18:41:49.992] - globals: [0] [18:41:49.992] getGlobalsAndPackages() ... DONE [18:41:49.992] + additional globals found: [n=0] [18:41:49.993] + additional namespaces needed: [n=0] [18:41:49.993] - Finding globals in 'X' for chunk #2 ... DONE [18:41:49.993] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:49.994] - seeds: [18:41:49.994] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.994] getGlobalsAndPackages() ... [18:41:49.994] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.995] Resolving globals: FALSE [18:41:49.995] Tweak future expression to call with '...' arguments ... [18:41:49.995] { [18:41:49.995] do.call(function(...) { [18:41:49.995] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:49.995] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:49.995] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:49.995] on.exit(options(oopts), add = TRUE) [18:41:49.995] } [18:41:49.995] { [18:41:49.995] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:49.995] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:49.995] ...future.FUN(...future.X_jj, ...) [18:41:49.995] }) [18:41:49.995] } [18:41:49.995] }, args = future.call.arguments) [18:41:49.995] } [18:41:49.996] Tweak future expression to call with '...' arguments ... DONE [18:41:49.997] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:49.997] [18:41:49.997] getGlobalsAndPackages() ... DONE [18:41:49.998] run() for 'Future' ... [18:41:49.998] - state: 'created' [18:41:49.999] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.018] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.019] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.019] - Field: 'node' [18:41:50.019] - Field: 'label' [18:41:50.019] - Field: 'local' [18:41:50.020] - Field: 'owner' [18:41:50.020] - Field: 'envir' [18:41:50.020] - Field: 'workers' [18:41:50.021] - Field: 'packages' [18:41:50.021] - Field: 'gc' [18:41:50.021] - Field: 'conditions' [18:41:50.021] - Field: 'persistent' [18:41:50.022] - Field: 'expr' [18:41:50.022] - Field: 'uuid' [18:41:50.022] - Field: 'seed' [18:41:50.023] - Field: 'version' [18:41:50.023] - Field: 'result' [18:41:50.023] - Field: 'asynchronous' [18:41:50.023] - Field: 'calls' [18:41:50.024] - Field: 'globals' [18:41:50.024] - Field: 'stdout' [18:41:50.024] - Field: 'earlySignal' [18:41:50.025] - Field: 'lazy' [18:41:50.025] - Field: 'state' [18:41:50.025] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.025] - Launch lazy future ... [18:41:50.026] Packages needed by the future expression (n = 0): [18:41:50.026] Packages needed by future strategies (n = 0): [18:41:50.027] { [18:41:50.027] { [18:41:50.027] { [18:41:50.027] ...future.startTime <- base::Sys.time() [18:41:50.027] { [18:41:50.027] { [18:41:50.027] { [18:41:50.027] { [18:41:50.027] base::local({ [18:41:50.027] has_future <- base::requireNamespace("future", [18:41:50.027] quietly = TRUE) [18:41:50.027] if (has_future) { [18:41:50.027] ns <- base::getNamespace("future") [18:41:50.027] version <- ns[[".package"]][["version"]] [18:41:50.027] if (is.null(version)) [18:41:50.027] version <- utils::packageVersion("future") [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] version <- NULL [18:41:50.027] } [18:41:50.027] if (!has_future || version < "1.8.0") { [18:41:50.027] info <- base::c(r_version = base::gsub("R version ", [18:41:50.027] "", base::R.version$version.string), [18:41:50.027] platform = base::sprintf("%s (%s-bit)", [18:41:50.027] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.027] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.027] "release", "version")], collapse = " "), [18:41:50.027] hostname = base::Sys.info()[["nodename"]]) [18:41:50.027] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.027] info) [18:41:50.027] info <- base::paste(info, collapse = "; ") [18:41:50.027] if (!has_future) { [18:41:50.027] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.027] info) [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.027] info, version) [18:41:50.027] } [18:41:50.027] base::stop(msg) [18:41:50.027] } [18:41:50.027] }) [18:41:50.027] } [18:41:50.027] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.027] base::options(mc.cores = 1L) [18:41:50.027] } [18:41:50.027] ...future.strategy.old <- future::plan("list") [18:41:50.027] options(future.plan = NULL) [18:41:50.027] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.027] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.027] } [18:41:50.027] ...future.workdir <- getwd() [18:41:50.027] } [18:41:50.027] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.027] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.027] } [18:41:50.027] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.027] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.027] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.027] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.027] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.027] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.027] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.027] base::names(...future.oldOptions)) [18:41:50.027] } [18:41:50.027] if (FALSE) { [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] if (TRUE) { [18:41:50.027] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.027] open = "w") [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.027] windows = "NUL", "/dev/null"), open = "w") [18:41:50.027] } [18:41:50.027] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.027] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.027] base::sink(type = "output", split = FALSE) [18:41:50.027] base::close(...future.stdout) [18:41:50.027] }, add = TRUE) [18:41:50.027] } [18:41:50.027] ...future.frame <- base::sys.nframe() [18:41:50.027] ...future.conditions <- base::list() [18:41:50.027] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.027] if (FALSE) { [18:41:50.027] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.027] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.027] } [18:41:50.027] ...future.result <- base::tryCatch({ [18:41:50.027] base::withCallingHandlers({ [18:41:50.027] ...future.value <- base::withVisible(base::local({ [18:41:50.027] ...future.makeSendCondition <- base::local({ [18:41:50.027] sendCondition <- NULL [18:41:50.027] function(frame = 1L) { [18:41:50.027] if (is.function(sendCondition)) [18:41:50.027] return(sendCondition) [18:41:50.027] ns <- getNamespace("parallel") [18:41:50.027] if (exists("sendData", mode = "function", [18:41:50.027] envir = ns)) { [18:41:50.027] parallel_sendData <- get("sendData", mode = "function", [18:41:50.027] envir = ns) [18:41:50.027] envir <- sys.frame(frame) [18:41:50.027] master <- NULL [18:41:50.027] while (!identical(envir, .GlobalEnv) && [18:41:50.027] !identical(envir, emptyenv())) { [18:41:50.027] if (exists("master", mode = "list", envir = envir, [18:41:50.027] inherits = FALSE)) { [18:41:50.027] master <- get("master", mode = "list", [18:41:50.027] envir = envir, inherits = FALSE) [18:41:50.027] if (inherits(master, c("SOCKnode", [18:41:50.027] "SOCK0node"))) { [18:41:50.027] sendCondition <<- function(cond) { [18:41:50.027] data <- list(type = "VALUE", value = cond, [18:41:50.027] success = TRUE) [18:41:50.027] parallel_sendData(master, data) [18:41:50.027] } [18:41:50.027] return(sendCondition) [18:41:50.027] } [18:41:50.027] } [18:41:50.027] frame <- frame + 1L [18:41:50.027] envir <- sys.frame(frame) [18:41:50.027] } [18:41:50.027] } [18:41:50.027] sendCondition <<- function(cond) NULL [18:41:50.027] } [18:41:50.027] }) [18:41:50.027] withCallingHandlers({ [18:41:50.027] { [18:41:50.027] do.call(function(...) { [18:41:50.027] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.027] if (!identical(...future.globals.maxSize.org, [18:41:50.027] ...future.globals.maxSize)) { [18:41:50.027] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.027] on.exit(options(oopts), add = TRUE) [18:41:50.027] } [18:41:50.027] { [18:41:50.027] lapply(seq_along(...future.elements_ii), [18:41:50.027] FUN = function(jj) { [18:41:50.027] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.027] ...future.FUN(...future.X_jj, ...) [18:41:50.027] }) [18:41:50.027] } [18:41:50.027] }, args = future.call.arguments) [18:41:50.027] } [18:41:50.027] }, immediateCondition = function(cond) { [18:41:50.027] sendCondition <- ...future.makeSendCondition() [18:41:50.027] sendCondition(cond) [18:41:50.027] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.027] { [18:41:50.027] inherits <- base::inherits [18:41:50.027] invokeRestart <- base::invokeRestart [18:41:50.027] is.null <- base::is.null [18:41:50.027] muffled <- FALSE [18:41:50.027] if (inherits(cond, "message")) { [18:41:50.027] muffled <- grepl(pattern, "muffleMessage") [18:41:50.027] if (muffled) [18:41:50.027] invokeRestart("muffleMessage") [18:41:50.027] } [18:41:50.027] else if (inherits(cond, "warning")) { [18:41:50.027] muffled <- grepl(pattern, "muffleWarning") [18:41:50.027] if (muffled) [18:41:50.027] invokeRestart("muffleWarning") [18:41:50.027] } [18:41:50.027] else if (inherits(cond, "condition")) { [18:41:50.027] if (!is.null(pattern)) { [18:41:50.027] computeRestarts <- base::computeRestarts [18:41:50.027] grepl <- base::grepl [18:41:50.027] restarts <- computeRestarts(cond) [18:41:50.027] for (restart in restarts) { [18:41:50.027] name <- restart$name [18:41:50.027] if (is.null(name)) [18:41:50.027] next [18:41:50.027] if (!grepl(pattern, name)) [18:41:50.027] next [18:41:50.027] invokeRestart(restart) [18:41:50.027] muffled <- TRUE [18:41:50.027] break [18:41:50.027] } [18:41:50.027] } [18:41:50.027] } [18:41:50.027] invisible(muffled) [18:41:50.027] } [18:41:50.027] muffleCondition(cond) [18:41:50.027] }) [18:41:50.027] })) [18:41:50.027] future::FutureResult(value = ...future.value$value, [18:41:50.027] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.027] ...future.rng), globalenv = if (FALSE) [18:41:50.027] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.027] ...future.globalenv.names)) [18:41:50.027] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.027] }, condition = base::local({ [18:41:50.027] c <- base::c [18:41:50.027] inherits <- base::inherits [18:41:50.027] invokeRestart <- base::invokeRestart [18:41:50.027] length <- base::length [18:41:50.027] list <- base::list [18:41:50.027] seq.int <- base::seq.int [18:41:50.027] signalCondition <- base::signalCondition [18:41:50.027] sys.calls <- base::sys.calls [18:41:50.027] `[[` <- base::`[[` [18:41:50.027] `+` <- base::`+` [18:41:50.027] `<<-` <- base::`<<-` [18:41:50.027] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.027] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.027] 3L)] [18:41:50.027] } [18:41:50.027] function(cond) { [18:41:50.027] is_error <- inherits(cond, "error") [18:41:50.027] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.027] NULL) [18:41:50.027] if (is_error) { [18:41:50.027] sessionInformation <- function() { [18:41:50.027] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.027] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.027] search = base::search(), system = base::Sys.info()) [18:41:50.027] } [18:41:50.027] ...future.conditions[[length(...future.conditions) + [18:41:50.027] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.027] cond$call), session = sessionInformation(), [18:41:50.027] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.027] signalCondition(cond) [18:41:50.027] } [18:41:50.027] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.027] "immediateCondition"))) { [18:41:50.027] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.027] ...future.conditions[[length(...future.conditions) + [18:41:50.027] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.027] if (TRUE && !signal) { [18:41:50.027] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.027] { [18:41:50.027] inherits <- base::inherits [18:41:50.027] invokeRestart <- base::invokeRestart [18:41:50.027] is.null <- base::is.null [18:41:50.027] muffled <- FALSE [18:41:50.027] if (inherits(cond, "message")) { [18:41:50.027] muffled <- grepl(pattern, "muffleMessage") [18:41:50.027] if (muffled) [18:41:50.027] invokeRestart("muffleMessage") [18:41:50.027] } [18:41:50.027] else if (inherits(cond, "warning")) { [18:41:50.027] muffled <- grepl(pattern, "muffleWarning") [18:41:50.027] if (muffled) [18:41:50.027] invokeRestart("muffleWarning") [18:41:50.027] } [18:41:50.027] else if (inherits(cond, "condition")) { [18:41:50.027] if (!is.null(pattern)) { [18:41:50.027] computeRestarts <- base::computeRestarts [18:41:50.027] grepl <- base::grepl [18:41:50.027] restarts <- computeRestarts(cond) [18:41:50.027] for (restart in restarts) { [18:41:50.027] name <- restart$name [18:41:50.027] if (is.null(name)) [18:41:50.027] next [18:41:50.027] if (!grepl(pattern, name)) [18:41:50.027] next [18:41:50.027] invokeRestart(restart) [18:41:50.027] muffled <- TRUE [18:41:50.027] break [18:41:50.027] } [18:41:50.027] } [18:41:50.027] } [18:41:50.027] invisible(muffled) [18:41:50.027] } [18:41:50.027] muffleCondition(cond, pattern = "^muffle") [18:41:50.027] } [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] if (TRUE) { [18:41:50.027] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.027] { [18:41:50.027] inherits <- base::inherits [18:41:50.027] invokeRestart <- base::invokeRestart [18:41:50.027] is.null <- base::is.null [18:41:50.027] muffled <- FALSE [18:41:50.027] if (inherits(cond, "message")) { [18:41:50.027] muffled <- grepl(pattern, "muffleMessage") [18:41:50.027] if (muffled) [18:41:50.027] invokeRestart("muffleMessage") [18:41:50.027] } [18:41:50.027] else if (inherits(cond, "warning")) { [18:41:50.027] muffled <- grepl(pattern, "muffleWarning") [18:41:50.027] if (muffled) [18:41:50.027] invokeRestart("muffleWarning") [18:41:50.027] } [18:41:50.027] else if (inherits(cond, "condition")) { [18:41:50.027] if (!is.null(pattern)) { [18:41:50.027] computeRestarts <- base::computeRestarts [18:41:50.027] grepl <- base::grepl [18:41:50.027] restarts <- computeRestarts(cond) [18:41:50.027] for (restart in restarts) { [18:41:50.027] name <- restart$name [18:41:50.027] if (is.null(name)) [18:41:50.027] next [18:41:50.027] if (!grepl(pattern, name)) [18:41:50.027] next [18:41:50.027] invokeRestart(restart) [18:41:50.027] muffled <- TRUE [18:41:50.027] break [18:41:50.027] } [18:41:50.027] } [18:41:50.027] } [18:41:50.027] invisible(muffled) [18:41:50.027] } [18:41:50.027] muffleCondition(cond, pattern = "^muffle") [18:41:50.027] } [18:41:50.027] } [18:41:50.027] } [18:41:50.027] })) [18:41:50.027] }, error = function(ex) { [18:41:50.027] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.027] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.027] ...future.rng), started = ...future.startTime, [18:41:50.027] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.027] version = "1.8"), class = "FutureResult") [18:41:50.027] }, finally = { [18:41:50.027] if (!identical(...future.workdir, getwd())) [18:41:50.027] setwd(...future.workdir) [18:41:50.027] { [18:41:50.027] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.027] ...future.oldOptions$nwarnings <- NULL [18:41:50.027] } [18:41:50.027] base::options(...future.oldOptions) [18:41:50.027] if (.Platform$OS.type == "windows") { [18:41:50.027] old_names <- names(...future.oldEnvVars) [18:41:50.027] envs <- base::Sys.getenv() [18:41:50.027] names <- names(envs) [18:41:50.027] common <- intersect(names, old_names) [18:41:50.027] added <- setdiff(names, old_names) [18:41:50.027] removed <- setdiff(old_names, names) [18:41:50.027] changed <- common[...future.oldEnvVars[common] != [18:41:50.027] envs[common]] [18:41:50.027] NAMES <- toupper(changed) [18:41:50.027] args <- list() [18:41:50.027] for (kk in seq_along(NAMES)) { [18:41:50.027] name <- changed[[kk]] [18:41:50.027] NAME <- NAMES[[kk]] [18:41:50.027] if (name != NAME && is.element(NAME, old_names)) [18:41:50.027] next [18:41:50.027] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.027] } [18:41:50.027] NAMES <- toupper(added) [18:41:50.027] for (kk in seq_along(NAMES)) { [18:41:50.027] name <- added[[kk]] [18:41:50.027] NAME <- NAMES[[kk]] [18:41:50.027] if (name != NAME && is.element(NAME, old_names)) [18:41:50.027] next [18:41:50.027] args[[name]] <- "" [18:41:50.027] } [18:41:50.027] NAMES <- toupper(removed) [18:41:50.027] for (kk in seq_along(NAMES)) { [18:41:50.027] name <- removed[[kk]] [18:41:50.027] NAME <- NAMES[[kk]] [18:41:50.027] if (name != NAME && is.element(NAME, old_names)) [18:41:50.027] next [18:41:50.027] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.027] } [18:41:50.027] if (length(args) > 0) [18:41:50.027] base::do.call(base::Sys.setenv, args = args) [18:41:50.027] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.027] } [18:41:50.027] { [18:41:50.027] if (base::length(...future.futureOptionsAdded) > [18:41:50.027] 0L) { [18:41:50.027] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.027] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.027] base::options(opts) [18:41:50.027] } [18:41:50.027] { [18:41:50.027] { [18:41:50.027] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.027] NULL [18:41:50.027] } [18:41:50.027] options(future.plan = NULL) [18:41:50.027] if (is.na(NA_character_)) [18:41:50.027] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.027] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.027] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.027] .init = FALSE) [18:41:50.027] } [18:41:50.027] } [18:41:50.027] } [18:41:50.027] }) [18:41:50.027] if (TRUE) { [18:41:50.027] base::sink(type = "output", split = FALSE) [18:41:50.027] if (TRUE) { [18:41:50.027] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.027] } [18:41:50.027] else { [18:41:50.027] ...future.result["stdout"] <- base::list(NULL) [18:41:50.027] } [18:41:50.027] base::close(...future.stdout) [18:41:50.027] ...future.stdout <- NULL [18:41:50.027] } [18:41:50.027] ...future.result$conditions <- ...future.conditions [18:41:50.027] ...future.result$finished <- base::Sys.time() [18:41:50.027] ...future.result [18:41:50.027] } [18:41:50.036] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:50.036] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:50.037] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:50.037] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.038] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.038] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.039] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.039] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.039] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.040] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.040] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.041] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:50.042] MultisessionFuture started [18:41:50.042] - Launch lazy future ... done [18:41:50.042] run() for 'MultisessionFuture' ... done [18:41:50.042] Created future: [18:41:50.055] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.055] - Validating connection of MultisessionFuture [18:41:50.055] - received message: FutureResult [18:41:50.056] - Received FutureResult [18:41:50.056] - Erased future from FutureRegistry [18:41:50.056] result() for ClusterFuture ... [18:41:50.057] - result already collected: FutureResult [18:41:50.057] result() for ClusterFuture ... done [18:41:50.057] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.043] MultisessionFuture: [18:41:50.043] Label: 'future_sapply-2' [18:41:50.043] Expression: [18:41:50.043] { [18:41:50.043] do.call(function(...) { [18:41:50.043] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.043] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.043] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.043] on.exit(options(oopts), add = TRUE) [18:41:50.043] } [18:41:50.043] { [18:41:50.043] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.043] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.043] ...future.FUN(...future.X_jj, ...) [18:41:50.043] }) [18:41:50.043] } [18:41:50.043] }, args = future.call.arguments) [18:41:50.043] } [18:41:50.043] Lazy evaluation: FALSE [18:41:50.043] Asynchronous evaluation: TRUE [18:41:50.043] Local evaluation: TRUE [18:41:50.043] Environment: R_GlobalEnv [18:41:50.043] Capture standard output: TRUE [18:41:50.043] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.043] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.043] Packages: [18:41:50.043] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.043] Resolved: TRUE [18:41:50.043] Value: [18:41:50.043] Conditions captured: [18:41:50.043] Early signaling: FALSE [18:41:50.043] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.043] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.058] Chunk #2 of 2 ... DONE [18:41:50.058] Launching 2 futures (chunks) ... DONE [18:41:50.058] Resolving 2 futures (chunks) ... [18:41:50.059] resolve() on list ... [18:41:50.059] recursive: 0 [18:41:50.059] length: 2 [18:41:50.059] [18:41:50.060] Future #1 [18:41:50.060] result() for ClusterFuture ... [18:41:50.060] - result already collected: FutureResult [18:41:50.060] result() for ClusterFuture ... done [18:41:50.061] result() for ClusterFuture ... [18:41:50.061] - result already collected: FutureResult [18:41:50.061] result() for ClusterFuture ... done [18:41:50.061] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:50.062] - nx: 2 [18:41:50.062] - relay: TRUE [18:41:50.062] - stdout: TRUE [18:41:50.062] - signal: TRUE [18:41:50.062] - resignal: FALSE [18:41:50.063] - force: TRUE [18:41:50.063] - relayed: [n=2] FALSE, FALSE [18:41:50.063] - queued futures: [n=2] FALSE, FALSE [18:41:50.063] - until=1 [18:41:50.064] - relaying element #1 [18:41:50.064] result() for ClusterFuture ... [18:41:50.064] - result already collected: FutureResult [18:41:50.064] result() for ClusterFuture ... done [18:41:50.065] result() for ClusterFuture ... [18:41:50.065] - result already collected: FutureResult [18:41:50.065] result() for ClusterFuture ... done [18:41:50.065] result() for ClusterFuture ... [18:41:50.066] - result already collected: FutureResult [18:41:50.066] result() for ClusterFuture ... done [18:41:50.066] result() for ClusterFuture ... [18:41:50.066] - result already collected: FutureResult [18:41:50.067] result() for ClusterFuture ... done [18:41:50.067] - relayed: [n=2] TRUE, FALSE [18:41:50.067] - queued futures: [n=2] TRUE, FALSE [18:41:50.067] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:50.068] length: 1 (resolved future 1) [18:41:50.068] Future #2 [18:41:50.068] result() for ClusterFuture ... [18:41:50.068] - result already collected: FutureResult [18:41:50.069] result() for ClusterFuture ... done [18:41:50.069] result() for ClusterFuture ... [18:41:50.069] - result already collected: FutureResult [18:41:50.069] result() for ClusterFuture ... done [18:41:50.069] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:50.070] - nx: 2 [18:41:50.070] - relay: TRUE [18:41:50.070] - stdout: TRUE [18:41:50.070] - signal: TRUE [18:41:50.071] - resignal: FALSE [18:41:50.071] - force: TRUE [18:41:50.071] - relayed: [n=2] TRUE, FALSE [18:41:50.071] - queued futures: [n=2] TRUE, FALSE [18:41:50.072] - until=2 [18:41:50.072] - relaying element #2 [18:41:50.072] result() for ClusterFuture ... [18:41:50.072] - result already collected: FutureResult [18:41:50.072] result() for ClusterFuture ... done [18:41:50.073] result() for ClusterFuture ... [18:41:50.073] - result already collected: FutureResult [18:41:50.073] result() for ClusterFuture ... done [18:41:50.073] result() for ClusterFuture ... [18:41:50.074] - result already collected: FutureResult [18:41:50.074] result() for ClusterFuture ... done [18:41:50.074] result() for ClusterFuture ... [18:41:50.074] - result already collected: FutureResult [18:41:50.075] result() for ClusterFuture ... done [18:41:50.075] - relayed: [n=2] TRUE, TRUE [18:41:50.075] - queued futures: [n=2] TRUE, TRUE [18:41:50.075] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:50.076] length: 0 (resolved future 2) [18:41:50.076] Relaying remaining futures [18:41:50.076] signalConditionsASAP(NULL, pos=0) ... [18:41:50.076] - nx: 2 [18:41:50.077] - relay: TRUE [18:41:50.077] - stdout: TRUE [18:41:50.077] - signal: TRUE [18:41:50.078] - resignal: FALSE [18:41:50.078] - force: TRUE [18:41:50.078] - relayed: [n=2] TRUE, TRUE [18:41:50.078] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:50.079] - relayed: [n=2] TRUE, TRUE [18:41:50.079] - queued futures: [n=2] TRUE, TRUE [18:41:50.079] signalConditionsASAP(NULL, pos=0) ... done [18:41:50.080] resolve() on list ... DONE [18:41:50.080] result() for ClusterFuture ... [18:41:50.080] - result already collected: FutureResult [18:41:50.081] result() for ClusterFuture ... done [18:41:50.081] result() for ClusterFuture ... [18:41:50.081] - result already collected: FutureResult [18:41:50.081] result() for ClusterFuture ... done [18:41:50.082] result() for ClusterFuture ... [18:41:50.082] - result already collected: FutureResult [18:41:50.082] result() for ClusterFuture ... done [18:41:50.083] result() for ClusterFuture ... [18:41:50.083] - result already collected: FutureResult [18:41:50.083] result() for ClusterFuture ... done [18:41:50.084] - Number of value chunks collected: 2 [18:41:50.084] Resolving 2 futures (chunks) ... DONE [18:41:50.084] Reducing values from 2 chunks ... [18:41:50.084] - Number of values collected after concatenation: 6 [18:41:50.085] - Number of values expected: 6 [18:41:50.085] Reducing values from 2 chunks ... DONE [18:41:50.085] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y1:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y2:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 [18:41:50.109] future_lapply() ... [18:41:50.115] Number of chunks: 2 [18:41:50.115] getGlobalsAndPackagesXApply() ... [18:41:50.115] - future.globals: TRUE [18:41:50.116] getGlobalsAndPackages() ... [18:41:50.116] Searching for globals... [18:41:50.119] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:50.120] Searching for globals ... DONE [18:41:50.120] Resolving globals: FALSE [18:41:50.121] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:50.122] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:50.122] - globals: [1] 'FUN' [18:41:50.122] [18:41:50.123] getGlobalsAndPackages() ... DONE [18:41:50.123] - globals found/used: [n=1] 'FUN' [18:41:50.123] - needed namespaces: [n=0] [18:41:50.124] Finding globals ... DONE [18:41:50.124] - use_args: TRUE [18:41:50.124] - Getting '...' globals ... [18:41:50.125] resolve() on list ... [18:41:50.125] recursive: 0 [18:41:50.126] length: 1 [18:41:50.126] elements: '...' [18:41:50.126] length: 0 (resolved future 1) [18:41:50.127] resolve() on list ... DONE [18:41:50.127] - '...' content: [n=0] [18:41:50.127] List of 1 [18:41:50.127] $ ...: list() [18:41:50.127] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.127] - attr(*, "where")=List of 1 [18:41:50.127] ..$ ...: [18:41:50.127] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.127] - attr(*, "resolved")= logi TRUE [18:41:50.127] - attr(*, "total_size")= num NA [18:41:50.133] - Getting '...' globals ... DONE [18:41:50.133] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:50.134] List of 2 [18:41:50.134] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:50.134] $ ... : list() [18:41:50.134] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.134] - attr(*, "where")=List of 2 [18:41:50.134] ..$ ...future.FUN: [18:41:50.134] ..$ ... : [18:41:50.134] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.134] - attr(*, "resolved")= logi FALSE [18:41:50.134] - attr(*, "total_size")= int 6664 [18:41:50.140] Packages to be attached in all futures: [n=0] [18:41:50.140] getGlobalsAndPackagesXApply() ... DONE [18:41:50.141] Number of futures (= number of chunks): 2 [18:41:50.141] Launching 2 futures (chunks) ... [18:41:50.141] Chunk #1 of 2 ... [18:41:50.142] - Finding globals in 'X' for chunk #1 ... [18:41:50.142] getGlobalsAndPackages() ... [18:41:50.142] Searching for globals... [18:41:50.143] [18:41:50.143] Searching for globals ... DONE [18:41:50.143] - globals: [0] [18:41:50.144] getGlobalsAndPackages() ... DONE [18:41:50.144] + additional globals found: [n=0] [18:41:50.144] + additional namespaces needed: [n=0] [18:41:50.145] - Finding globals in 'X' for chunk #1 ... DONE [18:41:50.145] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.145] - seeds: [18:41:50.146] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.146] getGlobalsAndPackages() ... [18:41:50.146] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.147] Resolving globals: FALSE [18:41:50.147] Tweak future expression to call with '...' arguments ... [18:41:50.147] { [18:41:50.147] do.call(function(...) { [18:41:50.147] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.147] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.147] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.147] on.exit(options(oopts), add = TRUE) [18:41:50.147] } [18:41:50.147] { [18:41:50.147] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.147] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.147] ...future.FUN(...future.X_jj, ...) [18:41:50.147] }) [18:41:50.147] } [18:41:50.147] }, args = future.call.arguments) [18:41:50.147] } [18:41:50.148] Tweak future expression to call with '...' arguments ... DONE [18:41:50.149] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.149] [18:41:50.150] getGlobalsAndPackages() ... DONE [18:41:50.150] run() for 'Future' ... [18:41:50.151] - state: 'created' [18:41:50.151] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.179] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.180] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.180] - Field: 'node' [18:41:50.180] - Field: 'label' [18:41:50.181] - Field: 'local' [18:41:50.181] - Field: 'owner' [18:41:50.181] - Field: 'envir' [18:41:50.182] - Field: 'workers' [18:41:50.182] - Field: 'packages' [18:41:50.182] - Field: 'gc' [18:41:50.183] - Field: 'conditions' [18:41:50.183] - Field: 'persistent' [18:41:50.183] - Field: 'expr' [18:41:50.184] - Field: 'uuid' [18:41:50.184] - Field: 'seed' [18:41:50.184] - Field: 'version' [18:41:50.185] - Field: 'result' [18:41:50.185] - Field: 'asynchronous' [18:41:50.185] - Field: 'calls' [18:41:50.186] - Field: 'globals' [18:41:50.186] - Field: 'stdout' [18:41:50.186] - Field: 'earlySignal' [18:41:50.187] - Field: 'lazy' [18:41:50.187] - Field: 'state' [18:41:50.187] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.187] - Launch lazy future ... [18:41:50.188] Packages needed by the future expression (n = 0): [18:41:50.188] Packages needed by future strategies (n = 0): [18:41:50.190] { [18:41:50.190] { [18:41:50.190] { [18:41:50.190] ...future.startTime <- base::Sys.time() [18:41:50.190] { [18:41:50.190] { [18:41:50.190] { [18:41:50.190] { [18:41:50.190] base::local({ [18:41:50.190] has_future <- base::requireNamespace("future", [18:41:50.190] quietly = TRUE) [18:41:50.190] if (has_future) { [18:41:50.190] ns <- base::getNamespace("future") [18:41:50.190] version <- ns[[".package"]][["version"]] [18:41:50.190] if (is.null(version)) [18:41:50.190] version <- utils::packageVersion("future") [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] version <- NULL [18:41:50.190] } [18:41:50.190] if (!has_future || version < "1.8.0") { [18:41:50.190] info <- base::c(r_version = base::gsub("R version ", [18:41:50.190] "", base::R.version$version.string), [18:41:50.190] platform = base::sprintf("%s (%s-bit)", [18:41:50.190] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.190] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.190] "release", "version")], collapse = " "), [18:41:50.190] hostname = base::Sys.info()[["nodename"]]) [18:41:50.190] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.190] info) [18:41:50.190] info <- base::paste(info, collapse = "; ") [18:41:50.190] if (!has_future) { [18:41:50.190] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.190] info) [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.190] info, version) [18:41:50.190] } [18:41:50.190] base::stop(msg) [18:41:50.190] } [18:41:50.190] }) [18:41:50.190] } [18:41:50.190] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.190] base::options(mc.cores = 1L) [18:41:50.190] } [18:41:50.190] ...future.strategy.old <- future::plan("list") [18:41:50.190] options(future.plan = NULL) [18:41:50.190] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.190] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.190] } [18:41:50.190] ...future.workdir <- getwd() [18:41:50.190] } [18:41:50.190] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.190] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.190] } [18:41:50.190] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.190] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.190] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.190] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.190] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.190] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.190] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.190] base::names(...future.oldOptions)) [18:41:50.190] } [18:41:50.190] if (FALSE) { [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] if (TRUE) { [18:41:50.190] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.190] open = "w") [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.190] windows = "NUL", "/dev/null"), open = "w") [18:41:50.190] } [18:41:50.190] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.190] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.190] base::sink(type = "output", split = FALSE) [18:41:50.190] base::close(...future.stdout) [18:41:50.190] }, add = TRUE) [18:41:50.190] } [18:41:50.190] ...future.frame <- base::sys.nframe() [18:41:50.190] ...future.conditions <- base::list() [18:41:50.190] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.190] if (FALSE) { [18:41:50.190] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.190] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.190] } [18:41:50.190] ...future.result <- base::tryCatch({ [18:41:50.190] base::withCallingHandlers({ [18:41:50.190] ...future.value <- base::withVisible(base::local({ [18:41:50.190] ...future.makeSendCondition <- base::local({ [18:41:50.190] sendCondition <- NULL [18:41:50.190] function(frame = 1L) { [18:41:50.190] if (is.function(sendCondition)) [18:41:50.190] return(sendCondition) [18:41:50.190] ns <- getNamespace("parallel") [18:41:50.190] if (exists("sendData", mode = "function", [18:41:50.190] envir = ns)) { [18:41:50.190] parallel_sendData <- get("sendData", mode = "function", [18:41:50.190] envir = ns) [18:41:50.190] envir <- sys.frame(frame) [18:41:50.190] master <- NULL [18:41:50.190] while (!identical(envir, .GlobalEnv) && [18:41:50.190] !identical(envir, emptyenv())) { [18:41:50.190] if (exists("master", mode = "list", envir = envir, [18:41:50.190] inherits = FALSE)) { [18:41:50.190] master <- get("master", mode = "list", [18:41:50.190] envir = envir, inherits = FALSE) [18:41:50.190] if (inherits(master, c("SOCKnode", [18:41:50.190] "SOCK0node"))) { [18:41:50.190] sendCondition <<- function(cond) { [18:41:50.190] data <- list(type = "VALUE", value = cond, [18:41:50.190] success = TRUE) [18:41:50.190] parallel_sendData(master, data) [18:41:50.190] } [18:41:50.190] return(sendCondition) [18:41:50.190] } [18:41:50.190] } [18:41:50.190] frame <- frame + 1L [18:41:50.190] envir <- sys.frame(frame) [18:41:50.190] } [18:41:50.190] } [18:41:50.190] sendCondition <<- function(cond) NULL [18:41:50.190] } [18:41:50.190] }) [18:41:50.190] withCallingHandlers({ [18:41:50.190] { [18:41:50.190] do.call(function(...) { [18:41:50.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.190] if (!identical(...future.globals.maxSize.org, [18:41:50.190] ...future.globals.maxSize)) { [18:41:50.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.190] on.exit(options(oopts), add = TRUE) [18:41:50.190] } [18:41:50.190] { [18:41:50.190] lapply(seq_along(...future.elements_ii), [18:41:50.190] FUN = function(jj) { [18:41:50.190] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.190] ...future.FUN(...future.X_jj, ...) [18:41:50.190] }) [18:41:50.190] } [18:41:50.190] }, args = future.call.arguments) [18:41:50.190] } [18:41:50.190] }, immediateCondition = function(cond) { [18:41:50.190] sendCondition <- ...future.makeSendCondition() [18:41:50.190] sendCondition(cond) [18:41:50.190] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.190] { [18:41:50.190] inherits <- base::inherits [18:41:50.190] invokeRestart <- base::invokeRestart [18:41:50.190] is.null <- base::is.null [18:41:50.190] muffled <- FALSE [18:41:50.190] if (inherits(cond, "message")) { [18:41:50.190] muffled <- grepl(pattern, "muffleMessage") [18:41:50.190] if (muffled) [18:41:50.190] invokeRestart("muffleMessage") [18:41:50.190] } [18:41:50.190] else if (inherits(cond, "warning")) { [18:41:50.190] muffled <- grepl(pattern, "muffleWarning") [18:41:50.190] if (muffled) [18:41:50.190] invokeRestart("muffleWarning") [18:41:50.190] } [18:41:50.190] else if (inherits(cond, "condition")) { [18:41:50.190] if (!is.null(pattern)) { [18:41:50.190] computeRestarts <- base::computeRestarts [18:41:50.190] grepl <- base::grepl [18:41:50.190] restarts <- computeRestarts(cond) [18:41:50.190] for (restart in restarts) { [18:41:50.190] name <- restart$name [18:41:50.190] if (is.null(name)) [18:41:50.190] next [18:41:50.190] if (!grepl(pattern, name)) [18:41:50.190] next [18:41:50.190] invokeRestart(restart) [18:41:50.190] muffled <- TRUE [18:41:50.190] break [18:41:50.190] } [18:41:50.190] } [18:41:50.190] } [18:41:50.190] invisible(muffled) [18:41:50.190] } [18:41:50.190] muffleCondition(cond) [18:41:50.190] }) [18:41:50.190] })) [18:41:50.190] future::FutureResult(value = ...future.value$value, [18:41:50.190] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.190] ...future.rng), globalenv = if (FALSE) [18:41:50.190] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.190] ...future.globalenv.names)) [18:41:50.190] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.190] }, condition = base::local({ [18:41:50.190] c <- base::c [18:41:50.190] inherits <- base::inherits [18:41:50.190] invokeRestart <- base::invokeRestart [18:41:50.190] length <- base::length [18:41:50.190] list <- base::list [18:41:50.190] seq.int <- base::seq.int [18:41:50.190] signalCondition <- base::signalCondition [18:41:50.190] sys.calls <- base::sys.calls [18:41:50.190] `[[` <- base::`[[` [18:41:50.190] `+` <- base::`+` [18:41:50.190] `<<-` <- base::`<<-` [18:41:50.190] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.190] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.190] 3L)] [18:41:50.190] } [18:41:50.190] function(cond) { [18:41:50.190] is_error <- inherits(cond, "error") [18:41:50.190] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.190] NULL) [18:41:50.190] if (is_error) { [18:41:50.190] sessionInformation <- function() { [18:41:50.190] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.190] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.190] search = base::search(), system = base::Sys.info()) [18:41:50.190] } [18:41:50.190] ...future.conditions[[length(...future.conditions) + [18:41:50.190] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.190] cond$call), session = sessionInformation(), [18:41:50.190] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.190] signalCondition(cond) [18:41:50.190] } [18:41:50.190] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.190] "immediateCondition"))) { [18:41:50.190] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.190] ...future.conditions[[length(...future.conditions) + [18:41:50.190] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.190] if (TRUE && !signal) { [18:41:50.190] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.190] { [18:41:50.190] inherits <- base::inherits [18:41:50.190] invokeRestart <- base::invokeRestart [18:41:50.190] is.null <- base::is.null [18:41:50.190] muffled <- FALSE [18:41:50.190] if (inherits(cond, "message")) { [18:41:50.190] muffled <- grepl(pattern, "muffleMessage") [18:41:50.190] if (muffled) [18:41:50.190] invokeRestart("muffleMessage") [18:41:50.190] } [18:41:50.190] else if (inherits(cond, "warning")) { [18:41:50.190] muffled <- grepl(pattern, "muffleWarning") [18:41:50.190] if (muffled) [18:41:50.190] invokeRestart("muffleWarning") [18:41:50.190] } [18:41:50.190] else if (inherits(cond, "condition")) { [18:41:50.190] if (!is.null(pattern)) { [18:41:50.190] computeRestarts <- base::computeRestarts [18:41:50.190] grepl <- base::grepl [18:41:50.190] restarts <- computeRestarts(cond) [18:41:50.190] for (restart in restarts) { [18:41:50.190] name <- restart$name [18:41:50.190] if (is.null(name)) [18:41:50.190] next [18:41:50.190] if (!grepl(pattern, name)) [18:41:50.190] next [18:41:50.190] invokeRestart(restart) [18:41:50.190] muffled <- TRUE [18:41:50.190] break [18:41:50.190] } [18:41:50.190] } [18:41:50.190] } [18:41:50.190] invisible(muffled) [18:41:50.190] } [18:41:50.190] muffleCondition(cond, pattern = "^muffle") [18:41:50.190] } [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] if (TRUE) { [18:41:50.190] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.190] { [18:41:50.190] inherits <- base::inherits [18:41:50.190] invokeRestart <- base::invokeRestart [18:41:50.190] is.null <- base::is.null [18:41:50.190] muffled <- FALSE [18:41:50.190] if (inherits(cond, "message")) { [18:41:50.190] muffled <- grepl(pattern, "muffleMessage") [18:41:50.190] if (muffled) [18:41:50.190] invokeRestart("muffleMessage") [18:41:50.190] } [18:41:50.190] else if (inherits(cond, "warning")) { [18:41:50.190] muffled <- grepl(pattern, "muffleWarning") [18:41:50.190] if (muffled) [18:41:50.190] invokeRestart("muffleWarning") [18:41:50.190] } [18:41:50.190] else if (inherits(cond, "condition")) { [18:41:50.190] if (!is.null(pattern)) { [18:41:50.190] computeRestarts <- base::computeRestarts [18:41:50.190] grepl <- base::grepl [18:41:50.190] restarts <- computeRestarts(cond) [18:41:50.190] for (restart in restarts) { [18:41:50.190] name <- restart$name [18:41:50.190] if (is.null(name)) [18:41:50.190] next [18:41:50.190] if (!grepl(pattern, name)) [18:41:50.190] next [18:41:50.190] invokeRestart(restart) [18:41:50.190] muffled <- TRUE [18:41:50.190] break [18:41:50.190] } [18:41:50.190] } [18:41:50.190] } [18:41:50.190] invisible(muffled) [18:41:50.190] } [18:41:50.190] muffleCondition(cond, pattern = "^muffle") [18:41:50.190] } [18:41:50.190] } [18:41:50.190] } [18:41:50.190] })) [18:41:50.190] }, error = function(ex) { [18:41:50.190] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.190] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.190] ...future.rng), started = ...future.startTime, [18:41:50.190] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.190] version = "1.8"), class = "FutureResult") [18:41:50.190] }, finally = { [18:41:50.190] if (!identical(...future.workdir, getwd())) [18:41:50.190] setwd(...future.workdir) [18:41:50.190] { [18:41:50.190] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.190] ...future.oldOptions$nwarnings <- NULL [18:41:50.190] } [18:41:50.190] base::options(...future.oldOptions) [18:41:50.190] if (.Platform$OS.type == "windows") { [18:41:50.190] old_names <- names(...future.oldEnvVars) [18:41:50.190] envs <- base::Sys.getenv() [18:41:50.190] names <- names(envs) [18:41:50.190] common <- intersect(names, old_names) [18:41:50.190] added <- setdiff(names, old_names) [18:41:50.190] removed <- setdiff(old_names, names) [18:41:50.190] changed <- common[...future.oldEnvVars[common] != [18:41:50.190] envs[common]] [18:41:50.190] NAMES <- toupper(changed) [18:41:50.190] args <- list() [18:41:50.190] for (kk in seq_along(NAMES)) { [18:41:50.190] name <- changed[[kk]] [18:41:50.190] NAME <- NAMES[[kk]] [18:41:50.190] if (name != NAME && is.element(NAME, old_names)) [18:41:50.190] next [18:41:50.190] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.190] } [18:41:50.190] NAMES <- toupper(added) [18:41:50.190] for (kk in seq_along(NAMES)) { [18:41:50.190] name <- added[[kk]] [18:41:50.190] NAME <- NAMES[[kk]] [18:41:50.190] if (name != NAME && is.element(NAME, old_names)) [18:41:50.190] next [18:41:50.190] args[[name]] <- "" [18:41:50.190] } [18:41:50.190] NAMES <- toupper(removed) [18:41:50.190] for (kk in seq_along(NAMES)) { [18:41:50.190] name <- removed[[kk]] [18:41:50.190] NAME <- NAMES[[kk]] [18:41:50.190] if (name != NAME && is.element(NAME, old_names)) [18:41:50.190] next [18:41:50.190] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.190] } [18:41:50.190] if (length(args) > 0) [18:41:50.190] base::do.call(base::Sys.setenv, args = args) [18:41:50.190] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.190] } [18:41:50.190] { [18:41:50.190] if (base::length(...future.futureOptionsAdded) > [18:41:50.190] 0L) { [18:41:50.190] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.190] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.190] base::options(opts) [18:41:50.190] } [18:41:50.190] { [18:41:50.190] { [18:41:50.190] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.190] NULL [18:41:50.190] } [18:41:50.190] options(future.plan = NULL) [18:41:50.190] if (is.na(NA_character_)) [18:41:50.190] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.190] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.190] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.190] .init = FALSE) [18:41:50.190] } [18:41:50.190] } [18:41:50.190] } [18:41:50.190] }) [18:41:50.190] if (TRUE) { [18:41:50.190] base::sink(type = "output", split = FALSE) [18:41:50.190] if (TRUE) { [18:41:50.190] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.190] } [18:41:50.190] else { [18:41:50.190] ...future.result["stdout"] <- base::list(NULL) [18:41:50.190] } [18:41:50.190] base::close(...future.stdout) [18:41:50.190] ...future.stdout <- NULL [18:41:50.190] } [18:41:50.190] ...future.result$conditions <- ...future.conditions [18:41:50.190] ...future.result$finished <- base::Sys.time() [18:41:50.190] ...future.result [18:41:50.190] } [18:41:50.199] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:50.199] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:50.200] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:50.200] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.202] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.202] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.203] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.203] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.204] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.204] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.205] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.205] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:50.206] MultisessionFuture started [18:41:50.207] - Launch lazy future ... done [18:41:50.207] run() for 'MultisessionFuture' ... done [18:41:50.207] Created future: [18:41:50.220] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.220] - Validating connection of MultisessionFuture [18:41:50.220] - received message: FutureResult [18:41:50.221] - Received FutureResult [18:41:50.221] - Erased future from FutureRegistry [18:41:50.221] result() for ClusterFuture ... [18:41:50.222] - result already collected: FutureResult [18:41:50.222] result() for ClusterFuture ... done [18:41:50.222] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.208] MultisessionFuture: [18:41:50.208] Label: 'future_sapply-1' [18:41:50.208] Expression: [18:41:50.208] { [18:41:50.208] do.call(function(...) { [18:41:50.208] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.208] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.208] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.208] on.exit(options(oopts), add = TRUE) [18:41:50.208] } [18:41:50.208] { [18:41:50.208] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.208] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.208] ...future.FUN(...future.X_jj, ...) [18:41:50.208] }) [18:41:50.208] } [18:41:50.208] }, args = future.call.arguments) [18:41:50.208] } [18:41:50.208] Lazy evaluation: FALSE [18:41:50.208] Asynchronous evaluation: TRUE [18:41:50.208] Local evaluation: TRUE [18:41:50.208] Environment: R_GlobalEnv [18:41:50.208] Capture standard output: TRUE [18:41:50.208] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.208] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.208] Packages: [18:41:50.208] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.208] Resolved: TRUE [18:41:50.208] Value: [18:41:50.208] Conditions captured: [18:41:50.208] Early signaling: FALSE [18:41:50.208] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.208] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.223] Chunk #1 of 2 ... DONE [18:41:50.223] Chunk #2 of 2 ... [18:41:50.224] - Finding globals in 'X' for chunk #2 ... [18:41:50.224] getGlobalsAndPackages() ... [18:41:50.224] Searching for globals... [18:41:50.225] [18:41:50.225] Searching for globals ... DONE [18:41:50.226] - globals: [0] [18:41:50.226] getGlobalsAndPackages() ... DONE [18:41:50.226] + additional globals found: [n=0] [18:41:50.226] + additional namespaces needed: [n=0] [18:41:50.227] - Finding globals in 'X' for chunk #2 ... DONE [18:41:50.227] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.227] - seeds: [18:41:50.228] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.228] getGlobalsAndPackages() ... [18:41:50.228] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.229] Resolving globals: FALSE [18:41:50.229] Tweak future expression to call with '...' arguments ... [18:41:50.229] { [18:41:50.229] do.call(function(...) { [18:41:50.229] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.229] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.229] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.229] on.exit(options(oopts), add = TRUE) [18:41:50.229] } [18:41:50.229] { [18:41:50.229] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.229] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.229] ...future.FUN(...future.X_jj, ...) [18:41:50.229] }) [18:41:50.229] } [18:41:50.229] }, args = future.call.arguments) [18:41:50.229] } [18:41:50.230] Tweak future expression to call with '...' arguments ... DONE [18:41:50.231] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.231] [18:41:50.232] getGlobalsAndPackages() ... DONE [18:41:50.232] run() for 'Future' ... [18:41:50.233] - state: 'created' [18:41:50.233] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.266] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.267] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.267] - Field: 'node' [18:41:50.267] - Field: 'label' [18:41:50.268] - Field: 'local' [18:41:50.268] - Field: 'owner' [18:41:50.269] - Field: 'envir' [18:41:50.269] - Field: 'workers' [18:41:50.269] - Field: 'packages' [18:41:50.269] - Field: 'gc' [18:41:50.270] - Field: 'conditions' [18:41:50.270] - Field: 'persistent' [18:41:50.270] - Field: 'expr' [18:41:50.271] - Field: 'uuid' [18:41:50.271] - Field: 'seed' [18:41:50.272] - Field: 'version' [18:41:50.272] - Field: 'result' [18:41:50.272] - Field: 'asynchronous' [18:41:50.272] - Field: 'calls' [18:41:50.273] - Field: 'globals' [18:41:50.273] - Field: 'stdout' [18:41:50.273] - Field: 'earlySignal' [18:41:50.274] - Field: 'lazy' [18:41:50.274] - Field: 'state' [18:41:50.274] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.275] - Launch lazy future ... [18:41:50.275] Packages needed by the future expression (n = 0): [18:41:50.276] Packages needed by future strategies (n = 0): [18:41:50.277] { [18:41:50.277] { [18:41:50.277] { [18:41:50.277] ...future.startTime <- base::Sys.time() [18:41:50.277] { [18:41:50.277] { [18:41:50.277] { [18:41:50.277] { [18:41:50.277] base::local({ [18:41:50.277] has_future <- base::requireNamespace("future", [18:41:50.277] quietly = TRUE) [18:41:50.277] if (has_future) { [18:41:50.277] ns <- base::getNamespace("future") [18:41:50.277] version <- ns[[".package"]][["version"]] [18:41:50.277] if (is.null(version)) [18:41:50.277] version <- utils::packageVersion("future") [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] version <- NULL [18:41:50.277] } [18:41:50.277] if (!has_future || version < "1.8.0") { [18:41:50.277] info <- base::c(r_version = base::gsub("R version ", [18:41:50.277] "", base::R.version$version.string), [18:41:50.277] platform = base::sprintf("%s (%s-bit)", [18:41:50.277] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.277] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.277] "release", "version")], collapse = " "), [18:41:50.277] hostname = base::Sys.info()[["nodename"]]) [18:41:50.277] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.277] info) [18:41:50.277] info <- base::paste(info, collapse = "; ") [18:41:50.277] if (!has_future) { [18:41:50.277] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.277] info) [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.277] info, version) [18:41:50.277] } [18:41:50.277] base::stop(msg) [18:41:50.277] } [18:41:50.277] }) [18:41:50.277] } [18:41:50.277] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.277] base::options(mc.cores = 1L) [18:41:50.277] } [18:41:50.277] ...future.strategy.old <- future::plan("list") [18:41:50.277] options(future.plan = NULL) [18:41:50.277] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.277] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.277] } [18:41:50.277] ...future.workdir <- getwd() [18:41:50.277] } [18:41:50.277] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.277] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.277] } [18:41:50.277] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.277] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.277] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.277] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.277] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.277] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.277] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.277] base::names(...future.oldOptions)) [18:41:50.277] } [18:41:50.277] if (FALSE) { [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] if (TRUE) { [18:41:50.277] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.277] open = "w") [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.277] windows = "NUL", "/dev/null"), open = "w") [18:41:50.277] } [18:41:50.277] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.277] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.277] base::sink(type = "output", split = FALSE) [18:41:50.277] base::close(...future.stdout) [18:41:50.277] }, add = TRUE) [18:41:50.277] } [18:41:50.277] ...future.frame <- base::sys.nframe() [18:41:50.277] ...future.conditions <- base::list() [18:41:50.277] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.277] if (FALSE) { [18:41:50.277] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.277] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.277] } [18:41:50.277] ...future.result <- base::tryCatch({ [18:41:50.277] base::withCallingHandlers({ [18:41:50.277] ...future.value <- base::withVisible(base::local({ [18:41:50.277] ...future.makeSendCondition <- base::local({ [18:41:50.277] sendCondition <- NULL [18:41:50.277] function(frame = 1L) { [18:41:50.277] if (is.function(sendCondition)) [18:41:50.277] return(sendCondition) [18:41:50.277] ns <- getNamespace("parallel") [18:41:50.277] if (exists("sendData", mode = "function", [18:41:50.277] envir = ns)) { [18:41:50.277] parallel_sendData <- get("sendData", mode = "function", [18:41:50.277] envir = ns) [18:41:50.277] envir <- sys.frame(frame) [18:41:50.277] master <- NULL [18:41:50.277] while (!identical(envir, .GlobalEnv) && [18:41:50.277] !identical(envir, emptyenv())) { [18:41:50.277] if (exists("master", mode = "list", envir = envir, [18:41:50.277] inherits = FALSE)) { [18:41:50.277] master <- get("master", mode = "list", [18:41:50.277] envir = envir, inherits = FALSE) [18:41:50.277] if (inherits(master, c("SOCKnode", [18:41:50.277] "SOCK0node"))) { [18:41:50.277] sendCondition <<- function(cond) { [18:41:50.277] data <- list(type = "VALUE", value = cond, [18:41:50.277] success = TRUE) [18:41:50.277] parallel_sendData(master, data) [18:41:50.277] } [18:41:50.277] return(sendCondition) [18:41:50.277] } [18:41:50.277] } [18:41:50.277] frame <- frame + 1L [18:41:50.277] envir <- sys.frame(frame) [18:41:50.277] } [18:41:50.277] } [18:41:50.277] sendCondition <<- function(cond) NULL [18:41:50.277] } [18:41:50.277] }) [18:41:50.277] withCallingHandlers({ [18:41:50.277] { [18:41:50.277] do.call(function(...) { [18:41:50.277] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.277] if (!identical(...future.globals.maxSize.org, [18:41:50.277] ...future.globals.maxSize)) { [18:41:50.277] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.277] on.exit(options(oopts), add = TRUE) [18:41:50.277] } [18:41:50.277] { [18:41:50.277] lapply(seq_along(...future.elements_ii), [18:41:50.277] FUN = function(jj) { [18:41:50.277] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.277] ...future.FUN(...future.X_jj, ...) [18:41:50.277] }) [18:41:50.277] } [18:41:50.277] }, args = future.call.arguments) [18:41:50.277] } [18:41:50.277] }, immediateCondition = function(cond) { [18:41:50.277] sendCondition <- ...future.makeSendCondition() [18:41:50.277] sendCondition(cond) [18:41:50.277] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.277] { [18:41:50.277] inherits <- base::inherits [18:41:50.277] invokeRestart <- base::invokeRestart [18:41:50.277] is.null <- base::is.null [18:41:50.277] muffled <- FALSE [18:41:50.277] if (inherits(cond, "message")) { [18:41:50.277] muffled <- grepl(pattern, "muffleMessage") [18:41:50.277] if (muffled) [18:41:50.277] invokeRestart("muffleMessage") [18:41:50.277] } [18:41:50.277] else if (inherits(cond, "warning")) { [18:41:50.277] muffled <- grepl(pattern, "muffleWarning") [18:41:50.277] if (muffled) [18:41:50.277] invokeRestart("muffleWarning") [18:41:50.277] } [18:41:50.277] else if (inherits(cond, "condition")) { [18:41:50.277] if (!is.null(pattern)) { [18:41:50.277] computeRestarts <- base::computeRestarts [18:41:50.277] grepl <- base::grepl [18:41:50.277] restarts <- computeRestarts(cond) [18:41:50.277] for (restart in restarts) { [18:41:50.277] name <- restart$name [18:41:50.277] if (is.null(name)) [18:41:50.277] next [18:41:50.277] if (!grepl(pattern, name)) [18:41:50.277] next [18:41:50.277] invokeRestart(restart) [18:41:50.277] muffled <- TRUE [18:41:50.277] break [18:41:50.277] } [18:41:50.277] } [18:41:50.277] } [18:41:50.277] invisible(muffled) [18:41:50.277] } [18:41:50.277] muffleCondition(cond) [18:41:50.277] }) [18:41:50.277] })) [18:41:50.277] future::FutureResult(value = ...future.value$value, [18:41:50.277] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.277] ...future.rng), globalenv = if (FALSE) [18:41:50.277] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.277] ...future.globalenv.names)) [18:41:50.277] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.277] }, condition = base::local({ [18:41:50.277] c <- base::c [18:41:50.277] inherits <- base::inherits [18:41:50.277] invokeRestart <- base::invokeRestart [18:41:50.277] length <- base::length [18:41:50.277] list <- base::list [18:41:50.277] seq.int <- base::seq.int [18:41:50.277] signalCondition <- base::signalCondition [18:41:50.277] sys.calls <- base::sys.calls [18:41:50.277] `[[` <- base::`[[` [18:41:50.277] `+` <- base::`+` [18:41:50.277] `<<-` <- base::`<<-` [18:41:50.277] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.277] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.277] 3L)] [18:41:50.277] } [18:41:50.277] function(cond) { [18:41:50.277] is_error <- inherits(cond, "error") [18:41:50.277] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.277] NULL) [18:41:50.277] if (is_error) { [18:41:50.277] sessionInformation <- function() { [18:41:50.277] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.277] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.277] search = base::search(), system = base::Sys.info()) [18:41:50.277] } [18:41:50.277] ...future.conditions[[length(...future.conditions) + [18:41:50.277] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.277] cond$call), session = sessionInformation(), [18:41:50.277] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.277] signalCondition(cond) [18:41:50.277] } [18:41:50.277] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.277] "immediateCondition"))) { [18:41:50.277] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.277] ...future.conditions[[length(...future.conditions) + [18:41:50.277] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.277] if (TRUE && !signal) { [18:41:50.277] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.277] { [18:41:50.277] inherits <- base::inherits [18:41:50.277] invokeRestart <- base::invokeRestart [18:41:50.277] is.null <- base::is.null [18:41:50.277] muffled <- FALSE [18:41:50.277] if (inherits(cond, "message")) { [18:41:50.277] muffled <- grepl(pattern, "muffleMessage") [18:41:50.277] if (muffled) [18:41:50.277] invokeRestart("muffleMessage") [18:41:50.277] } [18:41:50.277] else if (inherits(cond, "warning")) { [18:41:50.277] muffled <- grepl(pattern, "muffleWarning") [18:41:50.277] if (muffled) [18:41:50.277] invokeRestart("muffleWarning") [18:41:50.277] } [18:41:50.277] else if (inherits(cond, "condition")) { [18:41:50.277] if (!is.null(pattern)) { [18:41:50.277] computeRestarts <- base::computeRestarts [18:41:50.277] grepl <- base::grepl [18:41:50.277] restarts <- computeRestarts(cond) [18:41:50.277] for (restart in restarts) { [18:41:50.277] name <- restart$name [18:41:50.277] if (is.null(name)) [18:41:50.277] next [18:41:50.277] if (!grepl(pattern, name)) [18:41:50.277] next [18:41:50.277] invokeRestart(restart) [18:41:50.277] muffled <- TRUE [18:41:50.277] break [18:41:50.277] } [18:41:50.277] } [18:41:50.277] } [18:41:50.277] invisible(muffled) [18:41:50.277] } [18:41:50.277] muffleCondition(cond, pattern = "^muffle") [18:41:50.277] } [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] if (TRUE) { [18:41:50.277] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.277] { [18:41:50.277] inherits <- base::inherits [18:41:50.277] invokeRestart <- base::invokeRestart [18:41:50.277] is.null <- base::is.null [18:41:50.277] muffled <- FALSE [18:41:50.277] if (inherits(cond, "message")) { [18:41:50.277] muffled <- grepl(pattern, "muffleMessage") [18:41:50.277] if (muffled) [18:41:50.277] invokeRestart("muffleMessage") [18:41:50.277] } [18:41:50.277] else if (inherits(cond, "warning")) { [18:41:50.277] muffled <- grepl(pattern, "muffleWarning") [18:41:50.277] if (muffled) [18:41:50.277] invokeRestart("muffleWarning") [18:41:50.277] } [18:41:50.277] else if (inherits(cond, "condition")) { [18:41:50.277] if (!is.null(pattern)) { [18:41:50.277] computeRestarts <- base::computeRestarts [18:41:50.277] grepl <- base::grepl [18:41:50.277] restarts <- computeRestarts(cond) [18:41:50.277] for (restart in restarts) { [18:41:50.277] name <- restart$name [18:41:50.277] if (is.null(name)) [18:41:50.277] next [18:41:50.277] if (!grepl(pattern, name)) [18:41:50.277] next [18:41:50.277] invokeRestart(restart) [18:41:50.277] muffled <- TRUE [18:41:50.277] break [18:41:50.277] } [18:41:50.277] } [18:41:50.277] } [18:41:50.277] invisible(muffled) [18:41:50.277] } [18:41:50.277] muffleCondition(cond, pattern = "^muffle") [18:41:50.277] } [18:41:50.277] } [18:41:50.277] } [18:41:50.277] })) [18:41:50.277] }, error = function(ex) { [18:41:50.277] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.277] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.277] ...future.rng), started = ...future.startTime, [18:41:50.277] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.277] version = "1.8"), class = "FutureResult") [18:41:50.277] }, finally = { [18:41:50.277] if (!identical(...future.workdir, getwd())) [18:41:50.277] setwd(...future.workdir) [18:41:50.277] { [18:41:50.277] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.277] ...future.oldOptions$nwarnings <- NULL [18:41:50.277] } [18:41:50.277] base::options(...future.oldOptions) [18:41:50.277] if (.Platform$OS.type == "windows") { [18:41:50.277] old_names <- names(...future.oldEnvVars) [18:41:50.277] envs <- base::Sys.getenv() [18:41:50.277] names <- names(envs) [18:41:50.277] common <- intersect(names, old_names) [18:41:50.277] added <- setdiff(names, old_names) [18:41:50.277] removed <- setdiff(old_names, names) [18:41:50.277] changed <- common[...future.oldEnvVars[common] != [18:41:50.277] envs[common]] [18:41:50.277] NAMES <- toupper(changed) [18:41:50.277] args <- list() [18:41:50.277] for (kk in seq_along(NAMES)) { [18:41:50.277] name <- changed[[kk]] [18:41:50.277] NAME <- NAMES[[kk]] [18:41:50.277] if (name != NAME && is.element(NAME, old_names)) [18:41:50.277] next [18:41:50.277] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.277] } [18:41:50.277] NAMES <- toupper(added) [18:41:50.277] for (kk in seq_along(NAMES)) { [18:41:50.277] name <- added[[kk]] [18:41:50.277] NAME <- NAMES[[kk]] [18:41:50.277] if (name != NAME && is.element(NAME, old_names)) [18:41:50.277] next [18:41:50.277] args[[name]] <- "" [18:41:50.277] } [18:41:50.277] NAMES <- toupper(removed) [18:41:50.277] for (kk in seq_along(NAMES)) { [18:41:50.277] name <- removed[[kk]] [18:41:50.277] NAME <- NAMES[[kk]] [18:41:50.277] if (name != NAME && is.element(NAME, old_names)) [18:41:50.277] next [18:41:50.277] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.277] } [18:41:50.277] if (length(args) > 0) [18:41:50.277] base::do.call(base::Sys.setenv, args = args) [18:41:50.277] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.277] } [18:41:50.277] { [18:41:50.277] if (base::length(...future.futureOptionsAdded) > [18:41:50.277] 0L) { [18:41:50.277] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.277] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.277] base::options(opts) [18:41:50.277] } [18:41:50.277] { [18:41:50.277] { [18:41:50.277] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.277] NULL [18:41:50.277] } [18:41:50.277] options(future.plan = NULL) [18:41:50.277] if (is.na(NA_character_)) [18:41:50.277] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.277] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.277] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.277] .init = FALSE) [18:41:50.277] } [18:41:50.277] } [18:41:50.277] } [18:41:50.277] }) [18:41:50.277] if (TRUE) { [18:41:50.277] base::sink(type = "output", split = FALSE) [18:41:50.277] if (TRUE) { [18:41:50.277] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.277] } [18:41:50.277] else { [18:41:50.277] ...future.result["stdout"] <- base::list(NULL) [18:41:50.277] } [18:41:50.277] base::close(...future.stdout) [18:41:50.277] ...future.stdout <- NULL [18:41:50.277] } [18:41:50.277] ...future.result$conditions <- ...future.conditions [18:41:50.277] ...future.result$finished <- base::Sys.time() [18:41:50.277] ...future.result [18:41:50.277] } [18:41:50.286] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:50.287] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:50.287] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:50.288] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.288] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.289] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.289] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.290] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.290] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.291] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.291] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.292] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:50.293] MultisessionFuture started [18:41:50.293] - Launch lazy future ... done [18:41:50.293] run() for 'MultisessionFuture' ... done [18:41:50.294] Created future: [18:41:50.307] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.307] - Validating connection of MultisessionFuture [18:41:50.307] - received message: FutureResult [18:41:50.308] - Received FutureResult [18:41:50.308] - Erased future from FutureRegistry [18:41:50.308] result() for ClusterFuture ... [18:41:50.309] - result already collected: FutureResult [18:41:50.309] result() for ClusterFuture ... done [18:41:50.309] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.294] MultisessionFuture: [18:41:50.294] Label: 'future_sapply-2' [18:41:50.294] Expression: [18:41:50.294] { [18:41:50.294] do.call(function(...) { [18:41:50.294] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.294] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.294] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.294] on.exit(options(oopts), add = TRUE) [18:41:50.294] } [18:41:50.294] { [18:41:50.294] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.294] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.294] ...future.FUN(...future.X_jj, ...) [18:41:50.294] }) [18:41:50.294] } [18:41:50.294] }, args = future.call.arguments) [18:41:50.294] } [18:41:50.294] Lazy evaluation: FALSE [18:41:50.294] Asynchronous evaluation: TRUE [18:41:50.294] Local evaluation: TRUE [18:41:50.294] Environment: R_GlobalEnv [18:41:50.294] Capture standard output: TRUE [18:41:50.294] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.294] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.294] Packages: [18:41:50.294] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.294] Resolved: TRUE [18:41:50.294] Value: [18:41:50.294] Conditions captured: [18:41:50.294] Early signaling: FALSE [18:41:50.294] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.294] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.310] Chunk #2 of 2 ... DONE [18:41:50.310] Launching 2 futures (chunks) ... DONE [18:41:50.311] Resolving 2 futures (chunks) ... [18:41:50.311] resolve() on list ... [18:41:50.311] recursive: 0 [18:41:50.312] length: 2 [18:41:50.312] [18:41:50.312] Future #1 [18:41:50.312] result() for ClusterFuture ... [18:41:50.313] - result already collected: FutureResult [18:41:50.313] result() for ClusterFuture ... done [18:41:50.313] result() for ClusterFuture ... [18:41:50.314] - result already collected: FutureResult [18:41:50.314] result() for ClusterFuture ... done [18:41:50.314] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:50.315] - nx: 2 [18:41:50.315] - relay: TRUE [18:41:50.315] - stdout: TRUE [18:41:50.315] - signal: TRUE [18:41:50.316] - resignal: FALSE [18:41:50.316] - force: TRUE [18:41:50.316] - relayed: [n=2] FALSE, FALSE [18:41:50.316] - queued futures: [n=2] FALSE, FALSE [18:41:50.317] - until=1 [18:41:50.317] - relaying element #1 [18:41:50.317] result() for ClusterFuture ... [18:41:50.318] - result already collected: FutureResult [18:41:50.318] result() for ClusterFuture ... done [18:41:50.318] result() for ClusterFuture ... [18:41:50.319] - result already collected: FutureResult [18:41:50.319] result() for ClusterFuture ... done [18:41:50.319] result() for ClusterFuture ... [18:41:50.320] - result already collected: FutureResult [18:41:50.320] result() for ClusterFuture ... done [18:41:50.320] result() for ClusterFuture ... [18:41:50.320] - result already collected: FutureResult [18:41:50.321] result() for ClusterFuture ... done [18:41:50.321] - relayed: [n=2] TRUE, FALSE [18:41:50.321] - queued futures: [n=2] TRUE, FALSE [18:41:50.321] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:50.322] length: 1 (resolved future 1) [18:41:50.322] Future #2 [18:41:50.323] result() for ClusterFuture ... [18:41:50.323] - result already collected: FutureResult [18:41:50.323] result() for ClusterFuture ... done [18:41:50.323] result() for ClusterFuture ... [18:41:50.324] - result already collected: FutureResult [18:41:50.324] result() for ClusterFuture ... done [18:41:50.324] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:50.325] - nx: 2 [18:41:50.325] - relay: TRUE [18:41:50.325] - stdout: TRUE [18:41:50.325] - signal: TRUE [18:41:50.326] - resignal: FALSE [18:41:50.326] - force: TRUE [18:41:50.326] - relayed: [n=2] TRUE, FALSE [18:41:50.326] - queued futures: [n=2] TRUE, FALSE [18:41:50.327] - until=2 [18:41:50.327] - relaying element #2 [18:41:50.327] result() for ClusterFuture ... [18:41:50.328] - result already collected: FutureResult [18:41:50.328] result() for ClusterFuture ... done [18:41:50.328] result() for ClusterFuture ... [18:41:50.328] - result already collected: FutureResult [18:41:50.329] result() for ClusterFuture ... done [18:41:50.329] result() for ClusterFuture ... [18:41:50.329] - result already collected: FutureResult [18:41:50.330] result() for ClusterFuture ... done [18:41:50.330] result() for ClusterFuture ... [18:41:50.330] - result already collected: FutureResult [18:41:50.331] result() for ClusterFuture ... done [18:41:50.331] - relayed: [n=2] TRUE, TRUE [18:41:50.331] - queued futures: [n=2] TRUE, TRUE [18:41:50.331] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:50.332] length: 0 (resolved future 2) [18:41:50.332] Relaying remaining futures [18:41:50.332] signalConditionsASAP(NULL, pos=0) ... [18:41:50.333] - nx: 2 [18:41:50.333] - relay: TRUE [18:41:50.333] - stdout: TRUE [18:41:50.333] - signal: TRUE [18:41:50.334] - resignal: FALSE [18:41:50.334] - force: TRUE [18:41:50.334] - relayed: [n=2] TRUE, TRUE [18:41:50.335] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:50.335] - relayed: [n=2] TRUE, TRUE [18:41:50.335] - queued futures: [n=2] TRUE, TRUE [18:41:50.336] signalConditionsASAP(NULL, pos=0) ... done [18:41:50.336] resolve() on list ... DONE [18:41:50.336] result() for ClusterFuture ... [18:41:50.336] - result already collected: FutureResult [18:41:50.337] result() for ClusterFuture ... done [18:41:50.337] result() for ClusterFuture ... [18:41:50.337] - result already collected: FutureResult [18:41:50.338] result() for ClusterFuture ... done [18:41:50.338] result() for ClusterFuture ... [18:41:50.338] - result already collected: FutureResult [18:41:50.338] result() for ClusterFuture ... done [18:41:50.339] result() for ClusterFuture ... [18:41:50.339] - result already collected: FutureResult [18:41:50.339] result() for ClusterFuture ... done [18:41:50.340] - Number of value chunks collected: 2 [18:41:50.340] Resolving 2 futures (chunks) ... DONE [18:41:50.340] Reducing values from 2 chunks ... [18:41:50.341] - Number of values collected after concatenation: 6 [18:41:50.341] - Number of values expected: 6 [18:41:50.341] Reducing values from 2 chunks ... DONE [18:41:50.341] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y1:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y2:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... [18:41:50.366] future_lapply() ... [18:41:50.372] Number of chunks: 2 [18:41:50.372] getGlobalsAndPackagesXApply() ... [18:41:50.373] - future.globals: TRUE [18:41:50.373] getGlobalsAndPackages() ... [18:41:50.373] Searching for globals... [18:41:50.375] - globals found: [1] 'FUN' [18:41:50.376] Searching for globals ... DONE [18:41:50.376] Resolving globals: FALSE [18:41:50.377] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:50.378] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:50.378] - globals: [1] 'FUN' [18:41:50.378] [18:41:50.379] getGlobalsAndPackages() ... DONE [18:41:50.379] - globals found/used: [n=1] 'FUN' [18:41:50.379] - needed namespaces: [n=0] [18:41:50.379] Finding globals ... DONE [18:41:50.380] - use_args: TRUE [18:41:50.380] - Getting '...' globals ... [18:41:50.381] resolve() on list ... [18:41:50.381] recursive: 0 [18:41:50.381] length: 1 [18:41:50.382] elements: '...' [18:41:50.382] length: 0 (resolved future 1) [18:41:50.382] resolve() on list ... DONE [18:41:50.383] - '...' content: [n=0] [18:41:50.383] List of 1 [18:41:50.383] $ ...: list() [18:41:50.383] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.383] - attr(*, "where")=List of 1 [18:41:50.383] ..$ ...: [18:41:50.383] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.383] - attr(*, "resolved")= logi TRUE [18:41:50.383] - attr(*, "total_size")= num NA [18:41:50.388] - Getting '...' globals ... DONE [18:41:50.389] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:50.389] List of 2 [18:41:50.389] $ ...future.FUN:function (x) [18:41:50.389] $ ... : list() [18:41:50.389] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.389] - attr(*, "where")=List of 2 [18:41:50.389] ..$ ...future.FUN: [18:41:50.389] ..$ ... : [18:41:50.389] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.389] - attr(*, "resolved")= logi FALSE [18:41:50.389] - attr(*, "total_size")= int 4942 [18:41:50.396] Packages to be attached in all futures: [n=0] [18:41:50.396] getGlobalsAndPackagesXApply() ... DONE [18:41:50.396] Number of futures (= number of chunks): 2 [18:41:50.397] Launching 2 futures (chunks) ... [18:41:50.397] Chunk #1 of 2 ... [18:41:50.397] - Finding globals in 'X' for chunk #1 ... [18:41:50.398] getGlobalsAndPackages() ... [18:41:50.398] Searching for globals... [18:41:50.399] [18:41:50.399] Searching for globals ... DONE [18:41:50.399] - globals: [0] [18:41:50.399] getGlobalsAndPackages() ... DONE [18:41:50.400] + additional globals found: [n=0] [18:41:50.400] + additional namespaces needed: [n=0] [18:41:50.400] - Finding globals in 'X' for chunk #1 ... DONE [18:41:50.401] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.401] - seeds: [18:41:50.401] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.401] getGlobalsAndPackages() ... [18:41:50.402] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.402] Resolving globals: FALSE [18:41:50.402] Tweak future expression to call with '...' arguments ... [18:41:50.403] { [18:41:50.403] do.call(function(...) { [18:41:50.403] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.403] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.403] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.403] on.exit(options(oopts), add = TRUE) [18:41:50.403] } [18:41:50.403] { [18:41:50.403] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.403] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.403] ...future.FUN(...future.X_jj, ...) [18:41:50.403] }) [18:41:50.403] } [18:41:50.403] }, args = future.call.arguments) [18:41:50.403] } [18:41:50.403] Tweak future expression to call with '...' arguments ... DONE [18:41:50.404] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.405] [18:41:50.405] getGlobalsAndPackages() ... DONE [18:41:50.406] run() for 'Future' ... [18:41:50.406] - state: 'created' [18:41:50.406] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.433] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.434] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.434] - Field: 'node' [18:41:50.434] - Field: 'label' [18:41:50.435] - Field: 'local' [18:41:50.435] - Field: 'owner' [18:41:50.435] - Field: 'envir' [18:41:50.436] - Field: 'workers' [18:41:50.436] - Field: 'packages' [18:41:50.436] - Field: 'gc' [18:41:50.437] - Field: 'conditions' [18:41:50.437] - Field: 'persistent' [18:41:50.437] - Field: 'expr' [18:41:50.437] - Field: 'uuid' [18:41:50.438] - Field: 'seed' [18:41:50.438] - Field: 'version' [18:41:50.438] - Field: 'result' [18:41:50.439] - Field: 'asynchronous' [18:41:50.439] - Field: 'calls' [18:41:50.439] - Field: 'globals' [18:41:50.440] - Field: 'stdout' [18:41:50.440] - Field: 'earlySignal' [18:41:50.440] - Field: 'lazy' [18:41:50.441] - Field: 'state' [18:41:50.441] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.441] - Launch lazy future ... [18:41:50.442] Packages needed by the future expression (n = 0): [18:41:50.442] Packages needed by future strategies (n = 0): [18:41:50.443] { [18:41:50.443] { [18:41:50.443] { [18:41:50.443] ...future.startTime <- base::Sys.time() [18:41:50.443] { [18:41:50.443] { [18:41:50.443] { [18:41:50.443] { [18:41:50.443] base::local({ [18:41:50.443] has_future <- base::requireNamespace("future", [18:41:50.443] quietly = TRUE) [18:41:50.443] if (has_future) { [18:41:50.443] ns <- base::getNamespace("future") [18:41:50.443] version <- ns[[".package"]][["version"]] [18:41:50.443] if (is.null(version)) [18:41:50.443] version <- utils::packageVersion("future") [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] version <- NULL [18:41:50.443] } [18:41:50.443] if (!has_future || version < "1.8.0") { [18:41:50.443] info <- base::c(r_version = base::gsub("R version ", [18:41:50.443] "", base::R.version$version.string), [18:41:50.443] platform = base::sprintf("%s (%s-bit)", [18:41:50.443] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.443] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.443] "release", "version")], collapse = " "), [18:41:50.443] hostname = base::Sys.info()[["nodename"]]) [18:41:50.443] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.443] info) [18:41:50.443] info <- base::paste(info, collapse = "; ") [18:41:50.443] if (!has_future) { [18:41:50.443] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.443] info) [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.443] info, version) [18:41:50.443] } [18:41:50.443] base::stop(msg) [18:41:50.443] } [18:41:50.443] }) [18:41:50.443] } [18:41:50.443] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.443] base::options(mc.cores = 1L) [18:41:50.443] } [18:41:50.443] ...future.strategy.old <- future::plan("list") [18:41:50.443] options(future.plan = NULL) [18:41:50.443] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.443] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.443] } [18:41:50.443] ...future.workdir <- getwd() [18:41:50.443] } [18:41:50.443] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.443] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.443] } [18:41:50.443] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.443] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.443] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.443] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.443] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.443] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.443] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.443] base::names(...future.oldOptions)) [18:41:50.443] } [18:41:50.443] if (FALSE) { [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] if (TRUE) { [18:41:50.443] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.443] open = "w") [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.443] windows = "NUL", "/dev/null"), open = "w") [18:41:50.443] } [18:41:50.443] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.443] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.443] base::sink(type = "output", split = FALSE) [18:41:50.443] base::close(...future.stdout) [18:41:50.443] }, add = TRUE) [18:41:50.443] } [18:41:50.443] ...future.frame <- base::sys.nframe() [18:41:50.443] ...future.conditions <- base::list() [18:41:50.443] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.443] if (FALSE) { [18:41:50.443] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.443] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.443] } [18:41:50.443] ...future.result <- base::tryCatch({ [18:41:50.443] base::withCallingHandlers({ [18:41:50.443] ...future.value <- base::withVisible(base::local({ [18:41:50.443] ...future.makeSendCondition <- base::local({ [18:41:50.443] sendCondition <- NULL [18:41:50.443] function(frame = 1L) { [18:41:50.443] if (is.function(sendCondition)) [18:41:50.443] return(sendCondition) [18:41:50.443] ns <- getNamespace("parallel") [18:41:50.443] if (exists("sendData", mode = "function", [18:41:50.443] envir = ns)) { [18:41:50.443] parallel_sendData <- get("sendData", mode = "function", [18:41:50.443] envir = ns) [18:41:50.443] envir <- sys.frame(frame) [18:41:50.443] master <- NULL [18:41:50.443] while (!identical(envir, .GlobalEnv) && [18:41:50.443] !identical(envir, emptyenv())) { [18:41:50.443] if (exists("master", mode = "list", envir = envir, [18:41:50.443] inherits = FALSE)) { [18:41:50.443] master <- get("master", mode = "list", [18:41:50.443] envir = envir, inherits = FALSE) [18:41:50.443] if (inherits(master, c("SOCKnode", [18:41:50.443] "SOCK0node"))) { [18:41:50.443] sendCondition <<- function(cond) { [18:41:50.443] data <- list(type = "VALUE", value = cond, [18:41:50.443] success = TRUE) [18:41:50.443] parallel_sendData(master, data) [18:41:50.443] } [18:41:50.443] return(sendCondition) [18:41:50.443] } [18:41:50.443] } [18:41:50.443] frame <- frame + 1L [18:41:50.443] envir <- sys.frame(frame) [18:41:50.443] } [18:41:50.443] } [18:41:50.443] sendCondition <<- function(cond) NULL [18:41:50.443] } [18:41:50.443] }) [18:41:50.443] withCallingHandlers({ [18:41:50.443] { [18:41:50.443] do.call(function(...) { [18:41:50.443] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.443] if (!identical(...future.globals.maxSize.org, [18:41:50.443] ...future.globals.maxSize)) { [18:41:50.443] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.443] on.exit(options(oopts), add = TRUE) [18:41:50.443] } [18:41:50.443] { [18:41:50.443] lapply(seq_along(...future.elements_ii), [18:41:50.443] FUN = function(jj) { [18:41:50.443] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.443] ...future.FUN(...future.X_jj, ...) [18:41:50.443] }) [18:41:50.443] } [18:41:50.443] }, args = future.call.arguments) [18:41:50.443] } [18:41:50.443] }, immediateCondition = function(cond) { [18:41:50.443] sendCondition <- ...future.makeSendCondition() [18:41:50.443] sendCondition(cond) [18:41:50.443] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.443] { [18:41:50.443] inherits <- base::inherits [18:41:50.443] invokeRestart <- base::invokeRestart [18:41:50.443] is.null <- base::is.null [18:41:50.443] muffled <- FALSE [18:41:50.443] if (inherits(cond, "message")) { [18:41:50.443] muffled <- grepl(pattern, "muffleMessage") [18:41:50.443] if (muffled) [18:41:50.443] invokeRestart("muffleMessage") [18:41:50.443] } [18:41:50.443] else if (inherits(cond, "warning")) { [18:41:50.443] muffled <- grepl(pattern, "muffleWarning") [18:41:50.443] if (muffled) [18:41:50.443] invokeRestart("muffleWarning") [18:41:50.443] } [18:41:50.443] else if (inherits(cond, "condition")) { [18:41:50.443] if (!is.null(pattern)) { [18:41:50.443] computeRestarts <- base::computeRestarts [18:41:50.443] grepl <- base::grepl [18:41:50.443] restarts <- computeRestarts(cond) [18:41:50.443] for (restart in restarts) { [18:41:50.443] name <- restart$name [18:41:50.443] if (is.null(name)) [18:41:50.443] next [18:41:50.443] if (!grepl(pattern, name)) [18:41:50.443] next [18:41:50.443] invokeRestart(restart) [18:41:50.443] muffled <- TRUE [18:41:50.443] break [18:41:50.443] } [18:41:50.443] } [18:41:50.443] } [18:41:50.443] invisible(muffled) [18:41:50.443] } [18:41:50.443] muffleCondition(cond) [18:41:50.443] }) [18:41:50.443] })) [18:41:50.443] future::FutureResult(value = ...future.value$value, [18:41:50.443] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.443] ...future.rng), globalenv = if (FALSE) [18:41:50.443] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.443] ...future.globalenv.names)) [18:41:50.443] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.443] }, condition = base::local({ [18:41:50.443] c <- base::c [18:41:50.443] inherits <- base::inherits [18:41:50.443] invokeRestart <- base::invokeRestart [18:41:50.443] length <- base::length [18:41:50.443] list <- base::list [18:41:50.443] seq.int <- base::seq.int [18:41:50.443] signalCondition <- base::signalCondition [18:41:50.443] sys.calls <- base::sys.calls [18:41:50.443] `[[` <- base::`[[` [18:41:50.443] `+` <- base::`+` [18:41:50.443] `<<-` <- base::`<<-` [18:41:50.443] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.443] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.443] 3L)] [18:41:50.443] } [18:41:50.443] function(cond) { [18:41:50.443] is_error <- inherits(cond, "error") [18:41:50.443] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.443] NULL) [18:41:50.443] if (is_error) { [18:41:50.443] sessionInformation <- function() { [18:41:50.443] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.443] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.443] search = base::search(), system = base::Sys.info()) [18:41:50.443] } [18:41:50.443] ...future.conditions[[length(...future.conditions) + [18:41:50.443] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.443] cond$call), session = sessionInformation(), [18:41:50.443] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.443] signalCondition(cond) [18:41:50.443] } [18:41:50.443] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.443] "immediateCondition"))) { [18:41:50.443] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.443] ...future.conditions[[length(...future.conditions) + [18:41:50.443] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.443] if (TRUE && !signal) { [18:41:50.443] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.443] { [18:41:50.443] inherits <- base::inherits [18:41:50.443] invokeRestart <- base::invokeRestart [18:41:50.443] is.null <- base::is.null [18:41:50.443] muffled <- FALSE [18:41:50.443] if (inherits(cond, "message")) { [18:41:50.443] muffled <- grepl(pattern, "muffleMessage") [18:41:50.443] if (muffled) [18:41:50.443] invokeRestart("muffleMessage") [18:41:50.443] } [18:41:50.443] else if (inherits(cond, "warning")) { [18:41:50.443] muffled <- grepl(pattern, "muffleWarning") [18:41:50.443] if (muffled) [18:41:50.443] invokeRestart("muffleWarning") [18:41:50.443] } [18:41:50.443] else if (inherits(cond, "condition")) { [18:41:50.443] if (!is.null(pattern)) { [18:41:50.443] computeRestarts <- base::computeRestarts [18:41:50.443] grepl <- base::grepl [18:41:50.443] restarts <- computeRestarts(cond) [18:41:50.443] for (restart in restarts) { [18:41:50.443] name <- restart$name [18:41:50.443] if (is.null(name)) [18:41:50.443] next [18:41:50.443] if (!grepl(pattern, name)) [18:41:50.443] next [18:41:50.443] invokeRestart(restart) [18:41:50.443] muffled <- TRUE [18:41:50.443] break [18:41:50.443] } [18:41:50.443] } [18:41:50.443] } [18:41:50.443] invisible(muffled) [18:41:50.443] } [18:41:50.443] muffleCondition(cond, pattern = "^muffle") [18:41:50.443] } [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] if (TRUE) { [18:41:50.443] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.443] { [18:41:50.443] inherits <- base::inherits [18:41:50.443] invokeRestart <- base::invokeRestart [18:41:50.443] is.null <- base::is.null [18:41:50.443] muffled <- FALSE [18:41:50.443] if (inherits(cond, "message")) { [18:41:50.443] muffled <- grepl(pattern, "muffleMessage") [18:41:50.443] if (muffled) [18:41:50.443] invokeRestart("muffleMessage") [18:41:50.443] } [18:41:50.443] else if (inherits(cond, "warning")) { [18:41:50.443] muffled <- grepl(pattern, "muffleWarning") [18:41:50.443] if (muffled) [18:41:50.443] invokeRestart("muffleWarning") [18:41:50.443] } [18:41:50.443] else if (inherits(cond, "condition")) { [18:41:50.443] if (!is.null(pattern)) { [18:41:50.443] computeRestarts <- base::computeRestarts [18:41:50.443] grepl <- base::grepl [18:41:50.443] restarts <- computeRestarts(cond) [18:41:50.443] for (restart in restarts) { [18:41:50.443] name <- restart$name [18:41:50.443] if (is.null(name)) [18:41:50.443] next [18:41:50.443] if (!grepl(pattern, name)) [18:41:50.443] next [18:41:50.443] invokeRestart(restart) [18:41:50.443] muffled <- TRUE [18:41:50.443] break [18:41:50.443] } [18:41:50.443] } [18:41:50.443] } [18:41:50.443] invisible(muffled) [18:41:50.443] } [18:41:50.443] muffleCondition(cond, pattern = "^muffle") [18:41:50.443] } [18:41:50.443] } [18:41:50.443] } [18:41:50.443] })) [18:41:50.443] }, error = function(ex) { [18:41:50.443] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.443] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.443] ...future.rng), started = ...future.startTime, [18:41:50.443] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.443] version = "1.8"), class = "FutureResult") [18:41:50.443] }, finally = { [18:41:50.443] if (!identical(...future.workdir, getwd())) [18:41:50.443] setwd(...future.workdir) [18:41:50.443] { [18:41:50.443] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.443] ...future.oldOptions$nwarnings <- NULL [18:41:50.443] } [18:41:50.443] base::options(...future.oldOptions) [18:41:50.443] if (.Platform$OS.type == "windows") { [18:41:50.443] old_names <- names(...future.oldEnvVars) [18:41:50.443] envs <- base::Sys.getenv() [18:41:50.443] names <- names(envs) [18:41:50.443] common <- intersect(names, old_names) [18:41:50.443] added <- setdiff(names, old_names) [18:41:50.443] removed <- setdiff(old_names, names) [18:41:50.443] changed <- common[...future.oldEnvVars[common] != [18:41:50.443] envs[common]] [18:41:50.443] NAMES <- toupper(changed) [18:41:50.443] args <- list() [18:41:50.443] for (kk in seq_along(NAMES)) { [18:41:50.443] name <- changed[[kk]] [18:41:50.443] NAME <- NAMES[[kk]] [18:41:50.443] if (name != NAME && is.element(NAME, old_names)) [18:41:50.443] next [18:41:50.443] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.443] } [18:41:50.443] NAMES <- toupper(added) [18:41:50.443] for (kk in seq_along(NAMES)) { [18:41:50.443] name <- added[[kk]] [18:41:50.443] NAME <- NAMES[[kk]] [18:41:50.443] if (name != NAME && is.element(NAME, old_names)) [18:41:50.443] next [18:41:50.443] args[[name]] <- "" [18:41:50.443] } [18:41:50.443] NAMES <- toupper(removed) [18:41:50.443] for (kk in seq_along(NAMES)) { [18:41:50.443] name <- removed[[kk]] [18:41:50.443] NAME <- NAMES[[kk]] [18:41:50.443] if (name != NAME && is.element(NAME, old_names)) [18:41:50.443] next [18:41:50.443] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.443] } [18:41:50.443] if (length(args) > 0) [18:41:50.443] base::do.call(base::Sys.setenv, args = args) [18:41:50.443] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.443] } [18:41:50.443] { [18:41:50.443] if (base::length(...future.futureOptionsAdded) > [18:41:50.443] 0L) { [18:41:50.443] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.443] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.443] base::options(opts) [18:41:50.443] } [18:41:50.443] { [18:41:50.443] { [18:41:50.443] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.443] NULL [18:41:50.443] } [18:41:50.443] options(future.plan = NULL) [18:41:50.443] if (is.na(NA_character_)) [18:41:50.443] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.443] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.443] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.443] .init = FALSE) [18:41:50.443] } [18:41:50.443] } [18:41:50.443] } [18:41:50.443] }) [18:41:50.443] if (TRUE) { [18:41:50.443] base::sink(type = "output", split = FALSE) [18:41:50.443] if (TRUE) { [18:41:50.443] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.443] } [18:41:50.443] else { [18:41:50.443] ...future.result["stdout"] <- base::list(NULL) [18:41:50.443] } [18:41:50.443] base::close(...future.stdout) [18:41:50.443] ...future.stdout <- NULL [18:41:50.443] } [18:41:50.443] ...future.result$conditions <- ...future.conditions [18:41:50.443] ...future.result$finished <- base::Sys.time() [18:41:50.443] ...future.result [18:41:50.443] } [18:41:50.452] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:50.452] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:50.453] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:50.453] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.454] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.454] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.455] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.455] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.456] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.456] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.457] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.457] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:50.458] MultisessionFuture started [18:41:50.458] - Launch lazy future ... done [18:41:50.459] run() for 'MultisessionFuture' ... done [18:41:50.459] Created future: [18:41:50.472] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.472] - Validating connection of MultisessionFuture [18:41:50.473] - received message: FutureResult [18:41:50.473] - Received FutureResult [18:41:50.474] - Erased future from FutureRegistry [18:41:50.474] result() for ClusterFuture ... [18:41:50.474] - result already collected: FutureResult [18:41:50.474] result() for ClusterFuture ... done [18:41:50.475] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.459] MultisessionFuture: [18:41:50.459] Label: 'future_sapply-1' [18:41:50.459] Expression: [18:41:50.459] { [18:41:50.459] do.call(function(...) { [18:41:50.459] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.459] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.459] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.459] on.exit(options(oopts), add = TRUE) [18:41:50.459] } [18:41:50.459] { [18:41:50.459] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.459] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.459] ...future.FUN(...future.X_jj, ...) [18:41:50.459] }) [18:41:50.459] } [18:41:50.459] }, args = future.call.arguments) [18:41:50.459] } [18:41:50.459] Lazy evaluation: FALSE [18:41:50.459] Asynchronous evaluation: TRUE [18:41:50.459] Local evaluation: TRUE [18:41:50.459] Environment: R_GlobalEnv [18:41:50.459] Capture standard output: TRUE [18:41:50.459] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.459] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.459] Packages: [18:41:50.459] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.459] Resolved: TRUE [18:41:50.459] Value: [18:41:50.459] Conditions captured: [18:41:50.459] Early signaling: FALSE [18:41:50.459] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.459] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.475] Chunk #1 of 2 ... DONE [18:41:50.476] Chunk #2 of 2 ... [18:41:50.476] - Finding globals in 'X' for chunk #2 ... [18:41:50.476] getGlobalsAndPackages() ... [18:41:50.477] Searching for globals... [18:41:50.477] [18:41:50.477] Searching for globals ... DONE [18:41:50.478] - globals: [0] [18:41:50.478] getGlobalsAndPackages() ... DONE [18:41:50.478] + additional globals found: [n=0] [18:41:50.478] + additional namespaces needed: [n=0] [18:41:50.479] - Finding globals in 'X' for chunk #2 ... DONE [18:41:50.479] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.479] - seeds: [18:41:50.480] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.480] getGlobalsAndPackages() ... [18:41:50.480] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.480] Resolving globals: FALSE [18:41:50.481] Tweak future expression to call with '...' arguments ... [18:41:50.481] { [18:41:50.481] do.call(function(...) { [18:41:50.481] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.481] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.481] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.481] on.exit(options(oopts), add = TRUE) [18:41:50.481] } [18:41:50.481] { [18:41:50.481] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.481] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.481] ...future.FUN(...future.X_jj, ...) [18:41:50.481] }) [18:41:50.481] } [18:41:50.481] }, args = future.call.arguments) [18:41:50.481] } [18:41:50.482] Tweak future expression to call with '...' arguments ... DONE [18:41:50.483] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.483] [18:41:50.483] getGlobalsAndPackages() ... DONE [18:41:50.484] run() for 'Future' ... [18:41:50.484] - state: 'created' [18:41:50.485] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.510] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.510] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.510] - Field: 'node' [18:41:50.511] - Field: 'label' [18:41:50.511] - Field: 'local' [18:41:50.511] - Field: 'owner' [18:41:50.512] - Field: 'envir' [18:41:50.512] - Field: 'workers' [18:41:50.512] - Field: 'packages' [18:41:50.512] - Field: 'gc' [18:41:50.513] - Field: 'conditions' [18:41:50.513] - Field: 'persistent' [18:41:50.513] - Field: 'expr' [18:41:50.514] - Field: 'uuid' [18:41:50.514] - Field: 'seed' [18:41:50.514] - Field: 'version' [18:41:50.514] - Field: 'result' [18:41:50.519] - Field: 'asynchronous' [18:41:50.520] - Field: 'calls' [18:41:50.520] - Field: 'globals' [18:41:50.520] - Field: 'stdout' [18:41:50.521] - Field: 'earlySignal' [18:41:50.521] - Field: 'lazy' [18:41:50.521] - Field: 'state' [18:41:50.522] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.522] - Launch lazy future ... [18:41:50.522] Packages needed by the future expression (n = 0): [18:41:50.523] Packages needed by future strategies (n = 0): [18:41:50.524] { [18:41:50.524] { [18:41:50.524] { [18:41:50.524] ...future.startTime <- base::Sys.time() [18:41:50.524] { [18:41:50.524] { [18:41:50.524] { [18:41:50.524] { [18:41:50.524] base::local({ [18:41:50.524] has_future <- base::requireNamespace("future", [18:41:50.524] quietly = TRUE) [18:41:50.524] if (has_future) { [18:41:50.524] ns <- base::getNamespace("future") [18:41:50.524] version <- ns[[".package"]][["version"]] [18:41:50.524] if (is.null(version)) [18:41:50.524] version <- utils::packageVersion("future") [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] version <- NULL [18:41:50.524] } [18:41:50.524] if (!has_future || version < "1.8.0") { [18:41:50.524] info <- base::c(r_version = base::gsub("R version ", [18:41:50.524] "", base::R.version$version.string), [18:41:50.524] platform = base::sprintf("%s (%s-bit)", [18:41:50.524] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.524] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.524] "release", "version")], collapse = " "), [18:41:50.524] hostname = base::Sys.info()[["nodename"]]) [18:41:50.524] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.524] info) [18:41:50.524] info <- base::paste(info, collapse = "; ") [18:41:50.524] if (!has_future) { [18:41:50.524] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.524] info) [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.524] info, version) [18:41:50.524] } [18:41:50.524] base::stop(msg) [18:41:50.524] } [18:41:50.524] }) [18:41:50.524] } [18:41:50.524] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.524] base::options(mc.cores = 1L) [18:41:50.524] } [18:41:50.524] ...future.strategy.old <- future::plan("list") [18:41:50.524] options(future.plan = NULL) [18:41:50.524] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.524] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.524] } [18:41:50.524] ...future.workdir <- getwd() [18:41:50.524] } [18:41:50.524] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.524] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.524] } [18:41:50.524] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.524] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.524] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.524] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.524] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.524] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.524] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.524] base::names(...future.oldOptions)) [18:41:50.524] } [18:41:50.524] if (FALSE) { [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] if (TRUE) { [18:41:50.524] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.524] open = "w") [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.524] windows = "NUL", "/dev/null"), open = "w") [18:41:50.524] } [18:41:50.524] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.524] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.524] base::sink(type = "output", split = FALSE) [18:41:50.524] base::close(...future.stdout) [18:41:50.524] }, add = TRUE) [18:41:50.524] } [18:41:50.524] ...future.frame <- base::sys.nframe() [18:41:50.524] ...future.conditions <- base::list() [18:41:50.524] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.524] if (FALSE) { [18:41:50.524] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.524] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.524] } [18:41:50.524] ...future.result <- base::tryCatch({ [18:41:50.524] base::withCallingHandlers({ [18:41:50.524] ...future.value <- base::withVisible(base::local({ [18:41:50.524] ...future.makeSendCondition <- base::local({ [18:41:50.524] sendCondition <- NULL [18:41:50.524] function(frame = 1L) { [18:41:50.524] if (is.function(sendCondition)) [18:41:50.524] return(sendCondition) [18:41:50.524] ns <- getNamespace("parallel") [18:41:50.524] if (exists("sendData", mode = "function", [18:41:50.524] envir = ns)) { [18:41:50.524] parallel_sendData <- get("sendData", mode = "function", [18:41:50.524] envir = ns) [18:41:50.524] envir <- sys.frame(frame) [18:41:50.524] master <- NULL [18:41:50.524] while (!identical(envir, .GlobalEnv) && [18:41:50.524] !identical(envir, emptyenv())) { [18:41:50.524] if (exists("master", mode = "list", envir = envir, [18:41:50.524] inherits = FALSE)) { [18:41:50.524] master <- get("master", mode = "list", [18:41:50.524] envir = envir, inherits = FALSE) [18:41:50.524] if (inherits(master, c("SOCKnode", [18:41:50.524] "SOCK0node"))) { [18:41:50.524] sendCondition <<- function(cond) { [18:41:50.524] data <- list(type = "VALUE", value = cond, [18:41:50.524] success = TRUE) [18:41:50.524] parallel_sendData(master, data) [18:41:50.524] } [18:41:50.524] return(sendCondition) [18:41:50.524] } [18:41:50.524] } [18:41:50.524] frame <- frame + 1L [18:41:50.524] envir <- sys.frame(frame) [18:41:50.524] } [18:41:50.524] } [18:41:50.524] sendCondition <<- function(cond) NULL [18:41:50.524] } [18:41:50.524] }) [18:41:50.524] withCallingHandlers({ [18:41:50.524] { [18:41:50.524] do.call(function(...) { [18:41:50.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.524] if (!identical(...future.globals.maxSize.org, [18:41:50.524] ...future.globals.maxSize)) { [18:41:50.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.524] on.exit(options(oopts), add = TRUE) [18:41:50.524] } [18:41:50.524] { [18:41:50.524] lapply(seq_along(...future.elements_ii), [18:41:50.524] FUN = function(jj) { [18:41:50.524] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.524] ...future.FUN(...future.X_jj, ...) [18:41:50.524] }) [18:41:50.524] } [18:41:50.524] }, args = future.call.arguments) [18:41:50.524] } [18:41:50.524] }, immediateCondition = function(cond) { [18:41:50.524] sendCondition <- ...future.makeSendCondition() [18:41:50.524] sendCondition(cond) [18:41:50.524] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.524] { [18:41:50.524] inherits <- base::inherits [18:41:50.524] invokeRestart <- base::invokeRestart [18:41:50.524] is.null <- base::is.null [18:41:50.524] muffled <- FALSE [18:41:50.524] if (inherits(cond, "message")) { [18:41:50.524] muffled <- grepl(pattern, "muffleMessage") [18:41:50.524] if (muffled) [18:41:50.524] invokeRestart("muffleMessage") [18:41:50.524] } [18:41:50.524] else if (inherits(cond, "warning")) { [18:41:50.524] muffled <- grepl(pattern, "muffleWarning") [18:41:50.524] if (muffled) [18:41:50.524] invokeRestart("muffleWarning") [18:41:50.524] } [18:41:50.524] else if (inherits(cond, "condition")) { [18:41:50.524] if (!is.null(pattern)) { [18:41:50.524] computeRestarts <- base::computeRestarts [18:41:50.524] grepl <- base::grepl [18:41:50.524] restarts <- computeRestarts(cond) [18:41:50.524] for (restart in restarts) { [18:41:50.524] name <- restart$name [18:41:50.524] if (is.null(name)) [18:41:50.524] next [18:41:50.524] if (!grepl(pattern, name)) [18:41:50.524] next [18:41:50.524] invokeRestart(restart) [18:41:50.524] muffled <- TRUE [18:41:50.524] break [18:41:50.524] } [18:41:50.524] } [18:41:50.524] } [18:41:50.524] invisible(muffled) [18:41:50.524] } [18:41:50.524] muffleCondition(cond) [18:41:50.524] }) [18:41:50.524] })) [18:41:50.524] future::FutureResult(value = ...future.value$value, [18:41:50.524] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.524] ...future.rng), globalenv = if (FALSE) [18:41:50.524] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.524] ...future.globalenv.names)) [18:41:50.524] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.524] }, condition = base::local({ [18:41:50.524] c <- base::c [18:41:50.524] inherits <- base::inherits [18:41:50.524] invokeRestart <- base::invokeRestart [18:41:50.524] length <- base::length [18:41:50.524] list <- base::list [18:41:50.524] seq.int <- base::seq.int [18:41:50.524] signalCondition <- base::signalCondition [18:41:50.524] sys.calls <- base::sys.calls [18:41:50.524] `[[` <- base::`[[` [18:41:50.524] `+` <- base::`+` [18:41:50.524] `<<-` <- base::`<<-` [18:41:50.524] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.524] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.524] 3L)] [18:41:50.524] } [18:41:50.524] function(cond) { [18:41:50.524] is_error <- inherits(cond, "error") [18:41:50.524] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.524] NULL) [18:41:50.524] if (is_error) { [18:41:50.524] sessionInformation <- function() { [18:41:50.524] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.524] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.524] search = base::search(), system = base::Sys.info()) [18:41:50.524] } [18:41:50.524] ...future.conditions[[length(...future.conditions) + [18:41:50.524] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.524] cond$call), session = sessionInformation(), [18:41:50.524] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.524] signalCondition(cond) [18:41:50.524] } [18:41:50.524] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.524] "immediateCondition"))) { [18:41:50.524] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.524] ...future.conditions[[length(...future.conditions) + [18:41:50.524] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.524] if (TRUE && !signal) { [18:41:50.524] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.524] { [18:41:50.524] inherits <- base::inherits [18:41:50.524] invokeRestart <- base::invokeRestart [18:41:50.524] is.null <- base::is.null [18:41:50.524] muffled <- FALSE [18:41:50.524] if (inherits(cond, "message")) { [18:41:50.524] muffled <- grepl(pattern, "muffleMessage") [18:41:50.524] if (muffled) [18:41:50.524] invokeRestart("muffleMessage") [18:41:50.524] } [18:41:50.524] else if (inherits(cond, "warning")) { [18:41:50.524] muffled <- grepl(pattern, "muffleWarning") [18:41:50.524] if (muffled) [18:41:50.524] invokeRestart("muffleWarning") [18:41:50.524] } [18:41:50.524] else if (inherits(cond, "condition")) { [18:41:50.524] if (!is.null(pattern)) { [18:41:50.524] computeRestarts <- base::computeRestarts [18:41:50.524] grepl <- base::grepl [18:41:50.524] restarts <- computeRestarts(cond) [18:41:50.524] for (restart in restarts) { [18:41:50.524] name <- restart$name [18:41:50.524] if (is.null(name)) [18:41:50.524] next [18:41:50.524] if (!grepl(pattern, name)) [18:41:50.524] next [18:41:50.524] invokeRestart(restart) [18:41:50.524] muffled <- TRUE [18:41:50.524] break [18:41:50.524] } [18:41:50.524] } [18:41:50.524] } [18:41:50.524] invisible(muffled) [18:41:50.524] } [18:41:50.524] muffleCondition(cond, pattern = "^muffle") [18:41:50.524] } [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] if (TRUE) { [18:41:50.524] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.524] { [18:41:50.524] inherits <- base::inherits [18:41:50.524] invokeRestart <- base::invokeRestart [18:41:50.524] is.null <- base::is.null [18:41:50.524] muffled <- FALSE [18:41:50.524] if (inherits(cond, "message")) { [18:41:50.524] muffled <- grepl(pattern, "muffleMessage") [18:41:50.524] if (muffled) [18:41:50.524] invokeRestart("muffleMessage") [18:41:50.524] } [18:41:50.524] else if (inherits(cond, "warning")) { [18:41:50.524] muffled <- grepl(pattern, "muffleWarning") [18:41:50.524] if (muffled) [18:41:50.524] invokeRestart("muffleWarning") [18:41:50.524] } [18:41:50.524] else if (inherits(cond, "condition")) { [18:41:50.524] if (!is.null(pattern)) { [18:41:50.524] computeRestarts <- base::computeRestarts [18:41:50.524] grepl <- base::grepl [18:41:50.524] restarts <- computeRestarts(cond) [18:41:50.524] for (restart in restarts) { [18:41:50.524] name <- restart$name [18:41:50.524] if (is.null(name)) [18:41:50.524] next [18:41:50.524] if (!grepl(pattern, name)) [18:41:50.524] next [18:41:50.524] invokeRestart(restart) [18:41:50.524] muffled <- TRUE [18:41:50.524] break [18:41:50.524] } [18:41:50.524] } [18:41:50.524] } [18:41:50.524] invisible(muffled) [18:41:50.524] } [18:41:50.524] muffleCondition(cond, pattern = "^muffle") [18:41:50.524] } [18:41:50.524] } [18:41:50.524] } [18:41:50.524] })) [18:41:50.524] }, error = function(ex) { [18:41:50.524] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.524] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.524] ...future.rng), started = ...future.startTime, [18:41:50.524] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.524] version = "1.8"), class = "FutureResult") [18:41:50.524] }, finally = { [18:41:50.524] if (!identical(...future.workdir, getwd())) [18:41:50.524] setwd(...future.workdir) [18:41:50.524] { [18:41:50.524] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.524] ...future.oldOptions$nwarnings <- NULL [18:41:50.524] } [18:41:50.524] base::options(...future.oldOptions) [18:41:50.524] if (.Platform$OS.type == "windows") { [18:41:50.524] old_names <- names(...future.oldEnvVars) [18:41:50.524] envs <- base::Sys.getenv() [18:41:50.524] names <- names(envs) [18:41:50.524] common <- intersect(names, old_names) [18:41:50.524] added <- setdiff(names, old_names) [18:41:50.524] removed <- setdiff(old_names, names) [18:41:50.524] changed <- common[...future.oldEnvVars[common] != [18:41:50.524] envs[common]] [18:41:50.524] NAMES <- toupper(changed) [18:41:50.524] args <- list() [18:41:50.524] for (kk in seq_along(NAMES)) { [18:41:50.524] name <- changed[[kk]] [18:41:50.524] NAME <- NAMES[[kk]] [18:41:50.524] if (name != NAME && is.element(NAME, old_names)) [18:41:50.524] next [18:41:50.524] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.524] } [18:41:50.524] NAMES <- toupper(added) [18:41:50.524] for (kk in seq_along(NAMES)) { [18:41:50.524] name <- added[[kk]] [18:41:50.524] NAME <- NAMES[[kk]] [18:41:50.524] if (name != NAME && is.element(NAME, old_names)) [18:41:50.524] next [18:41:50.524] args[[name]] <- "" [18:41:50.524] } [18:41:50.524] NAMES <- toupper(removed) [18:41:50.524] for (kk in seq_along(NAMES)) { [18:41:50.524] name <- removed[[kk]] [18:41:50.524] NAME <- NAMES[[kk]] [18:41:50.524] if (name != NAME && is.element(NAME, old_names)) [18:41:50.524] next [18:41:50.524] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.524] } [18:41:50.524] if (length(args) > 0) [18:41:50.524] base::do.call(base::Sys.setenv, args = args) [18:41:50.524] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.524] } [18:41:50.524] { [18:41:50.524] if (base::length(...future.futureOptionsAdded) > [18:41:50.524] 0L) { [18:41:50.524] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.524] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.524] base::options(opts) [18:41:50.524] } [18:41:50.524] { [18:41:50.524] { [18:41:50.524] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.524] NULL [18:41:50.524] } [18:41:50.524] options(future.plan = NULL) [18:41:50.524] if (is.na(NA_character_)) [18:41:50.524] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.524] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.524] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.524] .init = FALSE) [18:41:50.524] } [18:41:50.524] } [18:41:50.524] } [18:41:50.524] }) [18:41:50.524] if (TRUE) { [18:41:50.524] base::sink(type = "output", split = FALSE) [18:41:50.524] if (TRUE) { [18:41:50.524] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.524] } [18:41:50.524] else { [18:41:50.524] ...future.result["stdout"] <- base::list(NULL) [18:41:50.524] } [18:41:50.524] base::close(...future.stdout) [18:41:50.524] ...future.stdout <- NULL [18:41:50.524] } [18:41:50.524] ...future.result$conditions <- ...future.conditions [18:41:50.524] ...future.result$finished <- base::Sys.time() [18:41:50.524] ...future.result [18:41:50.524] } [18:41:50.532] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:50.532] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:50.533] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:50.533] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.534] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.534] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.534] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.535] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.536] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.536] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.537] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.537] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:50.538] MultisessionFuture started [18:41:50.538] - Launch lazy future ... done [18:41:50.538] run() for 'MultisessionFuture' ... done [18:41:50.539] Created future: [18:41:50.551] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.551] - Validating connection of MultisessionFuture [18:41:50.552] - received message: FutureResult [18:41:50.552] - Received FutureResult [18:41:50.552] - Erased future from FutureRegistry [18:41:50.553] result() for ClusterFuture ... [18:41:50.553] - result already collected: FutureResult [18:41:50.553] result() for ClusterFuture ... done [18:41:50.553] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.539] MultisessionFuture: [18:41:50.539] Label: 'future_sapply-2' [18:41:50.539] Expression: [18:41:50.539] { [18:41:50.539] do.call(function(...) { [18:41:50.539] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.539] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.539] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.539] on.exit(options(oopts), add = TRUE) [18:41:50.539] } [18:41:50.539] { [18:41:50.539] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.539] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.539] ...future.FUN(...future.X_jj, ...) [18:41:50.539] }) [18:41:50.539] } [18:41:50.539] }, args = future.call.arguments) [18:41:50.539] } [18:41:50.539] Lazy evaluation: FALSE [18:41:50.539] Asynchronous evaluation: TRUE [18:41:50.539] Local evaluation: TRUE [18:41:50.539] Environment: R_GlobalEnv [18:41:50.539] Capture standard output: TRUE [18:41:50.539] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.539] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.539] Packages: [18:41:50.539] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.539] Resolved: TRUE [18:41:50.539] Value: [18:41:50.539] Conditions captured: [18:41:50.539] Early signaling: FALSE [18:41:50.539] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.539] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.554] Chunk #2 of 2 ... DONE [18:41:50.554] Launching 2 futures (chunks) ... DONE [18:41:50.554] Resolving 2 futures (chunks) ... [18:41:50.555] resolve() on list ... [18:41:50.555] recursive: 0 [18:41:50.555] length: 2 [18:41:50.555] [18:41:50.556] Future #1 [18:41:50.556] result() for ClusterFuture ... [18:41:50.556] - result already collected: FutureResult [18:41:50.556] result() for ClusterFuture ... done [18:41:50.557] result() for ClusterFuture ... [18:41:50.557] - result already collected: FutureResult [18:41:50.557] result() for ClusterFuture ... done [18:41:50.557] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:50.558] - nx: 2 [18:41:50.558] - relay: TRUE [18:41:50.558] - stdout: TRUE [18:41:50.558] - signal: TRUE [18:41:50.559] - resignal: FALSE [18:41:50.559] - force: TRUE [18:41:50.559] - relayed: [n=2] FALSE, FALSE [18:41:50.559] - queued futures: [n=2] FALSE, FALSE [18:41:50.559] - until=1 [18:41:50.560] - relaying element #1 [18:41:50.560] result() for ClusterFuture ... [18:41:50.560] - result already collected: FutureResult [18:41:50.560] result() for ClusterFuture ... done [18:41:50.561] result() for ClusterFuture ... [18:41:50.561] - result already collected: FutureResult [18:41:50.561] result() for ClusterFuture ... done [18:41:50.561] result() for ClusterFuture ... [18:41:50.562] - result already collected: FutureResult [18:41:50.562] result() for ClusterFuture ... done [18:41:50.562] result() for ClusterFuture ... [18:41:50.562] - result already collected: FutureResult [18:41:50.563] result() for ClusterFuture ... done [18:41:50.563] - relayed: [n=2] TRUE, FALSE [18:41:50.563] - queued futures: [n=2] TRUE, FALSE [18:41:50.563] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:50.564] length: 1 (resolved future 1) [18:41:50.564] Future #2 [18:41:50.564] result() for ClusterFuture ... [18:41:50.564] - result already collected: FutureResult [18:41:50.565] result() for ClusterFuture ... done [18:41:50.565] result() for ClusterFuture ... [18:41:50.565] - result already collected: FutureResult [18:41:50.565] result() for ClusterFuture ... done [18:41:50.566] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:50.566] - nx: 2 [18:41:50.566] - relay: TRUE [18:41:50.566] - stdout: TRUE [18:41:50.567] - signal: TRUE [18:41:50.567] - resignal: FALSE [18:41:50.567] - force: TRUE [18:41:50.568] - relayed: [n=2] TRUE, FALSE [18:41:50.568] - queued futures: [n=2] TRUE, FALSE [18:41:50.568] - until=2 [18:41:50.568] - relaying element #2 [18:41:50.569] result() for ClusterFuture ... [18:41:50.569] - result already collected: FutureResult [18:41:50.569] result() for ClusterFuture ... done [18:41:50.569] result() for ClusterFuture ... [18:41:50.570] - result already collected: FutureResult [18:41:50.570] result() for ClusterFuture ... done [18:41:50.570] result() for ClusterFuture ... [18:41:50.570] - result already collected: FutureResult [18:41:50.571] result() for ClusterFuture ... done [18:41:50.571] result() for ClusterFuture ... [18:41:50.571] - result already collected: FutureResult [18:41:50.571] result() for ClusterFuture ... done [18:41:50.572] - relayed: [n=2] TRUE, TRUE [18:41:50.572] - queued futures: [n=2] TRUE, TRUE [18:41:50.572] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:50.572] length: 0 (resolved future 2) [18:41:50.573] Relaying remaining futures [18:41:50.573] signalConditionsASAP(NULL, pos=0) ... [18:41:50.573] - nx: 2 [18:41:50.573] - relay: TRUE [18:41:50.573] - stdout: TRUE [18:41:50.574] - signal: TRUE [18:41:50.574] - resignal: FALSE [18:41:50.574] - force: TRUE [18:41:50.574] - relayed: [n=2] TRUE, TRUE [18:41:50.575] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:50.575] - relayed: [n=2] TRUE, TRUE [18:41:50.575] - queued futures: [n=2] TRUE, TRUE [18:41:50.576] signalConditionsASAP(NULL, pos=0) ... done [18:41:50.576] resolve() on list ... DONE [18:41:50.576] result() for ClusterFuture ... [18:41:50.576] - result already collected: FutureResult [18:41:50.576] result() for ClusterFuture ... done [18:41:50.577] result() for ClusterFuture ... [18:41:50.577] - result already collected: FutureResult [18:41:50.577] result() for ClusterFuture ... done [18:41:50.578] result() for ClusterFuture ... [18:41:50.578] - result already collected: FutureResult [18:41:50.578] result() for ClusterFuture ... done [18:41:50.578] result() for ClusterFuture ... [18:41:50.578] - result already collected: FutureResult [18:41:50.579] result() for ClusterFuture ... done [18:41:50.579] - Number of value chunks collected: 2 [18:41:50.579] Resolving 2 futures (chunks) ... DONE [18:41:50.579] Reducing values from 2 chunks ... [18:41:50.580] - Number of values collected after concatenation: 6 [18:41:50.580] - Number of values expected: 6 [18:41:50.580] Reducing values from 2 chunks ... DONE [18:41:50.580] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:50.584] future_lapply() ... [18:41:50.589] Number of chunks: 2 [18:41:50.589] getGlobalsAndPackagesXApply() ... [18:41:50.589] - future.globals: TRUE [18:41:50.589] getGlobalsAndPackages() ... [18:41:50.590] Searching for globals... [18:41:50.592] - globals found: [2] 'FUN', 'UseMethod' [18:41:50.592] Searching for globals ... DONE [18:41:50.592] Resolving globals: FALSE [18:41:50.593] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:50.593] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:50.594] - globals: [1] 'FUN' [18:41:50.594] [18:41:50.594] getGlobalsAndPackages() ... DONE [18:41:50.595] - globals found/used: [n=1] 'FUN' [18:41:50.595] - needed namespaces: [n=0] [18:41:50.595] Finding globals ... DONE [18:41:50.595] - use_args: TRUE [18:41:50.596] - Getting '...' globals ... [18:41:50.596] resolve() on list ... [18:41:50.596] recursive: 0 [18:41:50.597] length: 1 [18:41:50.597] elements: '...' [18:41:50.597] length: 0 (resolved future 1) [18:41:50.598] resolve() on list ... DONE [18:41:50.598] - '...' content: [n=0] [18:41:50.598] List of 1 [18:41:50.598] $ ...: list() [18:41:50.598] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.598] - attr(*, "where")=List of 1 [18:41:50.598] ..$ ...: [18:41:50.598] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.598] - attr(*, "resolved")= logi TRUE [18:41:50.598] - attr(*, "total_size")= num NA [18:41:50.603] - Getting '...' globals ... DONE [18:41:50.603] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:50.603] List of 2 [18:41:50.603] $ ...future.FUN:function (x, ...) [18:41:50.603] $ ... : list() [18:41:50.603] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.603] - attr(*, "where")=List of 2 [18:41:50.603] ..$ ...future.FUN: [18:41:50.603] ..$ ... : [18:41:50.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.603] - attr(*, "resolved")= logi FALSE [18:41:50.603] - attr(*, "total_size")= int 5182 [18:41:50.608] Packages to be attached in all futures: [n=0] [18:41:50.609] getGlobalsAndPackagesXApply() ... DONE [18:41:50.609] Number of futures (= number of chunks): 2 [18:41:50.609] Launching 2 futures (chunks) ... [18:41:50.610] Chunk #1 of 2 ... [18:41:50.610] - Finding globals in 'X' for chunk #1 ... [18:41:50.610] getGlobalsAndPackages() ... [18:41:50.610] Searching for globals... [18:41:50.611] [18:41:50.611] Searching for globals ... DONE [18:41:50.611] - globals: [0] [18:41:50.611] getGlobalsAndPackages() ... DONE [18:41:50.612] + additional globals found: [n=0] [18:41:50.612] + additional namespaces needed: [n=0] [18:41:50.612] - Finding globals in 'X' for chunk #1 ... DONE [18:41:50.612] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.613] - seeds: [18:41:50.613] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.613] getGlobalsAndPackages() ... [18:41:50.613] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.614] Resolving globals: FALSE [18:41:50.614] Tweak future expression to call with '...' arguments ... [18:41:50.614] { [18:41:50.614] do.call(function(...) { [18:41:50.614] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.614] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.614] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.614] on.exit(options(oopts), add = TRUE) [18:41:50.614] } [18:41:50.614] { [18:41:50.614] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.614] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.614] ...future.FUN(...future.X_jj, ...) [18:41:50.614] }) [18:41:50.614] } [18:41:50.614] }, args = future.call.arguments) [18:41:50.614] } [18:41:50.614] Tweak future expression to call with '...' arguments ... DONE [18:41:50.615] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.615] [18:41:50.615] getGlobalsAndPackages() ... DONE [18:41:50.615] run() for 'Future' ... [18:41:50.616] - state: 'created' [18:41:50.616] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.628] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.628] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.629] - Field: 'node' [18:41:50.629] - Field: 'label' [18:41:50.629] - Field: 'local' [18:41:50.629] - Field: 'owner' [18:41:50.629] - Field: 'envir' [18:41:50.630] - Field: 'workers' [18:41:50.630] - Field: 'packages' [18:41:50.630] - Field: 'gc' [18:41:50.630] - Field: 'conditions' [18:41:50.631] - Field: 'persistent' [18:41:50.631] - Field: 'expr' [18:41:50.631] - Field: 'uuid' [18:41:50.631] - Field: 'seed' [18:41:50.632] - Field: 'version' [18:41:50.632] - Field: 'result' [18:41:50.632] - Field: 'asynchronous' [18:41:50.632] - Field: 'calls' [18:41:50.632] - Field: 'globals' [18:41:50.633] - Field: 'stdout' [18:41:50.633] - Field: 'earlySignal' [18:41:50.633] - Field: 'lazy' [18:41:50.633] - Field: 'state' [18:41:50.633] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.633] - Launch lazy future ... [18:41:50.634] Packages needed by the future expression (n = 0): [18:41:50.634] Packages needed by future strategies (n = 0): [18:41:50.634] { [18:41:50.634] { [18:41:50.634] { [18:41:50.634] ...future.startTime <- base::Sys.time() [18:41:50.634] { [18:41:50.634] { [18:41:50.634] { [18:41:50.634] { [18:41:50.634] base::local({ [18:41:50.634] has_future <- base::requireNamespace("future", [18:41:50.634] quietly = TRUE) [18:41:50.634] if (has_future) { [18:41:50.634] ns <- base::getNamespace("future") [18:41:50.634] version <- ns[[".package"]][["version"]] [18:41:50.634] if (is.null(version)) [18:41:50.634] version <- utils::packageVersion("future") [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] version <- NULL [18:41:50.634] } [18:41:50.634] if (!has_future || version < "1.8.0") { [18:41:50.634] info <- base::c(r_version = base::gsub("R version ", [18:41:50.634] "", base::R.version$version.string), [18:41:50.634] platform = base::sprintf("%s (%s-bit)", [18:41:50.634] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.634] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.634] "release", "version")], collapse = " "), [18:41:50.634] hostname = base::Sys.info()[["nodename"]]) [18:41:50.634] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.634] info) [18:41:50.634] info <- base::paste(info, collapse = "; ") [18:41:50.634] if (!has_future) { [18:41:50.634] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.634] info) [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.634] info, version) [18:41:50.634] } [18:41:50.634] base::stop(msg) [18:41:50.634] } [18:41:50.634] }) [18:41:50.634] } [18:41:50.634] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.634] base::options(mc.cores = 1L) [18:41:50.634] } [18:41:50.634] ...future.strategy.old <- future::plan("list") [18:41:50.634] options(future.plan = NULL) [18:41:50.634] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.634] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.634] } [18:41:50.634] ...future.workdir <- getwd() [18:41:50.634] } [18:41:50.634] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.634] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.634] } [18:41:50.634] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.634] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.634] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.634] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.634] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.634] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.634] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.634] base::names(...future.oldOptions)) [18:41:50.634] } [18:41:50.634] if (FALSE) { [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] if (TRUE) { [18:41:50.634] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.634] open = "w") [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.634] windows = "NUL", "/dev/null"), open = "w") [18:41:50.634] } [18:41:50.634] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.634] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.634] base::sink(type = "output", split = FALSE) [18:41:50.634] base::close(...future.stdout) [18:41:50.634] }, add = TRUE) [18:41:50.634] } [18:41:50.634] ...future.frame <- base::sys.nframe() [18:41:50.634] ...future.conditions <- base::list() [18:41:50.634] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.634] if (FALSE) { [18:41:50.634] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.634] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.634] } [18:41:50.634] ...future.result <- base::tryCatch({ [18:41:50.634] base::withCallingHandlers({ [18:41:50.634] ...future.value <- base::withVisible(base::local({ [18:41:50.634] ...future.makeSendCondition <- base::local({ [18:41:50.634] sendCondition <- NULL [18:41:50.634] function(frame = 1L) { [18:41:50.634] if (is.function(sendCondition)) [18:41:50.634] return(sendCondition) [18:41:50.634] ns <- getNamespace("parallel") [18:41:50.634] if (exists("sendData", mode = "function", [18:41:50.634] envir = ns)) { [18:41:50.634] parallel_sendData <- get("sendData", mode = "function", [18:41:50.634] envir = ns) [18:41:50.634] envir <- sys.frame(frame) [18:41:50.634] master <- NULL [18:41:50.634] while (!identical(envir, .GlobalEnv) && [18:41:50.634] !identical(envir, emptyenv())) { [18:41:50.634] if (exists("master", mode = "list", envir = envir, [18:41:50.634] inherits = FALSE)) { [18:41:50.634] master <- get("master", mode = "list", [18:41:50.634] envir = envir, inherits = FALSE) [18:41:50.634] if (inherits(master, c("SOCKnode", [18:41:50.634] "SOCK0node"))) { [18:41:50.634] sendCondition <<- function(cond) { [18:41:50.634] data <- list(type = "VALUE", value = cond, [18:41:50.634] success = TRUE) [18:41:50.634] parallel_sendData(master, data) [18:41:50.634] } [18:41:50.634] return(sendCondition) [18:41:50.634] } [18:41:50.634] } [18:41:50.634] frame <- frame + 1L [18:41:50.634] envir <- sys.frame(frame) [18:41:50.634] } [18:41:50.634] } [18:41:50.634] sendCondition <<- function(cond) NULL [18:41:50.634] } [18:41:50.634] }) [18:41:50.634] withCallingHandlers({ [18:41:50.634] { [18:41:50.634] do.call(function(...) { [18:41:50.634] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.634] if (!identical(...future.globals.maxSize.org, [18:41:50.634] ...future.globals.maxSize)) { [18:41:50.634] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.634] on.exit(options(oopts), add = TRUE) [18:41:50.634] } [18:41:50.634] { [18:41:50.634] lapply(seq_along(...future.elements_ii), [18:41:50.634] FUN = function(jj) { [18:41:50.634] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.634] ...future.FUN(...future.X_jj, ...) [18:41:50.634] }) [18:41:50.634] } [18:41:50.634] }, args = future.call.arguments) [18:41:50.634] } [18:41:50.634] }, immediateCondition = function(cond) { [18:41:50.634] sendCondition <- ...future.makeSendCondition() [18:41:50.634] sendCondition(cond) [18:41:50.634] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.634] { [18:41:50.634] inherits <- base::inherits [18:41:50.634] invokeRestart <- base::invokeRestart [18:41:50.634] is.null <- base::is.null [18:41:50.634] muffled <- FALSE [18:41:50.634] if (inherits(cond, "message")) { [18:41:50.634] muffled <- grepl(pattern, "muffleMessage") [18:41:50.634] if (muffled) [18:41:50.634] invokeRestart("muffleMessage") [18:41:50.634] } [18:41:50.634] else if (inherits(cond, "warning")) { [18:41:50.634] muffled <- grepl(pattern, "muffleWarning") [18:41:50.634] if (muffled) [18:41:50.634] invokeRestart("muffleWarning") [18:41:50.634] } [18:41:50.634] else if (inherits(cond, "condition")) { [18:41:50.634] if (!is.null(pattern)) { [18:41:50.634] computeRestarts <- base::computeRestarts [18:41:50.634] grepl <- base::grepl [18:41:50.634] restarts <- computeRestarts(cond) [18:41:50.634] for (restart in restarts) { [18:41:50.634] name <- restart$name [18:41:50.634] if (is.null(name)) [18:41:50.634] next [18:41:50.634] if (!grepl(pattern, name)) [18:41:50.634] next [18:41:50.634] invokeRestart(restart) [18:41:50.634] muffled <- TRUE [18:41:50.634] break [18:41:50.634] } [18:41:50.634] } [18:41:50.634] } [18:41:50.634] invisible(muffled) [18:41:50.634] } [18:41:50.634] muffleCondition(cond) [18:41:50.634] }) [18:41:50.634] })) [18:41:50.634] future::FutureResult(value = ...future.value$value, [18:41:50.634] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.634] ...future.rng), globalenv = if (FALSE) [18:41:50.634] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.634] ...future.globalenv.names)) [18:41:50.634] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.634] }, condition = base::local({ [18:41:50.634] c <- base::c [18:41:50.634] inherits <- base::inherits [18:41:50.634] invokeRestart <- base::invokeRestart [18:41:50.634] length <- base::length [18:41:50.634] list <- base::list [18:41:50.634] seq.int <- base::seq.int [18:41:50.634] signalCondition <- base::signalCondition [18:41:50.634] sys.calls <- base::sys.calls [18:41:50.634] `[[` <- base::`[[` [18:41:50.634] `+` <- base::`+` [18:41:50.634] `<<-` <- base::`<<-` [18:41:50.634] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.634] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.634] 3L)] [18:41:50.634] } [18:41:50.634] function(cond) { [18:41:50.634] is_error <- inherits(cond, "error") [18:41:50.634] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.634] NULL) [18:41:50.634] if (is_error) { [18:41:50.634] sessionInformation <- function() { [18:41:50.634] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.634] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.634] search = base::search(), system = base::Sys.info()) [18:41:50.634] } [18:41:50.634] ...future.conditions[[length(...future.conditions) + [18:41:50.634] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.634] cond$call), session = sessionInformation(), [18:41:50.634] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.634] signalCondition(cond) [18:41:50.634] } [18:41:50.634] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.634] "immediateCondition"))) { [18:41:50.634] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.634] ...future.conditions[[length(...future.conditions) + [18:41:50.634] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.634] if (TRUE && !signal) { [18:41:50.634] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.634] { [18:41:50.634] inherits <- base::inherits [18:41:50.634] invokeRestart <- base::invokeRestart [18:41:50.634] is.null <- base::is.null [18:41:50.634] muffled <- FALSE [18:41:50.634] if (inherits(cond, "message")) { [18:41:50.634] muffled <- grepl(pattern, "muffleMessage") [18:41:50.634] if (muffled) [18:41:50.634] invokeRestart("muffleMessage") [18:41:50.634] } [18:41:50.634] else if (inherits(cond, "warning")) { [18:41:50.634] muffled <- grepl(pattern, "muffleWarning") [18:41:50.634] if (muffled) [18:41:50.634] invokeRestart("muffleWarning") [18:41:50.634] } [18:41:50.634] else if (inherits(cond, "condition")) { [18:41:50.634] if (!is.null(pattern)) { [18:41:50.634] computeRestarts <- base::computeRestarts [18:41:50.634] grepl <- base::grepl [18:41:50.634] restarts <- computeRestarts(cond) [18:41:50.634] for (restart in restarts) { [18:41:50.634] name <- restart$name [18:41:50.634] if (is.null(name)) [18:41:50.634] next [18:41:50.634] if (!grepl(pattern, name)) [18:41:50.634] next [18:41:50.634] invokeRestart(restart) [18:41:50.634] muffled <- TRUE [18:41:50.634] break [18:41:50.634] } [18:41:50.634] } [18:41:50.634] } [18:41:50.634] invisible(muffled) [18:41:50.634] } [18:41:50.634] muffleCondition(cond, pattern = "^muffle") [18:41:50.634] } [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] if (TRUE) { [18:41:50.634] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.634] { [18:41:50.634] inherits <- base::inherits [18:41:50.634] invokeRestart <- base::invokeRestart [18:41:50.634] is.null <- base::is.null [18:41:50.634] muffled <- FALSE [18:41:50.634] if (inherits(cond, "message")) { [18:41:50.634] muffled <- grepl(pattern, "muffleMessage") [18:41:50.634] if (muffled) [18:41:50.634] invokeRestart("muffleMessage") [18:41:50.634] } [18:41:50.634] else if (inherits(cond, "warning")) { [18:41:50.634] muffled <- grepl(pattern, "muffleWarning") [18:41:50.634] if (muffled) [18:41:50.634] invokeRestart("muffleWarning") [18:41:50.634] } [18:41:50.634] else if (inherits(cond, "condition")) { [18:41:50.634] if (!is.null(pattern)) { [18:41:50.634] computeRestarts <- base::computeRestarts [18:41:50.634] grepl <- base::grepl [18:41:50.634] restarts <- computeRestarts(cond) [18:41:50.634] for (restart in restarts) { [18:41:50.634] name <- restart$name [18:41:50.634] if (is.null(name)) [18:41:50.634] next [18:41:50.634] if (!grepl(pattern, name)) [18:41:50.634] next [18:41:50.634] invokeRestart(restart) [18:41:50.634] muffled <- TRUE [18:41:50.634] break [18:41:50.634] } [18:41:50.634] } [18:41:50.634] } [18:41:50.634] invisible(muffled) [18:41:50.634] } [18:41:50.634] muffleCondition(cond, pattern = "^muffle") [18:41:50.634] } [18:41:50.634] } [18:41:50.634] } [18:41:50.634] })) [18:41:50.634] }, error = function(ex) { [18:41:50.634] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.634] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.634] ...future.rng), started = ...future.startTime, [18:41:50.634] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.634] version = "1.8"), class = "FutureResult") [18:41:50.634] }, finally = { [18:41:50.634] if (!identical(...future.workdir, getwd())) [18:41:50.634] setwd(...future.workdir) [18:41:50.634] { [18:41:50.634] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.634] ...future.oldOptions$nwarnings <- NULL [18:41:50.634] } [18:41:50.634] base::options(...future.oldOptions) [18:41:50.634] if (.Platform$OS.type == "windows") { [18:41:50.634] old_names <- names(...future.oldEnvVars) [18:41:50.634] envs <- base::Sys.getenv() [18:41:50.634] names <- names(envs) [18:41:50.634] common <- intersect(names, old_names) [18:41:50.634] added <- setdiff(names, old_names) [18:41:50.634] removed <- setdiff(old_names, names) [18:41:50.634] changed <- common[...future.oldEnvVars[common] != [18:41:50.634] envs[common]] [18:41:50.634] NAMES <- toupper(changed) [18:41:50.634] args <- list() [18:41:50.634] for (kk in seq_along(NAMES)) { [18:41:50.634] name <- changed[[kk]] [18:41:50.634] NAME <- NAMES[[kk]] [18:41:50.634] if (name != NAME && is.element(NAME, old_names)) [18:41:50.634] next [18:41:50.634] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.634] } [18:41:50.634] NAMES <- toupper(added) [18:41:50.634] for (kk in seq_along(NAMES)) { [18:41:50.634] name <- added[[kk]] [18:41:50.634] NAME <- NAMES[[kk]] [18:41:50.634] if (name != NAME && is.element(NAME, old_names)) [18:41:50.634] next [18:41:50.634] args[[name]] <- "" [18:41:50.634] } [18:41:50.634] NAMES <- toupper(removed) [18:41:50.634] for (kk in seq_along(NAMES)) { [18:41:50.634] name <- removed[[kk]] [18:41:50.634] NAME <- NAMES[[kk]] [18:41:50.634] if (name != NAME && is.element(NAME, old_names)) [18:41:50.634] next [18:41:50.634] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.634] } [18:41:50.634] if (length(args) > 0) [18:41:50.634] base::do.call(base::Sys.setenv, args = args) [18:41:50.634] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.634] } [18:41:50.634] { [18:41:50.634] if (base::length(...future.futureOptionsAdded) > [18:41:50.634] 0L) { [18:41:50.634] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.634] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.634] base::options(opts) [18:41:50.634] } [18:41:50.634] { [18:41:50.634] { [18:41:50.634] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.634] NULL [18:41:50.634] } [18:41:50.634] options(future.plan = NULL) [18:41:50.634] if (is.na(NA_character_)) [18:41:50.634] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.634] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.634] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.634] .init = FALSE) [18:41:50.634] } [18:41:50.634] } [18:41:50.634] } [18:41:50.634] }) [18:41:50.634] if (TRUE) { [18:41:50.634] base::sink(type = "output", split = FALSE) [18:41:50.634] if (TRUE) { [18:41:50.634] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.634] } [18:41:50.634] else { [18:41:50.634] ...future.result["stdout"] <- base::list(NULL) [18:41:50.634] } [18:41:50.634] base::close(...future.stdout) [18:41:50.634] ...future.stdout <- NULL [18:41:50.634] } [18:41:50.634] ...future.result$conditions <- ...future.conditions [18:41:50.634] ...future.result$finished <- base::Sys.time() [18:41:50.634] ...future.result [18:41:50.634] } [18:41:50.639] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:50.639] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:50.639] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:50.639] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.640] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.640] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.640] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.641] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.641] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.641] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.641] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.642] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:50.642] MultisessionFuture started [18:41:50.642] - Launch lazy future ... done [18:41:50.642] run() for 'MultisessionFuture' ... done [18:41:50.643] Created future: [18:41:50.656] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.657] - Validating connection of MultisessionFuture [18:41:50.657] - received message: FutureResult [18:41:50.657] - Received FutureResult [18:41:50.657] - Erased future from FutureRegistry [18:41:50.657] result() for ClusterFuture ... [18:41:50.658] - result already collected: FutureResult [18:41:50.658] result() for ClusterFuture ... done [18:41:50.658] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.643] MultisessionFuture: [18:41:50.643] Label: 'future_sapply-1' [18:41:50.643] Expression: [18:41:50.643] { [18:41:50.643] do.call(function(...) { [18:41:50.643] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.643] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.643] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.643] on.exit(options(oopts), add = TRUE) [18:41:50.643] } [18:41:50.643] { [18:41:50.643] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.643] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.643] ...future.FUN(...future.X_jj, ...) [18:41:50.643] }) [18:41:50.643] } [18:41:50.643] }, args = future.call.arguments) [18:41:50.643] } [18:41:50.643] Lazy evaluation: FALSE [18:41:50.643] Asynchronous evaluation: TRUE [18:41:50.643] Local evaluation: TRUE [18:41:50.643] Environment: R_GlobalEnv [18:41:50.643] Capture standard output: TRUE [18:41:50.643] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.643] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.643] Packages: [18:41:50.643] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.643] Resolved: TRUE [18:41:50.643] Value: [18:41:50.643] Conditions captured: [18:41:50.643] Early signaling: FALSE [18:41:50.643] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.643] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.658] Chunk #1 of 2 ... DONE [18:41:50.658] Chunk #2 of 2 ... [18:41:50.658] - Finding globals in 'X' for chunk #2 ... [18:41:50.659] getGlobalsAndPackages() ... [18:41:50.659] Searching for globals... [18:41:50.659] [18:41:50.659] Searching for globals ... DONE [18:41:50.659] - globals: [0] [18:41:50.659] getGlobalsAndPackages() ... DONE [18:41:50.659] + additional globals found: [n=0] [18:41:50.660] + additional namespaces needed: [n=0] [18:41:50.660] - Finding globals in 'X' for chunk #2 ... DONE [18:41:50.660] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.660] - seeds: [18:41:50.660] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.660] getGlobalsAndPackages() ... [18:41:50.661] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.661] Resolving globals: FALSE [18:41:50.661] Tweak future expression to call with '...' arguments ... [18:41:50.661] { [18:41:50.661] do.call(function(...) { [18:41:50.661] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.661] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.661] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.661] on.exit(options(oopts), add = TRUE) [18:41:50.661] } [18:41:50.661] { [18:41:50.661] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.661] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.661] ...future.FUN(...future.X_jj, ...) [18:41:50.661] }) [18:41:50.661] } [18:41:50.661] }, args = future.call.arguments) [18:41:50.661] } [18:41:50.661] Tweak future expression to call with '...' arguments ... DONE [18:41:50.662] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.662] [18:41:50.662] getGlobalsAndPackages() ... DONE [18:41:50.663] run() for 'Future' ... [18:41:50.663] - state: 'created' [18:41:50.663] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.675] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.675] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.675] - Field: 'node' [18:41:50.675] - Field: 'label' [18:41:50.676] - Field: 'local' [18:41:50.676] - Field: 'owner' [18:41:50.676] - Field: 'envir' [18:41:50.676] - Field: 'workers' [18:41:50.676] - Field: 'packages' [18:41:50.676] - Field: 'gc' [18:41:50.676] - Field: 'conditions' [18:41:50.677] - Field: 'persistent' [18:41:50.677] - Field: 'expr' [18:41:50.677] - Field: 'uuid' [18:41:50.677] - Field: 'seed' [18:41:50.677] - Field: 'version' [18:41:50.677] - Field: 'result' [18:41:50.678] - Field: 'asynchronous' [18:41:50.678] - Field: 'calls' [18:41:50.678] - Field: 'globals' [18:41:50.678] - Field: 'stdout' [18:41:50.678] - Field: 'earlySignal' [18:41:50.678] - Field: 'lazy' [18:41:50.678] - Field: 'state' [18:41:50.679] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.679] - Launch lazy future ... [18:41:50.679] Packages needed by the future expression (n = 0): [18:41:50.679] Packages needed by future strategies (n = 0): [18:41:50.680] { [18:41:50.680] { [18:41:50.680] { [18:41:50.680] ...future.startTime <- base::Sys.time() [18:41:50.680] { [18:41:50.680] { [18:41:50.680] { [18:41:50.680] { [18:41:50.680] base::local({ [18:41:50.680] has_future <- base::requireNamespace("future", [18:41:50.680] quietly = TRUE) [18:41:50.680] if (has_future) { [18:41:50.680] ns <- base::getNamespace("future") [18:41:50.680] version <- ns[[".package"]][["version"]] [18:41:50.680] if (is.null(version)) [18:41:50.680] version <- utils::packageVersion("future") [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] version <- NULL [18:41:50.680] } [18:41:50.680] if (!has_future || version < "1.8.0") { [18:41:50.680] info <- base::c(r_version = base::gsub("R version ", [18:41:50.680] "", base::R.version$version.string), [18:41:50.680] platform = base::sprintf("%s (%s-bit)", [18:41:50.680] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.680] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.680] "release", "version")], collapse = " "), [18:41:50.680] hostname = base::Sys.info()[["nodename"]]) [18:41:50.680] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.680] info) [18:41:50.680] info <- base::paste(info, collapse = "; ") [18:41:50.680] if (!has_future) { [18:41:50.680] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.680] info) [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.680] info, version) [18:41:50.680] } [18:41:50.680] base::stop(msg) [18:41:50.680] } [18:41:50.680] }) [18:41:50.680] } [18:41:50.680] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.680] base::options(mc.cores = 1L) [18:41:50.680] } [18:41:50.680] ...future.strategy.old <- future::plan("list") [18:41:50.680] options(future.plan = NULL) [18:41:50.680] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.680] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.680] } [18:41:50.680] ...future.workdir <- getwd() [18:41:50.680] } [18:41:50.680] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.680] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.680] } [18:41:50.680] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.680] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.680] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.680] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.680] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.680] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.680] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.680] base::names(...future.oldOptions)) [18:41:50.680] } [18:41:50.680] if (FALSE) { [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] if (TRUE) { [18:41:50.680] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.680] open = "w") [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.680] windows = "NUL", "/dev/null"), open = "w") [18:41:50.680] } [18:41:50.680] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.680] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.680] base::sink(type = "output", split = FALSE) [18:41:50.680] base::close(...future.stdout) [18:41:50.680] }, add = TRUE) [18:41:50.680] } [18:41:50.680] ...future.frame <- base::sys.nframe() [18:41:50.680] ...future.conditions <- base::list() [18:41:50.680] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.680] if (FALSE) { [18:41:50.680] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.680] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.680] } [18:41:50.680] ...future.result <- base::tryCatch({ [18:41:50.680] base::withCallingHandlers({ [18:41:50.680] ...future.value <- base::withVisible(base::local({ [18:41:50.680] ...future.makeSendCondition <- base::local({ [18:41:50.680] sendCondition <- NULL [18:41:50.680] function(frame = 1L) { [18:41:50.680] if (is.function(sendCondition)) [18:41:50.680] return(sendCondition) [18:41:50.680] ns <- getNamespace("parallel") [18:41:50.680] if (exists("sendData", mode = "function", [18:41:50.680] envir = ns)) { [18:41:50.680] parallel_sendData <- get("sendData", mode = "function", [18:41:50.680] envir = ns) [18:41:50.680] envir <- sys.frame(frame) [18:41:50.680] master <- NULL [18:41:50.680] while (!identical(envir, .GlobalEnv) && [18:41:50.680] !identical(envir, emptyenv())) { [18:41:50.680] if (exists("master", mode = "list", envir = envir, [18:41:50.680] inherits = FALSE)) { [18:41:50.680] master <- get("master", mode = "list", [18:41:50.680] envir = envir, inherits = FALSE) [18:41:50.680] if (inherits(master, c("SOCKnode", [18:41:50.680] "SOCK0node"))) { [18:41:50.680] sendCondition <<- function(cond) { [18:41:50.680] data <- list(type = "VALUE", value = cond, [18:41:50.680] success = TRUE) [18:41:50.680] parallel_sendData(master, data) [18:41:50.680] } [18:41:50.680] return(sendCondition) [18:41:50.680] } [18:41:50.680] } [18:41:50.680] frame <- frame + 1L [18:41:50.680] envir <- sys.frame(frame) [18:41:50.680] } [18:41:50.680] } [18:41:50.680] sendCondition <<- function(cond) NULL [18:41:50.680] } [18:41:50.680] }) [18:41:50.680] withCallingHandlers({ [18:41:50.680] { [18:41:50.680] do.call(function(...) { [18:41:50.680] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.680] if (!identical(...future.globals.maxSize.org, [18:41:50.680] ...future.globals.maxSize)) { [18:41:50.680] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.680] on.exit(options(oopts), add = TRUE) [18:41:50.680] } [18:41:50.680] { [18:41:50.680] lapply(seq_along(...future.elements_ii), [18:41:50.680] FUN = function(jj) { [18:41:50.680] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.680] ...future.FUN(...future.X_jj, ...) [18:41:50.680] }) [18:41:50.680] } [18:41:50.680] }, args = future.call.arguments) [18:41:50.680] } [18:41:50.680] }, immediateCondition = function(cond) { [18:41:50.680] sendCondition <- ...future.makeSendCondition() [18:41:50.680] sendCondition(cond) [18:41:50.680] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.680] { [18:41:50.680] inherits <- base::inherits [18:41:50.680] invokeRestart <- base::invokeRestart [18:41:50.680] is.null <- base::is.null [18:41:50.680] muffled <- FALSE [18:41:50.680] if (inherits(cond, "message")) { [18:41:50.680] muffled <- grepl(pattern, "muffleMessage") [18:41:50.680] if (muffled) [18:41:50.680] invokeRestart("muffleMessage") [18:41:50.680] } [18:41:50.680] else if (inherits(cond, "warning")) { [18:41:50.680] muffled <- grepl(pattern, "muffleWarning") [18:41:50.680] if (muffled) [18:41:50.680] invokeRestart("muffleWarning") [18:41:50.680] } [18:41:50.680] else if (inherits(cond, "condition")) { [18:41:50.680] if (!is.null(pattern)) { [18:41:50.680] computeRestarts <- base::computeRestarts [18:41:50.680] grepl <- base::grepl [18:41:50.680] restarts <- computeRestarts(cond) [18:41:50.680] for (restart in restarts) { [18:41:50.680] name <- restart$name [18:41:50.680] if (is.null(name)) [18:41:50.680] next [18:41:50.680] if (!grepl(pattern, name)) [18:41:50.680] next [18:41:50.680] invokeRestart(restart) [18:41:50.680] muffled <- TRUE [18:41:50.680] break [18:41:50.680] } [18:41:50.680] } [18:41:50.680] } [18:41:50.680] invisible(muffled) [18:41:50.680] } [18:41:50.680] muffleCondition(cond) [18:41:50.680] }) [18:41:50.680] })) [18:41:50.680] future::FutureResult(value = ...future.value$value, [18:41:50.680] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.680] ...future.rng), globalenv = if (FALSE) [18:41:50.680] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.680] ...future.globalenv.names)) [18:41:50.680] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.680] }, condition = base::local({ [18:41:50.680] c <- base::c [18:41:50.680] inherits <- base::inherits [18:41:50.680] invokeRestart <- base::invokeRestart [18:41:50.680] length <- base::length [18:41:50.680] list <- base::list [18:41:50.680] seq.int <- base::seq.int [18:41:50.680] signalCondition <- base::signalCondition [18:41:50.680] sys.calls <- base::sys.calls [18:41:50.680] `[[` <- base::`[[` [18:41:50.680] `+` <- base::`+` [18:41:50.680] `<<-` <- base::`<<-` [18:41:50.680] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.680] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.680] 3L)] [18:41:50.680] } [18:41:50.680] function(cond) { [18:41:50.680] is_error <- inherits(cond, "error") [18:41:50.680] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.680] NULL) [18:41:50.680] if (is_error) { [18:41:50.680] sessionInformation <- function() { [18:41:50.680] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.680] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.680] search = base::search(), system = base::Sys.info()) [18:41:50.680] } [18:41:50.680] ...future.conditions[[length(...future.conditions) + [18:41:50.680] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.680] cond$call), session = sessionInformation(), [18:41:50.680] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.680] signalCondition(cond) [18:41:50.680] } [18:41:50.680] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.680] "immediateCondition"))) { [18:41:50.680] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.680] ...future.conditions[[length(...future.conditions) + [18:41:50.680] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.680] if (TRUE && !signal) { [18:41:50.680] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.680] { [18:41:50.680] inherits <- base::inherits [18:41:50.680] invokeRestart <- base::invokeRestart [18:41:50.680] is.null <- base::is.null [18:41:50.680] muffled <- FALSE [18:41:50.680] if (inherits(cond, "message")) { [18:41:50.680] muffled <- grepl(pattern, "muffleMessage") [18:41:50.680] if (muffled) [18:41:50.680] invokeRestart("muffleMessage") [18:41:50.680] } [18:41:50.680] else if (inherits(cond, "warning")) { [18:41:50.680] muffled <- grepl(pattern, "muffleWarning") [18:41:50.680] if (muffled) [18:41:50.680] invokeRestart("muffleWarning") [18:41:50.680] } [18:41:50.680] else if (inherits(cond, "condition")) { [18:41:50.680] if (!is.null(pattern)) { [18:41:50.680] computeRestarts <- base::computeRestarts [18:41:50.680] grepl <- base::grepl [18:41:50.680] restarts <- computeRestarts(cond) [18:41:50.680] for (restart in restarts) { [18:41:50.680] name <- restart$name [18:41:50.680] if (is.null(name)) [18:41:50.680] next [18:41:50.680] if (!grepl(pattern, name)) [18:41:50.680] next [18:41:50.680] invokeRestart(restart) [18:41:50.680] muffled <- TRUE [18:41:50.680] break [18:41:50.680] } [18:41:50.680] } [18:41:50.680] } [18:41:50.680] invisible(muffled) [18:41:50.680] } [18:41:50.680] muffleCondition(cond, pattern = "^muffle") [18:41:50.680] } [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] if (TRUE) { [18:41:50.680] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.680] { [18:41:50.680] inherits <- base::inherits [18:41:50.680] invokeRestart <- base::invokeRestart [18:41:50.680] is.null <- base::is.null [18:41:50.680] muffled <- FALSE [18:41:50.680] if (inherits(cond, "message")) { [18:41:50.680] muffled <- grepl(pattern, "muffleMessage") [18:41:50.680] if (muffled) [18:41:50.680] invokeRestart("muffleMessage") [18:41:50.680] } [18:41:50.680] else if (inherits(cond, "warning")) { [18:41:50.680] muffled <- grepl(pattern, "muffleWarning") [18:41:50.680] if (muffled) [18:41:50.680] invokeRestart("muffleWarning") [18:41:50.680] } [18:41:50.680] else if (inherits(cond, "condition")) { [18:41:50.680] if (!is.null(pattern)) { [18:41:50.680] computeRestarts <- base::computeRestarts [18:41:50.680] grepl <- base::grepl [18:41:50.680] restarts <- computeRestarts(cond) [18:41:50.680] for (restart in restarts) { [18:41:50.680] name <- restart$name [18:41:50.680] if (is.null(name)) [18:41:50.680] next [18:41:50.680] if (!grepl(pattern, name)) [18:41:50.680] next [18:41:50.680] invokeRestart(restart) [18:41:50.680] muffled <- TRUE [18:41:50.680] break [18:41:50.680] } [18:41:50.680] } [18:41:50.680] } [18:41:50.680] invisible(muffled) [18:41:50.680] } [18:41:50.680] muffleCondition(cond, pattern = "^muffle") [18:41:50.680] } [18:41:50.680] } [18:41:50.680] } [18:41:50.680] })) [18:41:50.680] }, error = function(ex) { [18:41:50.680] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.680] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.680] ...future.rng), started = ...future.startTime, [18:41:50.680] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.680] version = "1.8"), class = "FutureResult") [18:41:50.680] }, finally = { [18:41:50.680] if (!identical(...future.workdir, getwd())) [18:41:50.680] setwd(...future.workdir) [18:41:50.680] { [18:41:50.680] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.680] ...future.oldOptions$nwarnings <- NULL [18:41:50.680] } [18:41:50.680] base::options(...future.oldOptions) [18:41:50.680] if (.Platform$OS.type == "windows") { [18:41:50.680] old_names <- names(...future.oldEnvVars) [18:41:50.680] envs <- base::Sys.getenv() [18:41:50.680] names <- names(envs) [18:41:50.680] common <- intersect(names, old_names) [18:41:50.680] added <- setdiff(names, old_names) [18:41:50.680] removed <- setdiff(old_names, names) [18:41:50.680] changed <- common[...future.oldEnvVars[common] != [18:41:50.680] envs[common]] [18:41:50.680] NAMES <- toupper(changed) [18:41:50.680] args <- list() [18:41:50.680] for (kk in seq_along(NAMES)) { [18:41:50.680] name <- changed[[kk]] [18:41:50.680] NAME <- NAMES[[kk]] [18:41:50.680] if (name != NAME && is.element(NAME, old_names)) [18:41:50.680] next [18:41:50.680] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.680] } [18:41:50.680] NAMES <- toupper(added) [18:41:50.680] for (kk in seq_along(NAMES)) { [18:41:50.680] name <- added[[kk]] [18:41:50.680] NAME <- NAMES[[kk]] [18:41:50.680] if (name != NAME && is.element(NAME, old_names)) [18:41:50.680] next [18:41:50.680] args[[name]] <- "" [18:41:50.680] } [18:41:50.680] NAMES <- toupper(removed) [18:41:50.680] for (kk in seq_along(NAMES)) { [18:41:50.680] name <- removed[[kk]] [18:41:50.680] NAME <- NAMES[[kk]] [18:41:50.680] if (name != NAME && is.element(NAME, old_names)) [18:41:50.680] next [18:41:50.680] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.680] } [18:41:50.680] if (length(args) > 0) [18:41:50.680] base::do.call(base::Sys.setenv, args = args) [18:41:50.680] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.680] } [18:41:50.680] { [18:41:50.680] if (base::length(...future.futureOptionsAdded) > [18:41:50.680] 0L) { [18:41:50.680] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.680] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.680] base::options(opts) [18:41:50.680] } [18:41:50.680] { [18:41:50.680] { [18:41:50.680] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.680] NULL [18:41:50.680] } [18:41:50.680] options(future.plan = NULL) [18:41:50.680] if (is.na(NA_character_)) [18:41:50.680] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.680] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.680] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.680] .init = FALSE) [18:41:50.680] } [18:41:50.680] } [18:41:50.680] } [18:41:50.680] }) [18:41:50.680] if (TRUE) { [18:41:50.680] base::sink(type = "output", split = FALSE) [18:41:50.680] if (TRUE) { [18:41:50.680] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.680] } [18:41:50.680] else { [18:41:50.680] ...future.result["stdout"] <- base::list(NULL) [18:41:50.680] } [18:41:50.680] base::close(...future.stdout) [18:41:50.680] ...future.stdout <- NULL [18:41:50.680] } [18:41:50.680] ...future.result$conditions <- ...future.conditions [18:41:50.680] ...future.result$finished <- base::Sys.time() [18:41:50.680] ...future.result [18:41:50.680] } [18:41:50.684] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:50.684] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:50.684] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:50.685] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.685] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.685] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.686] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.686] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.686] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.686] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.687] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.687] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:50.687] MultisessionFuture started [18:41:50.687] - Launch lazy future ... done [18:41:50.688] run() for 'MultisessionFuture' ... done [18:41:50.688] Created future: [18:41:50.702] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.702] - Validating connection of MultisessionFuture [18:41:50.703] - received message: FutureResult [18:41:50.703] - Received FutureResult [18:41:50.703] - Erased future from FutureRegistry [18:41:50.703] result() for ClusterFuture ... [18:41:50.703] - result already collected: FutureResult [18:41:50.703] result() for ClusterFuture ... done [18:41:50.704] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.688] MultisessionFuture: [18:41:50.688] Label: 'future_sapply-2' [18:41:50.688] Expression: [18:41:50.688] { [18:41:50.688] do.call(function(...) { [18:41:50.688] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.688] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.688] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.688] on.exit(options(oopts), add = TRUE) [18:41:50.688] } [18:41:50.688] { [18:41:50.688] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.688] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.688] ...future.FUN(...future.X_jj, ...) [18:41:50.688] }) [18:41:50.688] } [18:41:50.688] }, args = future.call.arguments) [18:41:50.688] } [18:41:50.688] Lazy evaluation: FALSE [18:41:50.688] Asynchronous evaluation: TRUE [18:41:50.688] Local evaluation: TRUE [18:41:50.688] Environment: R_GlobalEnv [18:41:50.688] Capture standard output: TRUE [18:41:50.688] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.688] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.688] Packages: [18:41:50.688] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.688] Resolved: TRUE [18:41:50.688] Value: [18:41:50.688] Conditions captured: [18:41:50.688] Early signaling: FALSE [18:41:50.688] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.688] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.704] Chunk #2 of 2 ... DONE [18:41:50.704] Launching 2 futures (chunks) ... DONE [18:41:50.704] Resolving 2 futures (chunks) ... [18:41:50.705] resolve() on list ... [18:41:50.705] recursive: 0 [18:41:50.705] length: 2 [18:41:50.705] [18:41:50.705] Future #1 [18:41:50.705] result() for ClusterFuture ... [18:41:50.706] - result already collected: FutureResult [18:41:50.706] result() for ClusterFuture ... done [18:41:50.706] result() for ClusterFuture ... [18:41:50.706] - result already collected: FutureResult [18:41:50.706] result() for ClusterFuture ... done [18:41:50.706] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:50.706] - nx: 2 [18:41:50.707] - relay: TRUE [18:41:50.707] - stdout: TRUE [18:41:50.707] - signal: TRUE [18:41:50.707] - resignal: FALSE [18:41:50.707] - force: TRUE [18:41:50.707] - relayed: [n=2] FALSE, FALSE [18:41:50.708] - queued futures: [n=2] FALSE, FALSE [18:41:50.708] - until=1 [18:41:50.708] - relaying element #1 [18:41:50.708] result() for ClusterFuture ... [18:41:50.708] - result already collected: FutureResult [18:41:50.708] result() for ClusterFuture ... done [18:41:50.709] result() for ClusterFuture ... [18:41:50.709] - result already collected: FutureResult [18:41:50.709] result() for ClusterFuture ... done [18:41:50.709] result() for ClusterFuture ... [18:41:50.709] - result already collected: FutureResult [18:41:50.709] result() for ClusterFuture ... done [18:41:50.710] result() for ClusterFuture ... [18:41:50.710] - result already collected: FutureResult [18:41:50.710] result() for ClusterFuture ... done [18:41:50.710] - relayed: [n=2] TRUE, FALSE [18:41:50.710] - queued futures: [n=2] TRUE, FALSE [18:41:50.710] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:50.710] length: 1 (resolved future 1) [18:41:50.711] Future #2 [18:41:50.711] result() for ClusterFuture ... [18:41:50.711] - result already collected: FutureResult [18:41:50.711] result() for ClusterFuture ... done [18:41:50.711] result() for ClusterFuture ... [18:41:50.711] - result already collected: FutureResult [18:41:50.712] result() for ClusterFuture ... done [18:41:50.712] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:50.712] - nx: 2 [18:41:50.712] - relay: TRUE [18:41:50.712] - stdout: TRUE [18:41:50.712] - signal: TRUE [18:41:50.713] - resignal: FALSE [18:41:50.713] - force: TRUE [18:41:50.713] - relayed: [n=2] TRUE, FALSE [18:41:50.713] - queued futures: [n=2] TRUE, FALSE [18:41:50.713] - until=2 [18:41:50.713] - relaying element #2 [18:41:50.713] result() for ClusterFuture ... [18:41:50.714] - result already collected: FutureResult [18:41:50.714] result() for ClusterFuture ... done [18:41:50.714] result() for ClusterFuture ... [18:41:50.714] - result already collected: FutureResult [18:41:50.714] result() for ClusterFuture ... done [18:41:50.714] result() for ClusterFuture ... [18:41:50.715] - result already collected: FutureResult [18:41:50.715] result() for ClusterFuture ... done [18:41:50.715] result() for ClusterFuture ... [18:41:50.715] - result already collected: FutureResult [18:41:50.715] result() for ClusterFuture ... done [18:41:50.715] - relayed: [n=2] TRUE, TRUE [18:41:50.718] - queued futures: [n=2] TRUE, TRUE [18:41:50.718] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:50.719] length: 0 (resolved future 2) [18:41:50.719] Relaying remaining futures [18:41:50.719] signalConditionsASAP(NULL, pos=0) ... [18:41:50.719] - nx: 2 [18:41:50.719] - relay: TRUE [18:41:50.720] - stdout: TRUE [18:41:50.720] - signal: TRUE [18:41:50.720] - resignal: FALSE [18:41:50.720] - force: TRUE [18:41:50.720] - relayed: [n=2] TRUE, TRUE [18:41:50.720] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:50.721] - relayed: [n=2] TRUE, TRUE [18:41:50.721] - queued futures: [n=2] TRUE, TRUE [18:41:50.721] signalConditionsASAP(NULL, pos=0) ... done [18:41:50.721] resolve() on list ... DONE [18:41:50.721] result() for ClusterFuture ... [18:41:50.721] - result already collected: FutureResult [18:41:50.721] result() for ClusterFuture ... done [18:41:50.722] result() for ClusterFuture ... [18:41:50.722] - result already collected: FutureResult [18:41:50.722] result() for ClusterFuture ... done [18:41:50.722] result() for ClusterFuture ... [18:41:50.722] - result already collected: FutureResult [18:41:50.722] result() for ClusterFuture ... done [18:41:50.723] result() for ClusterFuture ... [18:41:50.723] - result already collected: FutureResult [18:41:50.723] result() for ClusterFuture ... done [18:41:50.723] - Number of value chunks collected: 2 [18:41:50.723] Resolving 2 futures (chunks) ... DONE [18:41:50.723] Reducing values from 2 chunks ... [18:41:50.724] - Number of values collected after concatenation: 6 [18:41:50.724] - Number of values expected: 6 [18:41:50.724] Reducing values from 2 chunks ... DONE [18:41:50.724] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:50.726] future_lapply() ... [18:41:50.729] Number of chunks: 2 [18:41:50.730] getGlobalsAndPackagesXApply() ... [18:41:50.730] - future.globals: TRUE [18:41:50.730] getGlobalsAndPackages() ... [18:41:50.730] Searching for globals... [18:41:50.732] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:50.732] Searching for globals ... DONE [18:41:50.732] Resolving globals: FALSE [18:41:50.733] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:50.733] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:50.733] - globals: [1] 'FUN' [18:41:50.734] [18:41:50.734] getGlobalsAndPackages() ... DONE [18:41:50.734] - globals found/used: [n=1] 'FUN' [18:41:50.734] - needed namespaces: [n=0] [18:41:50.734] Finding globals ... DONE [18:41:50.734] - use_args: TRUE [18:41:50.735] - Getting '...' globals ... [18:41:50.735] resolve() on list ... [18:41:50.735] recursive: 0 [18:41:50.735] length: 1 [18:41:50.735] elements: '...' [18:41:50.736] length: 0 (resolved future 1) [18:41:50.736] resolve() on list ... DONE [18:41:50.736] - '...' content: [n=0] [18:41:50.736] List of 1 [18:41:50.736] $ ...: list() [18:41:50.736] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.736] - attr(*, "where")=List of 1 [18:41:50.736] ..$ ...: [18:41:50.736] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.736] - attr(*, "resolved")= logi TRUE [18:41:50.736] - attr(*, "total_size")= num NA [18:41:50.739] - Getting '...' globals ... DONE [18:41:50.739] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:50.740] List of 2 [18:41:50.740] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:50.740] $ ... : list() [18:41:50.740] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.740] - attr(*, "where")=List of 2 [18:41:50.740] ..$ ...future.FUN: [18:41:50.740] ..$ ... : [18:41:50.740] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.740] - attr(*, "resolved")= logi FALSE [18:41:50.740] - attr(*, "total_size")= int 6664 [18:41:50.743] Packages to be attached in all futures: [n=0] [18:41:50.743] getGlobalsAndPackagesXApply() ... DONE [18:41:50.743] Number of futures (= number of chunks): 2 [18:41:50.744] Launching 2 futures (chunks) ... [18:41:50.744] Chunk #1 of 2 ... [18:41:50.744] - Finding globals in 'X' for chunk #1 ... [18:41:50.744] getGlobalsAndPackages() ... [18:41:50.744] Searching for globals... [18:41:50.745] [18:41:50.745] Searching for globals ... DONE [18:41:50.745] - globals: [0] [18:41:50.745] getGlobalsAndPackages() ... DONE [18:41:50.745] + additional globals found: [n=0] [18:41:50.745] + additional namespaces needed: [n=0] [18:41:50.746] - Finding globals in 'X' for chunk #1 ... DONE [18:41:50.746] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.746] - seeds: [18:41:50.746] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.746] getGlobalsAndPackages() ... [18:41:50.746] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.747] Resolving globals: FALSE [18:41:50.747] Tweak future expression to call with '...' arguments ... [18:41:50.747] { [18:41:50.747] do.call(function(...) { [18:41:50.747] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.747] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.747] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.747] on.exit(options(oopts), add = TRUE) [18:41:50.747] } [18:41:50.747] { [18:41:50.747] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.747] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.747] ...future.FUN(...future.X_jj, ...) [18:41:50.747] }) [18:41:50.747] } [18:41:50.747] }, args = future.call.arguments) [18:41:50.747] } [18:41:50.747] Tweak future expression to call with '...' arguments ... DONE [18:41:50.748] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.748] [18:41:50.748] getGlobalsAndPackages() ... DONE [18:41:50.749] run() for 'Future' ... [18:41:50.749] - state: 'created' [18:41:50.749] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.766] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.766] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.767] - Field: 'node' [18:41:50.767] - Field: 'label' [18:41:50.767] - Field: 'local' [18:41:50.767] - Field: 'owner' [18:41:50.767] - Field: 'envir' [18:41:50.768] - Field: 'workers' [18:41:50.768] - Field: 'packages' [18:41:50.768] - Field: 'gc' [18:41:50.768] - Field: 'conditions' [18:41:50.768] - Field: 'persistent' [18:41:50.768] - Field: 'expr' [18:41:50.769] - Field: 'uuid' [18:41:50.769] - Field: 'seed' [18:41:50.769] - Field: 'version' [18:41:50.769] - Field: 'result' [18:41:50.769] - Field: 'asynchronous' [18:41:50.769] - Field: 'calls' [18:41:50.770] - Field: 'globals' [18:41:50.770] - Field: 'stdout' [18:41:50.770] - Field: 'earlySignal' [18:41:50.770] - Field: 'lazy' [18:41:50.770] - Field: 'state' [18:41:50.771] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.771] - Launch lazy future ... [18:41:50.771] Packages needed by the future expression (n = 0): [18:41:50.771] Packages needed by future strategies (n = 0): [18:41:50.772] { [18:41:50.772] { [18:41:50.772] { [18:41:50.772] ...future.startTime <- base::Sys.time() [18:41:50.772] { [18:41:50.772] { [18:41:50.772] { [18:41:50.772] { [18:41:50.772] base::local({ [18:41:50.772] has_future <- base::requireNamespace("future", [18:41:50.772] quietly = TRUE) [18:41:50.772] if (has_future) { [18:41:50.772] ns <- base::getNamespace("future") [18:41:50.772] version <- ns[[".package"]][["version"]] [18:41:50.772] if (is.null(version)) [18:41:50.772] version <- utils::packageVersion("future") [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] version <- NULL [18:41:50.772] } [18:41:50.772] if (!has_future || version < "1.8.0") { [18:41:50.772] info <- base::c(r_version = base::gsub("R version ", [18:41:50.772] "", base::R.version$version.string), [18:41:50.772] platform = base::sprintf("%s (%s-bit)", [18:41:50.772] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.772] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.772] "release", "version")], collapse = " "), [18:41:50.772] hostname = base::Sys.info()[["nodename"]]) [18:41:50.772] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.772] info) [18:41:50.772] info <- base::paste(info, collapse = "; ") [18:41:50.772] if (!has_future) { [18:41:50.772] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.772] info) [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.772] info, version) [18:41:50.772] } [18:41:50.772] base::stop(msg) [18:41:50.772] } [18:41:50.772] }) [18:41:50.772] } [18:41:50.772] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.772] base::options(mc.cores = 1L) [18:41:50.772] } [18:41:50.772] ...future.strategy.old <- future::plan("list") [18:41:50.772] options(future.plan = NULL) [18:41:50.772] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.772] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.772] } [18:41:50.772] ...future.workdir <- getwd() [18:41:50.772] } [18:41:50.772] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.772] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.772] } [18:41:50.772] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.772] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.772] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.772] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.772] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.772] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.772] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.772] base::names(...future.oldOptions)) [18:41:50.772] } [18:41:50.772] if (FALSE) { [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] if (TRUE) { [18:41:50.772] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.772] open = "w") [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.772] windows = "NUL", "/dev/null"), open = "w") [18:41:50.772] } [18:41:50.772] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.772] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.772] base::sink(type = "output", split = FALSE) [18:41:50.772] base::close(...future.stdout) [18:41:50.772] }, add = TRUE) [18:41:50.772] } [18:41:50.772] ...future.frame <- base::sys.nframe() [18:41:50.772] ...future.conditions <- base::list() [18:41:50.772] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.772] if (FALSE) { [18:41:50.772] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.772] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.772] } [18:41:50.772] ...future.result <- base::tryCatch({ [18:41:50.772] base::withCallingHandlers({ [18:41:50.772] ...future.value <- base::withVisible(base::local({ [18:41:50.772] ...future.makeSendCondition <- base::local({ [18:41:50.772] sendCondition <- NULL [18:41:50.772] function(frame = 1L) { [18:41:50.772] if (is.function(sendCondition)) [18:41:50.772] return(sendCondition) [18:41:50.772] ns <- getNamespace("parallel") [18:41:50.772] if (exists("sendData", mode = "function", [18:41:50.772] envir = ns)) { [18:41:50.772] parallel_sendData <- get("sendData", mode = "function", [18:41:50.772] envir = ns) [18:41:50.772] envir <- sys.frame(frame) [18:41:50.772] master <- NULL [18:41:50.772] while (!identical(envir, .GlobalEnv) && [18:41:50.772] !identical(envir, emptyenv())) { [18:41:50.772] if (exists("master", mode = "list", envir = envir, [18:41:50.772] inherits = FALSE)) { [18:41:50.772] master <- get("master", mode = "list", [18:41:50.772] envir = envir, inherits = FALSE) [18:41:50.772] if (inherits(master, c("SOCKnode", [18:41:50.772] "SOCK0node"))) { [18:41:50.772] sendCondition <<- function(cond) { [18:41:50.772] data <- list(type = "VALUE", value = cond, [18:41:50.772] success = TRUE) [18:41:50.772] parallel_sendData(master, data) [18:41:50.772] } [18:41:50.772] return(sendCondition) [18:41:50.772] } [18:41:50.772] } [18:41:50.772] frame <- frame + 1L [18:41:50.772] envir <- sys.frame(frame) [18:41:50.772] } [18:41:50.772] } [18:41:50.772] sendCondition <<- function(cond) NULL [18:41:50.772] } [18:41:50.772] }) [18:41:50.772] withCallingHandlers({ [18:41:50.772] { [18:41:50.772] do.call(function(...) { [18:41:50.772] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.772] if (!identical(...future.globals.maxSize.org, [18:41:50.772] ...future.globals.maxSize)) { [18:41:50.772] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.772] on.exit(options(oopts), add = TRUE) [18:41:50.772] } [18:41:50.772] { [18:41:50.772] lapply(seq_along(...future.elements_ii), [18:41:50.772] FUN = function(jj) { [18:41:50.772] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.772] ...future.FUN(...future.X_jj, ...) [18:41:50.772] }) [18:41:50.772] } [18:41:50.772] }, args = future.call.arguments) [18:41:50.772] } [18:41:50.772] }, immediateCondition = function(cond) { [18:41:50.772] sendCondition <- ...future.makeSendCondition() [18:41:50.772] sendCondition(cond) [18:41:50.772] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.772] { [18:41:50.772] inherits <- base::inherits [18:41:50.772] invokeRestart <- base::invokeRestart [18:41:50.772] is.null <- base::is.null [18:41:50.772] muffled <- FALSE [18:41:50.772] if (inherits(cond, "message")) { [18:41:50.772] muffled <- grepl(pattern, "muffleMessage") [18:41:50.772] if (muffled) [18:41:50.772] invokeRestart("muffleMessage") [18:41:50.772] } [18:41:50.772] else if (inherits(cond, "warning")) { [18:41:50.772] muffled <- grepl(pattern, "muffleWarning") [18:41:50.772] if (muffled) [18:41:50.772] invokeRestart("muffleWarning") [18:41:50.772] } [18:41:50.772] else if (inherits(cond, "condition")) { [18:41:50.772] if (!is.null(pattern)) { [18:41:50.772] computeRestarts <- base::computeRestarts [18:41:50.772] grepl <- base::grepl [18:41:50.772] restarts <- computeRestarts(cond) [18:41:50.772] for (restart in restarts) { [18:41:50.772] name <- restart$name [18:41:50.772] if (is.null(name)) [18:41:50.772] next [18:41:50.772] if (!grepl(pattern, name)) [18:41:50.772] next [18:41:50.772] invokeRestart(restart) [18:41:50.772] muffled <- TRUE [18:41:50.772] break [18:41:50.772] } [18:41:50.772] } [18:41:50.772] } [18:41:50.772] invisible(muffled) [18:41:50.772] } [18:41:50.772] muffleCondition(cond) [18:41:50.772] }) [18:41:50.772] })) [18:41:50.772] future::FutureResult(value = ...future.value$value, [18:41:50.772] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.772] ...future.rng), globalenv = if (FALSE) [18:41:50.772] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.772] ...future.globalenv.names)) [18:41:50.772] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.772] }, condition = base::local({ [18:41:50.772] c <- base::c [18:41:50.772] inherits <- base::inherits [18:41:50.772] invokeRestart <- base::invokeRestart [18:41:50.772] length <- base::length [18:41:50.772] list <- base::list [18:41:50.772] seq.int <- base::seq.int [18:41:50.772] signalCondition <- base::signalCondition [18:41:50.772] sys.calls <- base::sys.calls [18:41:50.772] `[[` <- base::`[[` [18:41:50.772] `+` <- base::`+` [18:41:50.772] `<<-` <- base::`<<-` [18:41:50.772] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.772] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.772] 3L)] [18:41:50.772] } [18:41:50.772] function(cond) { [18:41:50.772] is_error <- inherits(cond, "error") [18:41:50.772] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.772] NULL) [18:41:50.772] if (is_error) { [18:41:50.772] sessionInformation <- function() { [18:41:50.772] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.772] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.772] search = base::search(), system = base::Sys.info()) [18:41:50.772] } [18:41:50.772] ...future.conditions[[length(...future.conditions) + [18:41:50.772] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.772] cond$call), session = sessionInformation(), [18:41:50.772] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.772] signalCondition(cond) [18:41:50.772] } [18:41:50.772] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.772] "immediateCondition"))) { [18:41:50.772] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.772] ...future.conditions[[length(...future.conditions) + [18:41:50.772] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.772] if (TRUE && !signal) { [18:41:50.772] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.772] { [18:41:50.772] inherits <- base::inherits [18:41:50.772] invokeRestart <- base::invokeRestart [18:41:50.772] is.null <- base::is.null [18:41:50.772] muffled <- FALSE [18:41:50.772] if (inherits(cond, "message")) { [18:41:50.772] muffled <- grepl(pattern, "muffleMessage") [18:41:50.772] if (muffled) [18:41:50.772] invokeRestart("muffleMessage") [18:41:50.772] } [18:41:50.772] else if (inherits(cond, "warning")) { [18:41:50.772] muffled <- grepl(pattern, "muffleWarning") [18:41:50.772] if (muffled) [18:41:50.772] invokeRestart("muffleWarning") [18:41:50.772] } [18:41:50.772] else if (inherits(cond, "condition")) { [18:41:50.772] if (!is.null(pattern)) { [18:41:50.772] computeRestarts <- base::computeRestarts [18:41:50.772] grepl <- base::grepl [18:41:50.772] restarts <- computeRestarts(cond) [18:41:50.772] for (restart in restarts) { [18:41:50.772] name <- restart$name [18:41:50.772] if (is.null(name)) [18:41:50.772] next [18:41:50.772] if (!grepl(pattern, name)) [18:41:50.772] next [18:41:50.772] invokeRestart(restart) [18:41:50.772] muffled <- TRUE [18:41:50.772] break [18:41:50.772] } [18:41:50.772] } [18:41:50.772] } [18:41:50.772] invisible(muffled) [18:41:50.772] } [18:41:50.772] muffleCondition(cond, pattern = "^muffle") [18:41:50.772] } [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] if (TRUE) { [18:41:50.772] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.772] { [18:41:50.772] inherits <- base::inherits [18:41:50.772] invokeRestart <- base::invokeRestart [18:41:50.772] is.null <- base::is.null [18:41:50.772] muffled <- FALSE [18:41:50.772] if (inherits(cond, "message")) { [18:41:50.772] muffled <- grepl(pattern, "muffleMessage") [18:41:50.772] if (muffled) [18:41:50.772] invokeRestart("muffleMessage") [18:41:50.772] } [18:41:50.772] else if (inherits(cond, "warning")) { [18:41:50.772] muffled <- grepl(pattern, "muffleWarning") [18:41:50.772] if (muffled) [18:41:50.772] invokeRestart("muffleWarning") [18:41:50.772] } [18:41:50.772] else if (inherits(cond, "condition")) { [18:41:50.772] if (!is.null(pattern)) { [18:41:50.772] computeRestarts <- base::computeRestarts [18:41:50.772] grepl <- base::grepl [18:41:50.772] restarts <- computeRestarts(cond) [18:41:50.772] for (restart in restarts) { [18:41:50.772] name <- restart$name [18:41:50.772] if (is.null(name)) [18:41:50.772] next [18:41:50.772] if (!grepl(pattern, name)) [18:41:50.772] next [18:41:50.772] invokeRestart(restart) [18:41:50.772] muffled <- TRUE [18:41:50.772] break [18:41:50.772] } [18:41:50.772] } [18:41:50.772] } [18:41:50.772] invisible(muffled) [18:41:50.772] } [18:41:50.772] muffleCondition(cond, pattern = "^muffle") [18:41:50.772] } [18:41:50.772] } [18:41:50.772] } [18:41:50.772] })) [18:41:50.772] }, error = function(ex) { [18:41:50.772] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.772] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.772] ...future.rng), started = ...future.startTime, [18:41:50.772] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.772] version = "1.8"), class = "FutureResult") [18:41:50.772] }, finally = { [18:41:50.772] if (!identical(...future.workdir, getwd())) [18:41:50.772] setwd(...future.workdir) [18:41:50.772] { [18:41:50.772] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.772] ...future.oldOptions$nwarnings <- NULL [18:41:50.772] } [18:41:50.772] base::options(...future.oldOptions) [18:41:50.772] if (.Platform$OS.type == "windows") { [18:41:50.772] old_names <- names(...future.oldEnvVars) [18:41:50.772] envs <- base::Sys.getenv() [18:41:50.772] names <- names(envs) [18:41:50.772] common <- intersect(names, old_names) [18:41:50.772] added <- setdiff(names, old_names) [18:41:50.772] removed <- setdiff(old_names, names) [18:41:50.772] changed <- common[...future.oldEnvVars[common] != [18:41:50.772] envs[common]] [18:41:50.772] NAMES <- toupper(changed) [18:41:50.772] args <- list() [18:41:50.772] for (kk in seq_along(NAMES)) { [18:41:50.772] name <- changed[[kk]] [18:41:50.772] NAME <- NAMES[[kk]] [18:41:50.772] if (name != NAME && is.element(NAME, old_names)) [18:41:50.772] next [18:41:50.772] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.772] } [18:41:50.772] NAMES <- toupper(added) [18:41:50.772] for (kk in seq_along(NAMES)) { [18:41:50.772] name <- added[[kk]] [18:41:50.772] NAME <- NAMES[[kk]] [18:41:50.772] if (name != NAME && is.element(NAME, old_names)) [18:41:50.772] next [18:41:50.772] args[[name]] <- "" [18:41:50.772] } [18:41:50.772] NAMES <- toupper(removed) [18:41:50.772] for (kk in seq_along(NAMES)) { [18:41:50.772] name <- removed[[kk]] [18:41:50.772] NAME <- NAMES[[kk]] [18:41:50.772] if (name != NAME && is.element(NAME, old_names)) [18:41:50.772] next [18:41:50.772] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.772] } [18:41:50.772] if (length(args) > 0) [18:41:50.772] base::do.call(base::Sys.setenv, args = args) [18:41:50.772] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.772] } [18:41:50.772] { [18:41:50.772] if (base::length(...future.futureOptionsAdded) > [18:41:50.772] 0L) { [18:41:50.772] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.772] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.772] base::options(opts) [18:41:50.772] } [18:41:50.772] { [18:41:50.772] { [18:41:50.772] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.772] NULL [18:41:50.772] } [18:41:50.772] options(future.plan = NULL) [18:41:50.772] if (is.na(NA_character_)) [18:41:50.772] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.772] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.772] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.772] .init = FALSE) [18:41:50.772] } [18:41:50.772] } [18:41:50.772] } [18:41:50.772] }) [18:41:50.772] if (TRUE) { [18:41:50.772] base::sink(type = "output", split = FALSE) [18:41:50.772] if (TRUE) { [18:41:50.772] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.772] } [18:41:50.772] else { [18:41:50.772] ...future.result["stdout"] <- base::list(NULL) [18:41:50.772] } [18:41:50.772] base::close(...future.stdout) [18:41:50.772] ...future.stdout <- NULL [18:41:50.772] } [18:41:50.772] ...future.result$conditions <- ...future.conditions [18:41:50.772] ...future.result$finished <- base::Sys.time() [18:41:50.772] ...future.result [18:41:50.772] } [18:41:50.777] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:50.777] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:50.778] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:50.778] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.778] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.779] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.779] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.779] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.780] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.780] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.780] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.780] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:50.781] MultisessionFuture started [18:41:50.781] - Launch lazy future ... done [18:41:50.781] run() for 'MultisessionFuture' ... done [18:41:50.782] Created future: [18:41:50.795] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.795] - Validating connection of MultisessionFuture [18:41:50.796] - received message: FutureResult [18:41:50.796] - Received FutureResult [18:41:50.796] - Erased future from FutureRegistry [18:41:50.796] result() for ClusterFuture ... [18:41:50.796] - result already collected: FutureResult [18:41:50.797] result() for ClusterFuture ... done [18:41:50.797] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.782] MultisessionFuture: [18:41:50.782] Label: 'future_sapply-1' [18:41:50.782] Expression: [18:41:50.782] { [18:41:50.782] do.call(function(...) { [18:41:50.782] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.782] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.782] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.782] on.exit(options(oopts), add = TRUE) [18:41:50.782] } [18:41:50.782] { [18:41:50.782] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.782] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.782] ...future.FUN(...future.X_jj, ...) [18:41:50.782] }) [18:41:50.782] } [18:41:50.782] }, args = future.call.arguments) [18:41:50.782] } [18:41:50.782] Lazy evaluation: FALSE [18:41:50.782] Asynchronous evaluation: TRUE [18:41:50.782] Local evaluation: TRUE [18:41:50.782] Environment: R_GlobalEnv [18:41:50.782] Capture standard output: TRUE [18:41:50.782] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.782] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.782] Packages: [18:41:50.782] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.782] Resolved: TRUE [18:41:50.782] Value: [18:41:50.782] Conditions captured: [18:41:50.782] Early signaling: FALSE [18:41:50.782] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.782] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.797] Chunk #1 of 2 ... DONE [18:41:50.797] Chunk #2 of 2 ... [18:41:50.798] - Finding globals in 'X' for chunk #2 ... [18:41:50.798] getGlobalsAndPackages() ... [18:41:50.798] Searching for globals... [18:41:50.798] [18:41:50.798] Searching for globals ... DONE [18:41:50.799] - globals: [0] [18:41:50.799] getGlobalsAndPackages() ... DONE [18:41:50.799] + additional globals found: [n=0] [18:41:50.799] + additional namespaces needed: [n=0] [18:41:50.799] - Finding globals in 'X' for chunk #2 ... DONE [18:41:50.799] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.799] - seeds: [18:41:50.800] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.800] getGlobalsAndPackages() ... [18:41:50.800] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.800] Resolving globals: FALSE [18:41:50.800] Tweak future expression to call with '...' arguments ... [18:41:50.801] { [18:41:50.801] do.call(function(...) { [18:41:50.801] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.801] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.801] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.801] on.exit(options(oopts), add = TRUE) [18:41:50.801] } [18:41:50.801] { [18:41:50.801] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.801] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.801] ...future.FUN(...future.X_jj, ...) [18:41:50.801] }) [18:41:50.801] } [18:41:50.801] }, args = future.call.arguments) [18:41:50.801] } [18:41:50.801] Tweak future expression to call with '...' arguments ... DONE [18:41:50.801] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.802] [18:41:50.802] getGlobalsAndPackages() ... DONE [18:41:50.802] run() for 'Future' ... [18:41:50.802] - state: 'created' [18:41:50.803] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.818] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.818] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.818] - Field: 'node' [18:41:50.818] - Field: 'label' [18:41:50.819] - Field: 'local' [18:41:50.819] - Field: 'owner' [18:41:50.819] - Field: 'envir' [18:41:50.819] - Field: 'workers' [18:41:50.819] - Field: 'packages' [18:41:50.820] - Field: 'gc' [18:41:50.820] - Field: 'conditions' [18:41:50.820] - Field: 'persistent' [18:41:50.820] - Field: 'expr' [18:41:50.820] - Field: 'uuid' [18:41:50.820] - Field: 'seed' [18:41:50.821] - Field: 'version' [18:41:50.821] - Field: 'result' [18:41:50.821] - Field: 'asynchronous' [18:41:50.821] - Field: 'calls' [18:41:50.821] - Field: 'globals' [18:41:50.821] - Field: 'stdout' [18:41:50.822] - Field: 'earlySignal' [18:41:50.822] - Field: 'lazy' [18:41:50.822] - Field: 'state' [18:41:50.822] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.822] - Launch lazy future ... [18:41:50.823] Packages needed by the future expression (n = 0): [18:41:50.823] Packages needed by future strategies (n = 0): [18:41:50.823] { [18:41:50.823] { [18:41:50.823] { [18:41:50.823] ...future.startTime <- base::Sys.time() [18:41:50.823] { [18:41:50.823] { [18:41:50.823] { [18:41:50.823] { [18:41:50.823] base::local({ [18:41:50.823] has_future <- base::requireNamespace("future", [18:41:50.823] quietly = TRUE) [18:41:50.823] if (has_future) { [18:41:50.823] ns <- base::getNamespace("future") [18:41:50.823] version <- ns[[".package"]][["version"]] [18:41:50.823] if (is.null(version)) [18:41:50.823] version <- utils::packageVersion("future") [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] version <- NULL [18:41:50.823] } [18:41:50.823] if (!has_future || version < "1.8.0") { [18:41:50.823] info <- base::c(r_version = base::gsub("R version ", [18:41:50.823] "", base::R.version$version.string), [18:41:50.823] platform = base::sprintf("%s (%s-bit)", [18:41:50.823] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.823] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.823] "release", "version")], collapse = " "), [18:41:50.823] hostname = base::Sys.info()[["nodename"]]) [18:41:50.823] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.823] info) [18:41:50.823] info <- base::paste(info, collapse = "; ") [18:41:50.823] if (!has_future) { [18:41:50.823] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.823] info) [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.823] info, version) [18:41:50.823] } [18:41:50.823] base::stop(msg) [18:41:50.823] } [18:41:50.823] }) [18:41:50.823] } [18:41:50.823] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.823] base::options(mc.cores = 1L) [18:41:50.823] } [18:41:50.823] ...future.strategy.old <- future::plan("list") [18:41:50.823] options(future.plan = NULL) [18:41:50.823] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.823] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.823] } [18:41:50.823] ...future.workdir <- getwd() [18:41:50.823] } [18:41:50.823] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.823] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.823] } [18:41:50.823] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.823] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.823] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.823] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.823] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.823] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.823] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.823] base::names(...future.oldOptions)) [18:41:50.823] } [18:41:50.823] if (FALSE) { [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] if (TRUE) { [18:41:50.823] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.823] open = "w") [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.823] windows = "NUL", "/dev/null"), open = "w") [18:41:50.823] } [18:41:50.823] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.823] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.823] base::sink(type = "output", split = FALSE) [18:41:50.823] base::close(...future.stdout) [18:41:50.823] }, add = TRUE) [18:41:50.823] } [18:41:50.823] ...future.frame <- base::sys.nframe() [18:41:50.823] ...future.conditions <- base::list() [18:41:50.823] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.823] if (FALSE) { [18:41:50.823] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.823] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.823] } [18:41:50.823] ...future.result <- base::tryCatch({ [18:41:50.823] base::withCallingHandlers({ [18:41:50.823] ...future.value <- base::withVisible(base::local({ [18:41:50.823] ...future.makeSendCondition <- base::local({ [18:41:50.823] sendCondition <- NULL [18:41:50.823] function(frame = 1L) { [18:41:50.823] if (is.function(sendCondition)) [18:41:50.823] return(sendCondition) [18:41:50.823] ns <- getNamespace("parallel") [18:41:50.823] if (exists("sendData", mode = "function", [18:41:50.823] envir = ns)) { [18:41:50.823] parallel_sendData <- get("sendData", mode = "function", [18:41:50.823] envir = ns) [18:41:50.823] envir <- sys.frame(frame) [18:41:50.823] master <- NULL [18:41:50.823] while (!identical(envir, .GlobalEnv) && [18:41:50.823] !identical(envir, emptyenv())) { [18:41:50.823] if (exists("master", mode = "list", envir = envir, [18:41:50.823] inherits = FALSE)) { [18:41:50.823] master <- get("master", mode = "list", [18:41:50.823] envir = envir, inherits = FALSE) [18:41:50.823] if (inherits(master, c("SOCKnode", [18:41:50.823] "SOCK0node"))) { [18:41:50.823] sendCondition <<- function(cond) { [18:41:50.823] data <- list(type = "VALUE", value = cond, [18:41:50.823] success = TRUE) [18:41:50.823] parallel_sendData(master, data) [18:41:50.823] } [18:41:50.823] return(sendCondition) [18:41:50.823] } [18:41:50.823] } [18:41:50.823] frame <- frame + 1L [18:41:50.823] envir <- sys.frame(frame) [18:41:50.823] } [18:41:50.823] } [18:41:50.823] sendCondition <<- function(cond) NULL [18:41:50.823] } [18:41:50.823] }) [18:41:50.823] withCallingHandlers({ [18:41:50.823] { [18:41:50.823] do.call(function(...) { [18:41:50.823] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.823] if (!identical(...future.globals.maxSize.org, [18:41:50.823] ...future.globals.maxSize)) { [18:41:50.823] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.823] on.exit(options(oopts), add = TRUE) [18:41:50.823] } [18:41:50.823] { [18:41:50.823] lapply(seq_along(...future.elements_ii), [18:41:50.823] FUN = function(jj) { [18:41:50.823] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.823] ...future.FUN(...future.X_jj, ...) [18:41:50.823] }) [18:41:50.823] } [18:41:50.823] }, args = future.call.arguments) [18:41:50.823] } [18:41:50.823] }, immediateCondition = function(cond) { [18:41:50.823] sendCondition <- ...future.makeSendCondition() [18:41:50.823] sendCondition(cond) [18:41:50.823] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.823] { [18:41:50.823] inherits <- base::inherits [18:41:50.823] invokeRestart <- base::invokeRestart [18:41:50.823] is.null <- base::is.null [18:41:50.823] muffled <- FALSE [18:41:50.823] if (inherits(cond, "message")) { [18:41:50.823] muffled <- grepl(pattern, "muffleMessage") [18:41:50.823] if (muffled) [18:41:50.823] invokeRestart("muffleMessage") [18:41:50.823] } [18:41:50.823] else if (inherits(cond, "warning")) { [18:41:50.823] muffled <- grepl(pattern, "muffleWarning") [18:41:50.823] if (muffled) [18:41:50.823] invokeRestart("muffleWarning") [18:41:50.823] } [18:41:50.823] else if (inherits(cond, "condition")) { [18:41:50.823] if (!is.null(pattern)) { [18:41:50.823] computeRestarts <- base::computeRestarts [18:41:50.823] grepl <- base::grepl [18:41:50.823] restarts <- computeRestarts(cond) [18:41:50.823] for (restart in restarts) { [18:41:50.823] name <- restart$name [18:41:50.823] if (is.null(name)) [18:41:50.823] next [18:41:50.823] if (!grepl(pattern, name)) [18:41:50.823] next [18:41:50.823] invokeRestart(restart) [18:41:50.823] muffled <- TRUE [18:41:50.823] break [18:41:50.823] } [18:41:50.823] } [18:41:50.823] } [18:41:50.823] invisible(muffled) [18:41:50.823] } [18:41:50.823] muffleCondition(cond) [18:41:50.823] }) [18:41:50.823] })) [18:41:50.823] future::FutureResult(value = ...future.value$value, [18:41:50.823] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.823] ...future.rng), globalenv = if (FALSE) [18:41:50.823] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.823] ...future.globalenv.names)) [18:41:50.823] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.823] }, condition = base::local({ [18:41:50.823] c <- base::c [18:41:50.823] inherits <- base::inherits [18:41:50.823] invokeRestart <- base::invokeRestart [18:41:50.823] length <- base::length [18:41:50.823] list <- base::list [18:41:50.823] seq.int <- base::seq.int [18:41:50.823] signalCondition <- base::signalCondition [18:41:50.823] sys.calls <- base::sys.calls [18:41:50.823] `[[` <- base::`[[` [18:41:50.823] `+` <- base::`+` [18:41:50.823] `<<-` <- base::`<<-` [18:41:50.823] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.823] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.823] 3L)] [18:41:50.823] } [18:41:50.823] function(cond) { [18:41:50.823] is_error <- inherits(cond, "error") [18:41:50.823] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.823] NULL) [18:41:50.823] if (is_error) { [18:41:50.823] sessionInformation <- function() { [18:41:50.823] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.823] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.823] search = base::search(), system = base::Sys.info()) [18:41:50.823] } [18:41:50.823] ...future.conditions[[length(...future.conditions) + [18:41:50.823] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.823] cond$call), session = sessionInformation(), [18:41:50.823] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.823] signalCondition(cond) [18:41:50.823] } [18:41:50.823] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.823] "immediateCondition"))) { [18:41:50.823] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.823] ...future.conditions[[length(...future.conditions) + [18:41:50.823] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.823] if (TRUE && !signal) { [18:41:50.823] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.823] { [18:41:50.823] inherits <- base::inherits [18:41:50.823] invokeRestart <- base::invokeRestart [18:41:50.823] is.null <- base::is.null [18:41:50.823] muffled <- FALSE [18:41:50.823] if (inherits(cond, "message")) { [18:41:50.823] muffled <- grepl(pattern, "muffleMessage") [18:41:50.823] if (muffled) [18:41:50.823] invokeRestart("muffleMessage") [18:41:50.823] } [18:41:50.823] else if (inherits(cond, "warning")) { [18:41:50.823] muffled <- grepl(pattern, "muffleWarning") [18:41:50.823] if (muffled) [18:41:50.823] invokeRestart("muffleWarning") [18:41:50.823] } [18:41:50.823] else if (inherits(cond, "condition")) { [18:41:50.823] if (!is.null(pattern)) { [18:41:50.823] computeRestarts <- base::computeRestarts [18:41:50.823] grepl <- base::grepl [18:41:50.823] restarts <- computeRestarts(cond) [18:41:50.823] for (restart in restarts) { [18:41:50.823] name <- restart$name [18:41:50.823] if (is.null(name)) [18:41:50.823] next [18:41:50.823] if (!grepl(pattern, name)) [18:41:50.823] next [18:41:50.823] invokeRestart(restart) [18:41:50.823] muffled <- TRUE [18:41:50.823] break [18:41:50.823] } [18:41:50.823] } [18:41:50.823] } [18:41:50.823] invisible(muffled) [18:41:50.823] } [18:41:50.823] muffleCondition(cond, pattern = "^muffle") [18:41:50.823] } [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] if (TRUE) { [18:41:50.823] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.823] { [18:41:50.823] inherits <- base::inherits [18:41:50.823] invokeRestart <- base::invokeRestart [18:41:50.823] is.null <- base::is.null [18:41:50.823] muffled <- FALSE [18:41:50.823] if (inherits(cond, "message")) { [18:41:50.823] muffled <- grepl(pattern, "muffleMessage") [18:41:50.823] if (muffled) [18:41:50.823] invokeRestart("muffleMessage") [18:41:50.823] } [18:41:50.823] else if (inherits(cond, "warning")) { [18:41:50.823] muffled <- grepl(pattern, "muffleWarning") [18:41:50.823] if (muffled) [18:41:50.823] invokeRestart("muffleWarning") [18:41:50.823] } [18:41:50.823] else if (inherits(cond, "condition")) { [18:41:50.823] if (!is.null(pattern)) { [18:41:50.823] computeRestarts <- base::computeRestarts [18:41:50.823] grepl <- base::grepl [18:41:50.823] restarts <- computeRestarts(cond) [18:41:50.823] for (restart in restarts) { [18:41:50.823] name <- restart$name [18:41:50.823] if (is.null(name)) [18:41:50.823] next [18:41:50.823] if (!grepl(pattern, name)) [18:41:50.823] next [18:41:50.823] invokeRestart(restart) [18:41:50.823] muffled <- TRUE [18:41:50.823] break [18:41:50.823] } [18:41:50.823] } [18:41:50.823] } [18:41:50.823] invisible(muffled) [18:41:50.823] } [18:41:50.823] muffleCondition(cond, pattern = "^muffle") [18:41:50.823] } [18:41:50.823] } [18:41:50.823] } [18:41:50.823] })) [18:41:50.823] }, error = function(ex) { [18:41:50.823] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.823] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.823] ...future.rng), started = ...future.startTime, [18:41:50.823] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.823] version = "1.8"), class = "FutureResult") [18:41:50.823] }, finally = { [18:41:50.823] if (!identical(...future.workdir, getwd())) [18:41:50.823] setwd(...future.workdir) [18:41:50.823] { [18:41:50.823] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.823] ...future.oldOptions$nwarnings <- NULL [18:41:50.823] } [18:41:50.823] base::options(...future.oldOptions) [18:41:50.823] if (.Platform$OS.type == "windows") { [18:41:50.823] old_names <- names(...future.oldEnvVars) [18:41:50.823] envs <- base::Sys.getenv() [18:41:50.823] names <- names(envs) [18:41:50.823] common <- intersect(names, old_names) [18:41:50.823] added <- setdiff(names, old_names) [18:41:50.823] removed <- setdiff(old_names, names) [18:41:50.823] changed <- common[...future.oldEnvVars[common] != [18:41:50.823] envs[common]] [18:41:50.823] NAMES <- toupper(changed) [18:41:50.823] args <- list() [18:41:50.823] for (kk in seq_along(NAMES)) { [18:41:50.823] name <- changed[[kk]] [18:41:50.823] NAME <- NAMES[[kk]] [18:41:50.823] if (name != NAME && is.element(NAME, old_names)) [18:41:50.823] next [18:41:50.823] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.823] } [18:41:50.823] NAMES <- toupper(added) [18:41:50.823] for (kk in seq_along(NAMES)) { [18:41:50.823] name <- added[[kk]] [18:41:50.823] NAME <- NAMES[[kk]] [18:41:50.823] if (name != NAME && is.element(NAME, old_names)) [18:41:50.823] next [18:41:50.823] args[[name]] <- "" [18:41:50.823] } [18:41:50.823] NAMES <- toupper(removed) [18:41:50.823] for (kk in seq_along(NAMES)) { [18:41:50.823] name <- removed[[kk]] [18:41:50.823] NAME <- NAMES[[kk]] [18:41:50.823] if (name != NAME && is.element(NAME, old_names)) [18:41:50.823] next [18:41:50.823] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.823] } [18:41:50.823] if (length(args) > 0) [18:41:50.823] base::do.call(base::Sys.setenv, args = args) [18:41:50.823] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.823] } [18:41:50.823] { [18:41:50.823] if (base::length(...future.futureOptionsAdded) > [18:41:50.823] 0L) { [18:41:50.823] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.823] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.823] base::options(opts) [18:41:50.823] } [18:41:50.823] { [18:41:50.823] { [18:41:50.823] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.823] NULL [18:41:50.823] } [18:41:50.823] options(future.plan = NULL) [18:41:50.823] if (is.na(NA_character_)) [18:41:50.823] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.823] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.823] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.823] .init = FALSE) [18:41:50.823] } [18:41:50.823] } [18:41:50.823] } [18:41:50.823] }) [18:41:50.823] if (TRUE) { [18:41:50.823] base::sink(type = "output", split = FALSE) [18:41:50.823] if (TRUE) { [18:41:50.823] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.823] } [18:41:50.823] else { [18:41:50.823] ...future.result["stdout"] <- base::list(NULL) [18:41:50.823] } [18:41:50.823] base::close(...future.stdout) [18:41:50.823] ...future.stdout <- NULL [18:41:50.823] } [18:41:50.823] ...future.result$conditions <- ...future.conditions [18:41:50.823] ...future.result$finished <- base::Sys.time() [18:41:50.823] ...future.result [18:41:50.823] } [18:41:50.829] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:50.829] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:50.829] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:50.829] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.830] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.830] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.831] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.831] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.831] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.831] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.832] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.832] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:50.833] MultisessionFuture started [18:41:50.833] - Launch lazy future ... done [18:41:50.833] run() for 'MultisessionFuture' ... done [18:41:50.833] Created future: [18:41:50.846] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.847] - Validating connection of MultisessionFuture [18:41:50.847] - received message: FutureResult [18:41:50.847] - Received FutureResult [18:41:50.847] - Erased future from FutureRegistry [18:41:50.848] result() for ClusterFuture ... [18:41:50.848] - result already collected: FutureResult [18:41:50.848] result() for ClusterFuture ... done [18:41:50.848] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.833] MultisessionFuture: [18:41:50.833] Label: 'future_sapply-2' [18:41:50.833] Expression: [18:41:50.833] { [18:41:50.833] do.call(function(...) { [18:41:50.833] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.833] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.833] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.833] on.exit(options(oopts), add = TRUE) [18:41:50.833] } [18:41:50.833] { [18:41:50.833] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.833] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.833] ...future.FUN(...future.X_jj, ...) [18:41:50.833] }) [18:41:50.833] } [18:41:50.833] }, args = future.call.arguments) [18:41:50.833] } [18:41:50.833] Lazy evaluation: FALSE [18:41:50.833] Asynchronous evaluation: TRUE [18:41:50.833] Local evaluation: TRUE [18:41:50.833] Environment: R_GlobalEnv [18:41:50.833] Capture standard output: TRUE [18:41:50.833] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.833] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.833] Packages: [18:41:50.833] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.833] Resolved: TRUE [18:41:50.833] Value: [18:41:50.833] Conditions captured: [18:41:50.833] Early signaling: FALSE [18:41:50.833] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.833] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.848] Chunk #2 of 2 ... DONE [18:41:50.849] Launching 2 futures (chunks) ... DONE [18:41:50.849] Resolving 2 futures (chunks) ... [18:41:50.849] resolve() on list ... [18:41:50.849] recursive: 0 [18:41:50.849] length: 2 [18:41:50.849] [18:41:50.850] Future #1 [18:41:50.850] result() for ClusterFuture ... [18:41:50.850] - result already collected: FutureResult [18:41:50.850] result() for ClusterFuture ... done [18:41:50.850] result() for ClusterFuture ... [18:41:50.850] - result already collected: FutureResult [18:41:50.851] result() for ClusterFuture ... done [18:41:50.851] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:50.851] - nx: 2 [18:41:50.851] - relay: TRUE [18:41:50.851] - stdout: TRUE [18:41:50.851] - signal: TRUE [18:41:50.851] - resignal: FALSE [18:41:50.852] - force: TRUE [18:41:50.852] - relayed: [n=2] FALSE, FALSE [18:41:50.852] - queued futures: [n=2] FALSE, FALSE [18:41:50.852] - until=1 [18:41:50.852] - relaying element #1 [18:41:50.852] result() for ClusterFuture ... [18:41:50.853] - result already collected: FutureResult [18:41:50.853] result() for ClusterFuture ... done [18:41:50.853] result() for ClusterFuture ... [18:41:50.853] - result already collected: FutureResult [18:41:50.853] result() for ClusterFuture ... done [18:41:50.853] result() for ClusterFuture ... [18:41:50.854] - result already collected: FutureResult [18:41:50.854] result() for ClusterFuture ... done [18:41:50.854] result() for ClusterFuture ... [18:41:50.854] - result already collected: FutureResult [18:41:50.854] result() for ClusterFuture ... done [18:41:50.854] - relayed: [n=2] TRUE, FALSE [18:41:50.854] - queued futures: [n=2] TRUE, FALSE [18:41:50.855] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:50.855] length: 1 (resolved future 1) [18:41:50.855] Future #2 [18:41:50.855] result() for ClusterFuture ... [18:41:50.855] - result already collected: FutureResult [18:41:50.855] result() for ClusterFuture ... done [18:41:50.856] result() for ClusterFuture ... [18:41:50.856] - result already collected: FutureResult [18:41:50.856] result() for ClusterFuture ... done [18:41:50.856] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:50.856] - nx: 2 [18:41:50.856] - relay: TRUE [18:41:50.857] - stdout: TRUE [18:41:50.857] - signal: TRUE [18:41:50.857] - resignal: FALSE [18:41:50.857] - force: TRUE [18:41:50.857] - relayed: [n=2] TRUE, FALSE [18:41:50.857] - queued futures: [n=2] TRUE, FALSE [18:41:50.858] - until=2 [18:41:50.858] - relaying element #2 [18:41:50.858] result() for ClusterFuture ... [18:41:50.858] - result already collected: FutureResult [18:41:50.858] result() for ClusterFuture ... done [18:41:50.858] result() for ClusterFuture ... [18:41:50.858] - result already collected: FutureResult [18:41:50.859] result() for ClusterFuture ... done [18:41:50.859] result() for ClusterFuture ... [18:41:50.859] - result already collected: FutureResult [18:41:50.859] result() for ClusterFuture ... done [18:41:50.859] result() for ClusterFuture ... [18:41:50.859] - result already collected: FutureResult [18:41:50.860] result() for ClusterFuture ... done [18:41:50.860] - relayed: [n=2] TRUE, TRUE [18:41:50.860] - queued futures: [n=2] TRUE, TRUE [18:41:50.860] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:50.860] length: 0 (resolved future 2) [18:41:50.860] Relaying remaining futures [18:41:50.861] signalConditionsASAP(NULL, pos=0) ... [18:41:50.861] - nx: 2 [18:41:50.861] - relay: TRUE [18:41:50.861] - stdout: TRUE [18:41:50.861] - signal: TRUE [18:41:50.861] - resignal: FALSE [18:41:50.861] - force: TRUE [18:41:50.862] - relayed: [n=2] TRUE, TRUE [18:41:50.862] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:50.862] - relayed: [n=2] TRUE, TRUE [18:41:50.862] - queued futures: [n=2] TRUE, TRUE [18:41:50.862] signalConditionsASAP(NULL, pos=0) ... done [18:41:50.863] resolve() on list ... DONE [18:41:50.863] result() for ClusterFuture ... [18:41:50.863] - result already collected: FutureResult [18:41:50.863] result() for ClusterFuture ... done [18:41:50.863] result() for ClusterFuture ... [18:41:50.863] - result already collected: FutureResult [18:41:50.863] result() for ClusterFuture ... done [18:41:50.864] result() for ClusterFuture ... [18:41:50.864] - result already collected: FutureResult [18:41:50.864] result() for ClusterFuture ... done [18:41:50.864] result() for ClusterFuture ... [18:41:50.864] - result already collected: FutureResult [18:41:50.864] result() for ClusterFuture ... done [18:41:50.865] - Number of value chunks collected: 2 [18:41:50.865] Resolving 2 futures (chunks) ... DONE [18:41:50.865] Reducing values from 2 chunks ... [18:41:50.865] - Number of values collected after concatenation: 6 [18:41:50.865] - Number of values expected: 6 [18:41:50.865] Reducing values from 2 chunks ... DONE [18:41:50.866] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:50.869] future_lapply() ... [18:41:50.872] Number of chunks: 2 [18:41:50.872] getGlobalsAndPackagesXApply() ... [18:41:50.872] - future.globals: TRUE [18:41:50.872] getGlobalsAndPackages() ... [18:41:50.873] Searching for globals... [18:41:50.874] - globals found: [1] 'FUN' [18:41:50.874] Searching for globals ... DONE [18:41:50.874] Resolving globals: FALSE [18:41:50.875] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:50.875] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:50.875] - globals: [1] 'FUN' [18:41:50.875] [18:41:50.876] getGlobalsAndPackages() ... DONE [18:41:50.876] - globals found/used: [n=1] 'FUN' [18:41:50.876] - needed namespaces: [n=0] [18:41:50.876] Finding globals ... DONE [18:41:50.876] - use_args: TRUE [18:41:50.876] - Getting '...' globals ... [18:41:50.877] resolve() on list ... [18:41:50.877] recursive: 0 [18:41:50.877] length: 1 [18:41:50.877] elements: '...' [18:41:50.878] length: 0 (resolved future 1) [18:41:50.878] resolve() on list ... DONE [18:41:50.878] - '...' content: [n=0] [18:41:50.881] List of 1 [18:41:50.881] $ ...: list() [18:41:50.881] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.881] - attr(*, "where")=List of 1 [18:41:50.881] ..$ ...: [18:41:50.881] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.881] - attr(*, "resolved")= logi TRUE [18:41:50.881] - attr(*, "total_size")= num NA [18:41:50.884] - Getting '...' globals ... DONE [18:41:50.885] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:50.885] List of 2 [18:41:50.885] $ ...future.FUN:function (x) [18:41:50.885] $ ... : list() [18:41:50.885] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:50.885] - attr(*, "where")=List of 2 [18:41:50.885] ..$ ...future.FUN: [18:41:50.885] ..$ ... : [18:41:50.885] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:50.885] - attr(*, "resolved")= logi FALSE [18:41:50.885] - attr(*, "total_size")= int 4942 [18:41:50.888] Packages to be attached in all futures: [n=0] [18:41:50.888] getGlobalsAndPackagesXApply() ... DONE [18:41:50.888] Number of futures (= number of chunks): 2 [18:41:50.889] Launching 2 futures (chunks) ... [18:41:50.889] Chunk #1 of 2 ... [18:41:50.889] - Finding globals in 'X' for chunk #1 ... [18:41:50.889] getGlobalsAndPackages() ... [18:41:50.889] Searching for globals... [18:41:50.890] [18:41:50.890] Searching for globals ... DONE [18:41:50.890] - globals: [0] [18:41:50.890] getGlobalsAndPackages() ... DONE [18:41:50.890] + additional globals found: [n=0] [18:41:50.890] + additional namespaces needed: [n=0] [18:41:50.891] - Finding globals in 'X' for chunk #1 ... DONE [18:41:50.891] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.891] - seeds: [18:41:50.891] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.891] getGlobalsAndPackages() ... [18:41:50.891] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.892] Resolving globals: FALSE [18:41:50.892] Tweak future expression to call with '...' arguments ... [18:41:50.892] { [18:41:50.892] do.call(function(...) { [18:41:50.892] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.892] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.892] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.892] on.exit(options(oopts), add = TRUE) [18:41:50.892] } [18:41:50.892] { [18:41:50.892] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.892] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.892] ...future.FUN(...future.X_jj, ...) [18:41:50.892] }) [18:41:50.892] } [18:41:50.892] }, args = future.call.arguments) [18:41:50.892] } [18:41:50.892] Tweak future expression to call with '...' arguments ... DONE [18:41:50.893] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.893] [18:41:50.893] getGlobalsAndPackages() ... DONE [18:41:50.894] run() for 'Future' ... [18:41:50.894] - state: 'created' [18:41:50.894] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.910] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.911] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.911] - Field: 'node' [18:41:50.911] - Field: 'label' [18:41:50.912] - Field: 'local' [18:41:50.912] - Field: 'owner' [18:41:50.912] - Field: 'envir' [18:41:50.913] - Field: 'workers' [18:41:50.913] - Field: 'packages' [18:41:50.913] - Field: 'gc' [18:41:50.914] - Field: 'conditions' [18:41:50.914] - Field: 'persistent' [18:41:50.914] - Field: 'expr' [18:41:50.914] - Field: 'uuid' [18:41:50.914] - Field: 'seed' [18:41:50.914] - Field: 'version' [18:41:50.915] - Field: 'result' [18:41:50.915] - Field: 'asynchronous' [18:41:50.915] - Field: 'calls' [18:41:50.915] - Field: 'globals' [18:41:50.915] - Field: 'stdout' [18:41:50.915] - Field: 'earlySignal' [18:41:50.916] - Field: 'lazy' [18:41:50.916] - Field: 'state' [18:41:50.916] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.916] - Launch lazy future ... [18:41:50.917] Packages needed by the future expression (n = 0): [18:41:50.917] Packages needed by future strategies (n = 0): [18:41:50.917] { [18:41:50.917] { [18:41:50.917] { [18:41:50.917] ...future.startTime <- base::Sys.time() [18:41:50.917] { [18:41:50.917] { [18:41:50.917] { [18:41:50.917] { [18:41:50.917] base::local({ [18:41:50.917] has_future <- base::requireNamespace("future", [18:41:50.917] quietly = TRUE) [18:41:50.917] if (has_future) { [18:41:50.917] ns <- base::getNamespace("future") [18:41:50.917] version <- ns[[".package"]][["version"]] [18:41:50.917] if (is.null(version)) [18:41:50.917] version <- utils::packageVersion("future") [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] version <- NULL [18:41:50.917] } [18:41:50.917] if (!has_future || version < "1.8.0") { [18:41:50.917] info <- base::c(r_version = base::gsub("R version ", [18:41:50.917] "", base::R.version$version.string), [18:41:50.917] platform = base::sprintf("%s (%s-bit)", [18:41:50.917] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.917] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.917] "release", "version")], collapse = " "), [18:41:50.917] hostname = base::Sys.info()[["nodename"]]) [18:41:50.917] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.917] info) [18:41:50.917] info <- base::paste(info, collapse = "; ") [18:41:50.917] if (!has_future) { [18:41:50.917] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.917] info) [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.917] info, version) [18:41:50.917] } [18:41:50.917] base::stop(msg) [18:41:50.917] } [18:41:50.917] }) [18:41:50.917] } [18:41:50.917] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.917] base::options(mc.cores = 1L) [18:41:50.917] } [18:41:50.917] ...future.strategy.old <- future::plan("list") [18:41:50.917] options(future.plan = NULL) [18:41:50.917] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.917] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.917] } [18:41:50.917] ...future.workdir <- getwd() [18:41:50.917] } [18:41:50.917] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.917] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.917] } [18:41:50.917] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.917] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.917] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.917] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.917] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.917] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.917] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.917] base::names(...future.oldOptions)) [18:41:50.917] } [18:41:50.917] if (FALSE) { [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] if (TRUE) { [18:41:50.917] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.917] open = "w") [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.917] windows = "NUL", "/dev/null"), open = "w") [18:41:50.917] } [18:41:50.917] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.917] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.917] base::sink(type = "output", split = FALSE) [18:41:50.917] base::close(...future.stdout) [18:41:50.917] }, add = TRUE) [18:41:50.917] } [18:41:50.917] ...future.frame <- base::sys.nframe() [18:41:50.917] ...future.conditions <- base::list() [18:41:50.917] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.917] if (FALSE) { [18:41:50.917] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.917] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.917] } [18:41:50.917] ...future.result <- base::tryCatch({ [18:41:50.917] base::withCallingHandlers({ [18:41:50.917] ...future.value <- base::withVisible(base::local({ [18:41:50.917] ...future.makeSendCondition <- base::local({ [18:41:50.917] sendCondition <- NULL [18:41:50.917] function(frame = 1L) { [18:41:50.917] if (is.function(sendCondition)) [18:41:50.917] return(sendCondition) [18:41:50.917] ns <- getNamespace("parallel") [18:41:50.917] if (exists("sendData", mode = "function", [18:41:50.917] envir = ns)) { [18:41:50.917] parallel_sendData <- get("sendData", mode = "function", [18:41:50.917] envir = ns) [18:41:50.917] envir <- sys.frame(frame) [18:41:50.917] master <- NULL [18:41:50.917] while (!identical(envir, .GlobalEnv) && [18:41:50.917] !identical(envir, emptyenv())) { [18:41:50.917] if (exists("master", mode = "list", envir = envir, [18:41:50.917] inherits = FALSE)) { [18:41:50.917] master <- get("master", mode = "list", [18:41:50.917] envir = envir, inherits = FALSE) [18:41:50.917] if (inherits(master, c("SOCKnode", [18:41:50.917] "SOCK0node"))) { [18:41:50.917] sendCondition <<- function(cond) { [18:41:50.917] data <- list(type = "VALUE", value = cond, [18:41:50.917] success = TRUE) [18:41:50.917] parallel_sendData(master, data) [18:41:50.917] } [18:41:50.917] return(sendCondition) [18:41:50.917] } [18:41:50.917] } [18:41:50.917] frame <- frame + 1L [18:41:50.917] envir <- sys.frame(frame) [18:41:50.917] } [18:41:50.917] } [18:41:50.917] sendCondition <<- function(cond) NULL [18:41:50.917] } [18:41:50.917] }) [18:41:50.917] withCallingHandlers({ [18:41:50.917] { [18:41:50.917] do.call(function(...) { [18:41:50.917] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.917] if (!identical(...future.globals.maxSize.org, [18:41:50.917] ...future.globals.maxSize)) { [18:41:50.917] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.917] on.exit(options(oopts), add = TRUE) [18:41:50.917] } [18:41:50.917] { [18:41:50.917] lapply(seq_along(...future.elements_ii), [18:41:50.917] FUN = function(jj) { [18:41:50.917] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.917] ...future.FUN(...future.X_jj, ...) [18:41:50.917] }) [18:41:50.917] } [18:41:50.917] }, args = future.call.arguments) [18:41:50.917] } [18:41:50.917] }, immediateCondition = function(cond) { [18:41:50.917] sendCondition <- ...future.makeSendCondition() [18:41:50.917] sendCondition(cond) [18:41:50.917] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.917] { [18:41:50.917] inherits <- base::inherits [18:41:50.917] invokeRestart <- base::invokeRestart [18:41:50.917] is.null <- base::is.null [18:41:50.917] muffled <- FALSE [18:41:50.917] if (inherits(cond, "message")) { [18:41:50.917] muffled <- grepl(pattern, "muffleMessage") [18:41:50.917] if (muffled) [18:41:50.917] invokeRestart("muffleMessage") [18:41:50.917] } [18:41:50.917] else if (inherits(cond, "warning")) { [18:41:50.917] muffled <- grepl(pattern, "muffleWarning") [18:41:50.917] if (muffled) [18:41:50.917] invokeRestart("muffleWarning") [18:41:50.917] } [18:41:50.917] else if (inherits(cond, "condition")) { [18:41:50.917] if (!is.null(pattern)) { [18:41:50.917] computeRestarts <- base::computeRestarts [18:41:50.917] grepl <- base::grepl [18:41:50.917] restarts <- computeRestarts(cond) [18:41:50.917] for (restart in restarts) { [18:41:50.917] name <- restart$name [18:41:50.917] if (is.null(name)) [18:41:50.917] next [18:41:50.917] if (!grepl(pattern, name)) [18:41:50.917] next [18:41:50.917] invokeRestart(restart) [18:41:50.917] muffled <- TRUE [18:41:50.917] break [18:41:50.917] } [18:41:50.917] } [18:41:50.917] } [18:41:50.917] invisible(muffled) [18:41:50.917] } [18:41:50.917] muffleCondition(cond) [18:41:50.917] }) [18:41:50.917] })) [18:41:50.917] future::FutureResult(value = ...future.value$value, [18:41:50.917] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.917] ...future.rng), globalenv = if (FALSE) [18:41:50.917] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.917] ...future.globalenv.names)) [18:41:50.917] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.917] }, condition = base::local({ [18:41:50.917] c <- base::c [18:41:50.917] inherits <- base::inherits [18:41:50.917] invokeRestart <- base::invokeRestart [18:41:50.917] length <- base::length [18:41:50.917] list <- base::list [18:41:50.917] seq.int <- base::seq.int [18:41:50.917] signalCondition <- base::signalCondition [18:41:50.917] sys.calls <- base::sys.calls [18:41:50.917] `[[` <- base::`[[` [18:41:50.917] `+` <- base::`+` [18:41:50.917] `<<-` <- base::`<<-` [18:41:50.917] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.917] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.917] 3L)] [18:41:50.917] } [18:41:50.917] function(cond) { [18:41:50.917] is_error <- inherits(cond, "error") [18:41:50.917] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.917] NULL) [18:41:50.917] if (is_error) { [18:41:50.917] sessionInformation <- function() { [18:41:50.917] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.917] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.917] search = base::search(), system = base::Sys.info()) [18:41:50.917] } [18:41:50.917] ...future.conditions[[length(...future.conditions) + [18:41:50.917] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.917] cond$call), session = sessionInformation(), [18:41:50.917] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.917] signalCondition(cond) [18:41:50.917] } [18:41:50.917] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.917] "immediateCondition"))) { [18:41:50.917] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.917] ...future.conditions[[length(...future.conditions) + [18:41:50.917] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.917] if (TRUE && !signal) { [18:41:50.917] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.917] { [18:41:50.917] inherits <- base::inherits [18:41:50.917] invokeRestart <- base::invokeRestart [18:41:50.917] is.null <- base::is.null [18:41:50.917] muffled <- FALSE [18:41:50.917] if (inherits(cond, "message")) { [18:41:50.917] muffled <- grepl(pattern, "muffleMessage") [18:41:50.917] if (muffled) [18:41:50.917] invokeRestart("muffleMessage") [18:41:50.917] } [18:41:50.917] else if (inherits(cond, "warning")) { [18:41:50.917] muffled <- grepl(pattern, "muffleWarning") [18:41:50.917] if (muffled) [18:41:50.917] invokeRestart("muffleWarning") [18:41:50.917] } [18:41:50.917] else if (inherits(cond, "condition")) { [18:41:50.917] if (!is.null(pattern)) { [18:41:50.917] computeRestarts <- base::computeRestarts [18:41:50.917] grepl <- base::grepl [18:41:50.917] restarts <- computeRestarts(cond) [18:41:50.917] for (restart in restarts) { [18:41:50.917] name <- restart$name [18:41:50.917] if (is.null(name)) [18:41:50.917] next [18:41:50.917] if (!grepl(pattern, name)) [18:41:50.917] next [18:41:50.917] invokeRestart(restart) [18:41:50.917] muffled <- TRUE [18:41:50.917] break [18:41:50.917] } [18:41:50.917] } [18:41:50.917] } [18:41:50.917] invisible(muffled) [18:41:50.917] } [18:41:50.917] muffleCondition(cond, pattern = "^muffle") [18:41:50.917] } [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] if (TRUE) { [18:41:50.917] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.917] { [18:41:50.917] inherits <- base::inherits [18:41:50.917] invokeRestart <- base::invokeRestart [18:41:50.917] is.null <- base::is.null [18:41:50.917] muffled <- FALSE [18:41:50.917] if (inherits(cond, "message")) { [18:41:50.917] muffled <- grepl(pattern, "muffleMessage") [18:41:50.917] if (muffled) [18:41:50.917] invokeRestart("muffleMessage") [18:41:50.917] } [18:41:50.917] else if (inherits(cond, "warning")) { [18:41:50.917] muffled <- grepl(pattern, "muffleWarning") [18:41:50.917] if (muffled) [18:41:50.917] invokeRestart("muffleWarning") [18:41:50.917] } [18:41:50.917] else if (inherits(cond, "condition")) { [18:41:50.917] if (!is.null(pattern)) { [18:41:50.917] computeRestarts <- base::computeRestarts [18:41:50.917] grepl <- base::grepl [18:41:50.917] restarts <- computeRestarts(cond) [18:41:50.917] for (restart in restarts) { [18:41:50.917] name <- restart$name [18:41:50.917] if (is.null(name)) [18:41:50.917] next [18:41:50.917] if (!grepl(pattern, name)) [18:41:50.917] next [18:41:50.917] invokeRestart(restart) [18:41:50.917] muffled <- TRUE [18:41:50.917] break [18:41:50.917] } [18:41:50.917] } [18:41:50.917] } [18:41:50.917] invisible(muffled) [18:41:50.917] } [18:41:50.917] muffleCondition(cond, pattern = "^muffle") [18:41:50.917] } [18:41:50.917] } [18:41:50.917] } [18:41:50.917] })) [18:41:50.917] }, error = function(ex) { [18:41:50.917] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.917] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.917] ...future.rng), started = ...future.startTime, [18:41:50.917] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.917] version = "1.8"), class = "FutureResult") [18:41:50.917] }, finally = { [18:41:50.917] if (!identical(...future.workdir, getwd())) [18:41:50.917] setwd(...future.workdir) [18:41:50.917] { [18:41:50.917] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.917] ...future.oldOptions$nwarnings <- NULL [18:41:50.917] } [18:41:50.917] base::options(...future.oldOptions) [18:41:50.917] if (.Platform$OS.type == "windows") { [18:41:50.917] old_names <- names(...future.oldEnvVars) [18:41:50.917] envs <- base::Sys.getenv() [18:41:50.917] names <- names(envs) [18:41:50.917] common <- intersect(names, old_names) [18:41:50.917] added <- setdiff(names, old_names) [18:41:50.917] removed <- setdiff(old_names, names) [18:41:50.917] changed <- common[...future.oldEnvVars[common] != [18:41:50.917] envs[common]] [18:41:50.917] NAMES <- toupper(changed) [18:41:50.917] args <- list() [18:41:50.917] for (kk in seq_along(NAMES)) { [18:41:50.917] name <- changed[[kk]] [18:41:50.917] NAME <- NAMES[[kk]] [18:41:50.917] if (name != NAME && is.element(NAME, old_names)) [18:41:50.917] next [18:41:50.917] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.917] } [18:41:50.917] NAMES <- toupper(added) [18:41:50.917] for (kk in seq_along(NAMES)) { [18:41:50.917] name <- added[[kk]] [18:41:50.917] NAME <- NAMES[[kk]] [18:41:50.917] if (name != NAME && is.element(NAME, old_names)) [18:41:50.917] next [18:41:50.917] args[[name]] <- "" [18:41:50.917] } [18:41:50.917] NAMES <- toupper(removed) [18:41:50.917] for (kk in seq_along(NAMES)) { [18:41:50.917] name <- removed[[kk]] [18:41:50.917] NAME <- NAMES[[kk]] [18:41:50.917] if (name != NAME && is.element(NAME, old_names)) [18:41:50.917] next [18:41:50.917] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.917] } [18:41:50.917] if (length(args) > 0) [18:41:50.917] base::do.call(base::Sys.setenv, args = args) [18:41:50.917] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.917] } [18:41:50.917] { [18:41:50.917] if (base::length(...future.futureOptionsAdded) > [18:41:50.917] 0L) { [18:41:50.917] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.917] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.917] base::options(opts) [18:41:50.917] } [18:41:50.917] { [18:41:50.917] { [18:41:50.917] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.917] NULL [18:41:50.917] } [18:41:50.917] options(future.plan = NULL) [18:41:50.917] if (is.na(NA_character_)) [18:41:50.917] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.917] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.917] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.917] .init = FALSE) [18:41:50.917] } [18:41:50.917] } [18:41:50.917] } [18:41:50.917] }) [18:41:50.917] if (TRUE) { [18:41:50.917] base::sink(type = "output", split = FALSE) [18:41:50.917] if (TRUE) { [18:41:50.917] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.917] } [18:41:50.917] else { [18:41:50.917] ...future.result["stdout"] <- base::list(NULL) [18:41:50.917] } [18:41:50.917] base::close(...future.stdout) [18:41:50.917] ...future.stdout <- NULL [18:41:50.917] } [18:41:50.917] ...future.result$conditions <- ...future.conditions [18:41:50.917] ...future.result$finished <- base::Sys.time() [18:41:50.917] ...future.result [18:41:50.917] } [18:41:50.923] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:50.923] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:50.923] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:50.923] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.924] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.924] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.924] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.925] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.925] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.925] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.926] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.926] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:50.927] MultisessionFuture started [18:41:50.927] - Launch lazy future ... done [18:41:50.927] run() for 'MultisessionFuture' ... done [18:41:50.927] Created future: [18:41:50.940] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.940] - Validating connection of MultisessionFuture [18:41:50.940] - received message: FutureResult [18:41:50.940] - Received FutureResult [18:41:50.941] - Erased future from FutureRegistry [18:41:50.941] result() for ClusterFuture ... [18:41:50.941] - result already collected: FutureResult [18:41:50.941] result() for ClusterFuture ... done [18:41:50.941] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.927] MultisessionFuture: [18:41:50.927] Label: 'future_sapply-1' [18:41:50.927] Expression: [18:41:50.927] { [18:41:50.927] do.call(function(...) { [18:41:50.927] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.927] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.927] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.927] on.exit(options(oopts), add = TRUE) [18:41:50.927] } [18:41:50.927] { [18:41:50.927] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.927] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.927] ...future.FUN(...future.X_jj, ...) [18:41:50.927] }) [18:41:50.927] } [18:41:50.927] }, args = future.call.arguments) [18:41:50.927] } [18:41:50.927] Lazy evaluation: FALSE [18:41:50.927] Asynchronous evaluation: TRUE [18:41:50.927] Local evaluation: TRUE [18:41:50.927] Environment: R_GlobalEnv [18:41:50.927] Capture standard output: TRUE [18:41:50.927] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.927] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.927] Packages: [18:41:50.927] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.927] Resolved: TRUE [18:41:50.927] Value: [18:41:50.927] Conditions captured: [18:41:50.927] Early signaling: FALSE [18:41:50.927] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.927] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.942] Chunk #1 of 2 ... DONE [18:41:50.942] Chunk #2 of 2 ... [18:41:50.942] - Finding globals in 'X' for chunk #2 ... [18:41:50.942] getGlobalsAndPackages() ... [18:41:50.942] Searching for globals... [18:41:50.943] [18:41:50.943] Searching for globals ... DONE [18:41:50.943] - globals: [0] [18:41:50.943] getGlobalsAndPackages() ... DONE [18:41:50.943] + additional globals found: [n=0] [18:41:50.944] + additional namespaces needed: [n=0] [18:41:50.944] - Finding globals in 'X' for chunk #2 ... DONE [18:41:50.944] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:50.944] - seeds: [18:41:50.944] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.944] getGlobalsAndPackages() ... [18:41:50.945] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.945] Resolving globals: FALSE [18:41:50.945] Tweak future expression to call with '...' arguments ... [18:41:50.945] { [18:41:50.945] do.call(function(...) { [18:41:50.945] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.945] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.945] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.945] on.exit(options(oopts), add = TRUE) [18:41:50.945] } [18:41:50.945] { [18:41:50.945] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.945] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.945] ...future.FUN(...future.X_jj, ...) [18:41:50.945] }) [18:41:50.945] } [18:41:50.945] }, args = future.call.arguments) [18:41:50.945] } [18:41:50.946] Tweak future expression to call with '...' arguments ... DONE [18:41:50.946] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:50.946] [18:41:50.946] getGlobalsAndPackages() ... DONE [18:41:50.947] run() for 'Future' ... [18:41:50.947] - state: 'created' [18:41:50.947] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:50.966] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.966] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:50.966] - Field: 'node' [18:41:50.966] - Field: 'label' [18:41:50.966] - Field: 'local' [18:41:50.967] - Field: 'owner' [18:41:50.967] - Field: 'envir' [18:41:50.967] - Field: 'workers' [18:41:50.967] - Field: 'packages' [18:41:50.967] - Field: 'gc' [18:41:50.967] - Field: 'conditions' [18:41:50.968] - Field: 'persistent' [18:41:50.968] - Field: 'expr' [18:41:50.968] - Field: 'uuid' [18:41:50.968] - Field: 'seed' [18:41:50.968] - Field: 'version' [18:41:50.969] - Field: 'result' [18:41:50.969] - Field: 'asynchronous' [18:41:50.969] - Field: 'calls' [18:41:50.969] - Field: 'globals' [18:41:50.969] - Field: 'stdout' [18:41:50.970] - Field: 'earlySignal' [18:41:50.970] - Field: 'lazy' [18:41:50.970] - Field: 'state' [18:41:50.970] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:50.970] - Launch lazy future ... [18:41:50.971] Packages needed by the future expression (n = 0): [18:41:50.971] Packages needed by future strategies (n = 0): [18:41:50.971] { [18:41:50.971] { [18:41:50.971] { [18:41:50.971] ...future.startTime <- base::Sys.time() [18:41:50.971] { [18:41:50.971] { [18:41:50.971] { [18:41:50.971] { [18:41:50.971] base::local({ [18:41:50.971] has_future <- base::requireNamespace("future", [18:41:50.971] quietly = TRUE) [18:41:50.971] if (has_future) { [18:41:50.971] ns <- base::getNamespace("future") [18:41:50.971] version <- ns[[".package"]][["version"]] [18:41:50.971] if (is.null(version)) [18:41:50.971] version <- utils::packageVersion("future") [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] version <- NULL [18:41:50.971] } [18:41:50.971] if (!has_future || version < "1.8.0") { [18:41:50.971] info <- base::c(r_version = base::gsub("R version ", [18:41:50.971] "", base::R.version$version.string), [18:41:50.971] platform = base::sprintf("%s (%s-bit)", [18:41:50.971] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:50.971] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:50.971] "release", "version")], collapse = " "), [18:41:50.971] hostname = base::Sys.info()[["nodename"]]) [18:41:50.971] info <- base::sprintf("%s: %s", base::names(info), [18:41:50.971] info) [18:41:50.971] info <- base::paste(info, collapse = "; ") [18:41:50.971] if (!has_future) { [18:41:50.971] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:50.971] info) [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:50.971] info, version) [18:41:50.971] } [18:41:50.971] base::stop(msg) [18:41:50.971] } [18:41:50.971] }) [18:41:50.971] } [18:41:50.971] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:50.971] base::options(mc.cores = 1L) [18:41:50.971] } [18:41:50.971] ...future.strategy.old <- future::plan("list") [18:41:50.971] options(future.plan = NULL) [18:41:50.971] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.971] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:50.971] } [18:41:50.971] ...future.workdir <- getwd() [18:41:50.971] } [18:41:50.971] ...future.oldOptions <- base::as.list(base::.Options) [18:41:50.971] ...future.oldEnvVars <- base::Sys.getenv() [18:41:50.971] } [18:41:50.971] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:50.971] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:50.971] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:50.971] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:50.971] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:50.971] future.stdout.windows.reencode = NULL, width = 80L) [18:41:50.971] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:50.971] base::names(...future.oldOptions)) [18:41:50.971] } [18:41:50.971] if (FALSE) { [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] if (TRUE) { [18:41:50.971] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:50.971] open = "w") [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:50.971] windows = "NUL", "/dev/null"), open = "w") [18:41:50.971] } [18:41:50.971] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:50.971] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:50.971] base::sink(type = "output", split = FALSE) [18:41:50.971] base::close(...future.stdout) [18:41:50.971] }, add = TRUE) [18:41:50.971] } [18:41:50.971] ...future.frame <- base::sys.nframe() [18:41:50.971] ...future.conditions <- base::list() [18:41:50.971] ...future.rng <- base::globalenv()$.Random.seed [18:41:50.971] if (FALSE) { [18:41:50.971] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:50.971] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:50.971] } [18:41:50.971] ...future.result <- base::tryCatch({ [18:41:50.971] base::withCallingHandlers({ [18:41:50.971] ...future.value <- base::withVisible(base::local({ [18:41:50.971] ...future.makeSendCondition <- base::local({ [18:41:50.971] sendCondition <- NULL [18:41:50.971] function(frame = 1L) { [18:41:50.971] if (is.function(sendCondition)) [18:41:50.971] return(sendCondition) [18:41:50.971] ns <- getNamespace("parallel") [18:41:50.971] if (exists("sendData", mode = "function", [18:41:50.971] envir = ns)) { [18:41:50.971] parallel_sendData <- get("sendData", mode = "function", [18:41:50.971] envir = ns) [18:41:50.971] envir <- sys.frame(frame) [18:41:50.971] master <- NULL [18:41:50.971] while (!identical(envir, .GlobalEnv) && [18:41:50.971] !identical(envir, emptyenv())) { [18:41:50.971] if (exists("master", mode = "list", envir = envir, [18:41:50.971] inherits = FALSE)) { [18:41:50.971] master <- get("master", mode = "list", [18:41:50.971] envir = envir, inherits = FALSE) [18:41:50.971] if (inherits(master, c("SOCKnode", [18:41:50.971] "SOCK0node"))) { [18:41:50.971] sendCondition <<- function(cond) { [18:41:50.971] data <- list(type = "VALUE", value = cond, [18:41:50.971] success = TRUE) [18:41:50.971] parallel_sendData(master, data) [18:41:50.971] } [18:41:50.971] return(sendCondition) [18:41:50.971] } [18:41:50.971] } [18:41:50.971] frame <- frame + 1L [18:41:50.971] envir <- sys.frame(frame) [18:41:50.971] } [18:41:50.971] } [18:41:50.971] sendCondition <<- function(cond) NULL [18:41:50.971] } [18:41:50.971] }) [18:41:50.971] withCallingHandlers({ [18:41:50.971] { [18:41:50.971] do.call(function(...) { [18:41:50.971] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.971] if (!identical(...future.globals.maxSize.org, [18:41:50.971] ...future.globals.maxSize)) { [18:41:50.971] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.971] on.exit(options(oopts), add = TRUE) [18:41:50.971] } [18:41:50.971] { [18:41:50.971] lapply(seq_along(...future.elements_ii), [18:41:50.971] FUN = function(jj) { [18:41:50.971] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.971] ...future.FUN(...future.X_jj, ...) [18:41:50.971] }) [18:41:50.971] } [18:41:50.971] }, args = future.call.arguments) [18:41:50.971] } [18:41:50.971] }, immediateCondition = function(cond) { [18:41:50.971] sendCondition <- ...future.makeSendCondition() [18:41:50.971] sendCondition(cond) [18:41:50.971] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.971] { [18:41:50.971] inherits <- base::inherits [18:41:50.971] invokeRestart <- base::invokeRestart [18:41:50.971] is.null <- base::is.null [18:41:50.971] muffled <- FALSE [18:41:50.971] if (inherits(cond, "message")) { [18:41:50.971] muffled <- grepl(pattern, "muffleMessage") [18:41:50.971] if (muffled) [18:41:50.971] invokeRestart("muffleMessage") [18:41:50.971] } [18:41:50.971] else if (inherits(cond, "warning")) { [18:41:50.971] muffled <- grepl(pattern, "muffleWarning") [18:41:50.971] if (muffled) [18:41:50.971] invokeRestart("muffleWarning") [18:41:50.971] } [18:41:50.971] else if (inherits(cond, "condition")) { [18:41:50.971] if (!is.null(pattern)) { [18:41:50.971] computeRestarts <- base::computeRestarts [18:41:50.971] grepl <- base::grepl [18:41:50.971] restarts <- computeRestarts(cond) [18:41:50.971] for (restart in restarts) { [18:41:50.971] name <- restart$name [18:41:50.971] if (is.null(name)) [18:41:50.971] next [18:41:50.971] if (!grepl(pattern, name)) [18:41:50.971] next [18:41:50.971] invokeRestart(restart) [18:41:50.971] muffled <- TRUE [18:41:50.971] break [18:41:50.971] } [18:41:50.971] } [18:41:50.971] } [18:41:50.971] invisible(muffled) [18:41:50.971] } [18:41:50.971] muffleCondition(cond) [18:41:50.971] }) [18:41:50.971] })) [18:41:50.971] future::FutureResult(value = ...future.value$value, [18:41:50.971] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.971] ...future.rng), globalenv = if (FALSE) [18:41:50.971] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:50.971] ...future.globalenv.names)) [18:41:50.971] else NULL, started = ...future.startTime, version = "1.8") [18:41:50.971] }, condition = base::local({ [18:41:50.971] c <- base::c [18:41:50.971] inherits <- base::inherits [18:41:50.971] invokeRestart <- base::invokeRestart [18:41:50.971] length <- base::length [18:41:50.971] list <- base::list [18:41:50.971] seq.int <- base::seq.int [18:41:50.971] signalCondition <- base::signalCondition [18:41:50.971] sys.calls <- base::sys.calls [18:41:50.971] `[[` <- base::`[[` [18:41:50.971] `+` <- base::`+` [18:41:50.971] `<<-` <- base::`<<-` [18:41:50.971] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:50.971] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:50.971] 3L)] [18:41:50.971] } [18:41:50.971] function(cond) { [18:41:50.971] is_error <- inherits(cond, "error") [18:41:50.971] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:50.971] NULL) [18:41:50.971] if (is_error) { [18:41:50.971] sessionInformation <- function() { [18:41:50.971] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:50.971] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:50.971] search = base::search(), system = base::Sys.info()) [18:41:50.971] } [18:41:50.971] ...future.conditions[[length(...future.conditions) + [18:41:50.971] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:50.971] cond$call), session = sessionInformation(), [18:41:50.971] timestamp = base::Sys.time(), signaled = 0L) [18:41:50.971] signalCondition(cond) [18:41:50.971] } [18:41:50.971] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:50.971] "immediateCondition"))) { [18:41:50.971] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:50.971] ...future.conditions[[length(...future.conditions) + [18:41:50.971] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:50.971] if (TRUE && !signal) { [18:41:50.971] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.971] { [18:41:50.971] inherits <- base::inherits [18:41:50.971] invokeRestart <- base::invokeRestart [18:41:50.971] is.null <- base::is.null [18:41:50.971] muffled <- FALSE [18:41:50.971] if (inherits(cond, "message")) { [18:41:50.971] muffled <- grepl(pattern, "muffleMessage") [18:41:50.971] if (muffled) [18:41:50.971] invokeRestart("muffleMessage") [18:41:50.971] } [18:41:50.971] else if (inherits(cond, "warning")) { [18:41:50.971] muffled <- grepl(pattern, "muffleWarning") [18:41:50.971] if (muffled) [18:41:50.971] invokeRestart("muffleWarning") [18:41:50.971] } [18:41:50.971] else if (inherits(cond, "condition")) { [18:41:50.971] if (!is.null(pattern)) { [18:41:50.971] computeRestarts <- base::computeRestarts [18:41:50.971] grepl <- base::grepl [18:41:50.971] restarts <- computeRestarts(cond) [18:41:50.971] for (restart in restarts) { [18:41:50.971] name <- restart$name [18:41:50.971] if (is.null(name)) [18:41:50.971] next [18:41:50.971] if (!grepl(pattern, name)) [18:41:50.971] next [18:41:50.971] invokeRestart(restart) [18:41:50.971] muffled <- TRUE [18:41:50.971] break [18:41:50.971] } [18:41:50.971] } [18:41:50.971] } [18:41:50.971] invisible(muffled) [18:41:50.971] } [18:41:50.971] muffleCondition(cond, pattern = "^muffle") [18:41:50.971] } [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] if (TRUE) { [18:41:50.971] muffleCondition <- function (cond, pattern = "^muffle") [18:41:50.971] { [18:41:50.971] inherits <- base::inherits [18:41:50.971] invokeRestart <- base::invokeRestart [18:41:50.971] is.null <- base::is.null [18:41:50.971] muffled <- FALSE [18:41:50.971] if (inherits(cond, "message")) { [18:41:50.971] muffled <- grepl(pattern, "muffleMessage") [18:41:50.971] if (muffled) [18:41:50.971] invokeRestart("muffleMessage") [18:41:50.971] } [18:41:50.971] else if (inherits(cond, "warning")) { [18:41:50.971] muffled <- grepl(pattern, "muffleWarning") [18:41:50.971] if (muffled) [18:41:50.971] invokeRestart("muffleWarning") [18:41:50.971] } [18:41:50.971] else if (inherits(cond, "condition")) { [18:41:50.971] if (!is.null(pattern)) { [18:41:50.971] computeRestarts <- base::computeRestarts [18:41:50.971] grepl <- base::grepl [18:41:50.971] restarts <- computeRestarts(cond) [18:41:50.971] for (restart in restarts) { [18:41:50.971] name <- restart$name [18:41:50.971] if (is.null(name)) [18:41:50.971] next [18:41:50.971] if (!grepl(pattern, name)) [18:41:50.971] next [18:41:50.971] invokeRestart(restart) [18:41:50.971] muffled <- TRUE [18:41:50.971] break [18:41:50.971] } [18:41:50.971] } [18:41:50.971] } [18:41:50.971] invisible(muffled) [18:41:50.971] } [18:41:50.971] muffleCondition(cond, pattern = "^muffle") [18:41:50.971] } [18:41:50.971] } [18:41:50.971] } [18:41:50.971] })) [18:41:50.971] }, error = function(ex) { [18:41:50.971] base::structure(base::list(value = NULL, visible = NULL, [18:41:50.971] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:50.971] ...future.rng), started = ...future.startTime, [18:41:50.971] finished = Sys.time(), session_uuid = NA_character_, [18:41:50.971] version = "1.8"), class = "FutureResult") [18:41:50.971] }, finally = { [18:41:50.971] if (!identical(...future.workdir, getwd())) [18:41:50.971] setwd(...future.workdir) [18:41:50.971] { [18:41:50.971] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:50.971] ...future.oldOptions$nwarnings <- NULL [18:41:50.971] } [18:41:50.971] base::options(...future.oldOptions) [18:41:50.971] if (.Platform$OS.type == "windows") { [18:41:50.971] old_names <- names(...future.oldEnvVars) [18:41:50.971] envs <- base::Sys.getenv() [18:41:50.971] names <- names(envs) [18:41:50.971] common <- intersect(names, old_names) [18:41:50.971] added <- setdiff(names, old_names) [18:41:50.971] removed <- setdiff(old_names, names) [18:41:50.971] changed <- common[...future.oldEnvVars[common] != [18:41:50.971] envs[common]] [18:41:50.971] NAMES <- toupper(changed) [18:41:50.971] args <- list() [18:41:50.971] for (kk in seq_along(NAMES)) { [18:41:50.971] name <- changed[[kk]] [18:41:50.971] NAME <- NAMES[[kk]] [18:41:50.971] if (name != NAME && is.element(NAME, old_names)) [18:41:50.971] next [18:41:50.971] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.971] } [18:41:50.971] NAMES <- toupper(added) [18:41:50.971] for (kk in seq_along(NAMES)) { [18:41:50.971] name <- added[[kk]] [18:41:50.971] NAME <- NAMES[[kk]] [18:41:50.971] if (name != NAME && is.element(NAME, old_names)) [18:41:50.971] next [18:41:50.971] args[[name]] <- "" [18:41:50.971] } [18:41:50.971] NAMES <- toupper(removed) [18:41:50.971] for (kk in seq_along(NAMES)) { [18:41:50.971] name <- removed[[kk]] [18:41:50.971] NAME <- NAMES[[kk]] [18:41:50.971] if (name != NAME && is.element(NAME, old_names)) [18:41:50.971] next [18:41:50.971] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:50.971] } [18:41:50.971] if (length(args) > 0) [18:41:50.971] base::do.call(base::Sys.setenv, args = args) [18:41:50.971] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:50.971] } [18:41:50.971] { [18:41:50.971] if (base::length(...future.futureOptionsAdded) > [18:41:50.971] 0L) { [18:41:50.971] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:50.971] base::names(opts) <- ...future.futureOptionsAdded [18:41:50.971] base::options(opts) [18:41:50.971] } [18:41:50.971] { [18:41:50.971] { [18:41:50.971] base::options(mc.cores = ...future.mc.cores.old) [18:41:50.971] NULL [18:41:50.971] } [18:41:50.971] options(future.plan = NULL) [18:41:50.971] if (is.na(NA_character_)) [18:41:50.971] Sys.unsetenv("R_FUTURE_PLAN") [18:41:50.971] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:50.971] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:50.971] .init = FALSE) [18:41:50.971] } [18:41:50.971] } [18:41:50.971] } [18:41:50.971] }) [18:41:50.971] if (TRUE) { [18:41:50.971] base::sink(type = "output", split = FALSE) [18:41:50.971] if (TRUE) { [18:41:50.971] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:50.971] } [18:41:50.971] else { [18:41:50.971] ...future.result["stdout"] <- base::list(NULL) [18:41:50.971] } [18:41:50.971] base::close(...future.stdout) [18:41:50.971] ...future.stdout <- NULL [18:41:50.971] } [18:41:50.971] ...future.result$conditions <- ...future.conditions [18:41:50.971] ...future.result$finished <- base::Sys.time() [18:41:50.971] ...future.result [18:41:50.971] } [18:41:50.977] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:50.977] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:50.977] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:50.977] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:50.978] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:50.978] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:50.978] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:50.979] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:50.979] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:50.979] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:50.980] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:50.980] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:50.981] MultisessionFuture started [18:41:50.981] - Launch lazy future ... done [18:41:50.981] run() for 'MultisessionFuture' ... done [18:41:50.981] Created future: [18:41:50.995] receiveMessageFromWorker() for ClusterFuture ... [18:41:50.995] - Validating connection of MultisessionFuture [18:41:50.995] - received message: FutureResult [18:41:50.996] - Received FutureResult [18:41:50.996] - Erased future from FutureRegistry [18:41:50.996] result() for ClusterFuture ... [18:41:50.996] - result already collected: FutureResult [18:41:50.996] result() for ClusterFuture ... done [18:41:50.996] receiveMessageFromWorker() for ClusterFuture ... done [18:41:50.981] MultisessionFuture: [18:41:50.981] Label: 'future_sapply-2' [18:41:50.981] Expression: [18:41:50.981] { [18:41:50.981] do.call(function(...) { [18:41:50.981] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:50.981] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:50.981] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:50.981] on.exit(options(oopts), add = TRUE) [18:41:50.981] } [18:41:50.981] { [18:41:50.981] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:50.981] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:50.981] ...future.FUN(...future.X_jj, ...) [18:41:50.981] }) [18:41:50.981] } [18:41:50.981] }, args = future.call.arguments) [18:41:50.981] } [18:41:50.981] Lazy evaluation: FALSE [18:41:50.981] Asynchronous evaluation: TRUE [18:41:50.981] Local evaluation: TRUE [18:41:50.981] Environment: R_GlobalEnv [18:41:50.981] Capture standard output: TRUE [18:41:50.981] Capture condition classes: 'condition' (excluding 'nothing') [18:41:50.981] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:50.981] Packages: [18:41:50.981] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:50.981] Resolved: TRUE [18:41:50.981] Value: [18:41:50.981] Conditions captured: [18:41:50.981] Early signaling: FALSE [18:41:50.981] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:50.981] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:50.997] Chunk #2 of 2 ... DONE [18:41:50.997] Launching 2 futures (chunks) ... DONE [18:41:50.997] Resolving 2 futures (chunks) ... [18:41:50.997] resolve() on list ... [18:41:50.997] recursive: 0 [18:41:50.998] length: 2 [18:41:50.998] [18:41:50.998] Future #1 [18:41:50.998] result() for ClusterFuture ... [18:41:50.998] - result already collected: FutureResult [18:41:50.998] result() for ClusterFuture ... done [18:41:50.999] result() for ClusterFuture ... [18:41:50.999] - result already collected: FutureResult [18:41:50.999] result() for ClusterFuture ... done [18:41:50.999] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:50.999] - nx: 2 [18:41:50.999] - relay: TRUE [18:41:51.000] - stdout: TRUE [18:41:51.000] - signal: TRUE [18:41:51.000] - resignal: FALSE [18:41:51.000] - force: TRUE [18:41:51.000] - relayed: [n=2] FALSE, FALSE [18:41:51.000] - queued futures: [n=2] FALSE, FALSE [18:41:51.000] - until=1 [18:41:51.001] - relaying element #1 [18:41:51.001] result() for ClusterFuture ... [18:41:51.001] - result already collected: FutureResult [18:41:51.001] result() for ClusterFuture ... done [18:41:51.001] result() for ClusterFuture ... [18:41:51.001] - result already collected: FutureResult [18:41:51.002] result() for ClusterFuture ... done [18:41:51.002] result() for ClusterFuture ... [18:41:51.002] - result already collected: FutureResult [18:41:51.002] result() for ClusterFuture ... done [18:41:51.002] result() for ClusterFuture ... [18:41:51.002] - result already collected: FutureResult [18:41:51.003] result() for ClusterFuture ... done [18:41:51.003] - relayed: [n=2] TRUE, FALSE [18:41:51.003] - queued futures: [n=2] TRUE, FALSE [18:41:51.003] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.003] length: 1 (resolved future 1) [18:41:51.003] Future #2 [18:41:51.004] result() for ClusterFuture ... [18:41:51.004] - result already collected: FutureResult [18:41:51.004] result() for ClusterFuture ... done [18:41:51.004] result() for ClusterFuture ... [18:41:51.004] - result already collected: FutureResult [18:41:51.004] result() for ClusterFuture ... done [18:41:51.005] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.005] - nx: 2 [18:41:51.005] - relay: TRUE [18:41:51.005] - stdout: TRUE [18:41:51.005] - signal: TRUE [18:41:51.005] - resignal: FALSE [18:41:51.005] - force: TRUE [18:41:51.006] - relayed: [n=2] TRUE, FALSE [18:41:51.006] - queued futures: [n=2] TRUE, FALSE [18:41:51.006] - until=2 [18:41:51.006] - relaying element #2 [18:41:51.006] result() for ClusterFuture ... [18:41:51.006] - result already collected: FutureResult [18:41:51.007] result() for ClusterFuture ... done [18:41:51.007] result() for ClusterFuture ... [18:41:51.007] - result already collected: FutureResult [18:41:51.007] result() for ClusterFuture ... done [18:41:51.007] result() for ClusterFuture ... [18:41:51.007] - result already collected: FutureResult [18:41:51.008] result() for ClusterFuture ... done [18:41:51.008] result() for ClusterFuture ... [18:41:51.008] - result already collected: FutureResult [18:41:51.008] result() for ClusterFuture ... done [18:41:51.008] - relayed: [n=2] TRUE, TRUE [18:41:51.008] - queued futures: [n=2] TRUE, TRUE [18:41:51.009] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.009] length: 0 (resolved future 2) [18:41:51.009] Relaying remaining futures [18:41:51.009] signalConditionsASAP(NULL, pos=0) ... [18:41:51.009] - nx: 2 [18:41:51.009] - relay: TRUE [18:41:51.009] - stdout: TRUE [18:41:51.010] - signal: TRUE [18:41:51.010] - resignal: FALSE [18:41:51.010] - force: TRUE [18:41:51.010] - relayed: [n=2] TRUE, TRUE [18:41:51.010] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.010] - relayed: [n=2] TRUE, TRUE [18:41:51.011] - queued futures: [n=2] TRUE, TRUE [18:41:51.011] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.011] resolve() on list ... DONE [18:41:51.011] result() for ClusterFuture ... [18:41:51.011] - result already collected: FutureResult [18:41:51.011] result() for ClusterFuture ... done [18:41:51.012] result() for ClusterFuture ... [18:41:51.012] - result already collected: FutureResult [18:41:51.012] result() for ClusterFuture ... done [18:41:51.012] result() for ClusterFuture ... [18:41:51.012] - result already collected: FutureResult [18:41:51.013] result() for ClusterFuture ... done [18:41:51.013] result() for ClusterFuture ... [18:41:51.013] - result already collected: FutureResult [18:41:51.013] result() for ClusterFuture ... done [18:41:51.013] - Number of value chunks collected: 2 [18:41:51.013] Resolving 2 futures (chunks) ... DONE [18:41:51.014] Reducing values from 2 chunks ... [18:41:51.014] - Number of values collected after concatenation: 6 [18:41:51.014] - Number of values expected: 6 [18:41:51.014] Reducing values from 2 chunks ... DONE [18:41:51.014] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:51.016] future_lapply() ... [18:41:51.020] Number of chunks: 2 [18:41:51.020] getGlobalsAndPackagesXApply() ... [18:41:51.020] - future.globals: TRUE [18:41:51.020] getGlobalsAndPackages() ... [18:41:51.020] Searching for globals... [18:41:51.022] - globals found: [2] 'FUN', 'UseMethod' [18:41:51.022] Searching for globals ... DONE [18:41:51.022] Resolving globals: FALSE [18:41:51.023] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:51.023] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:51.023] - globals: [1] 'FUN' [18:41:51.024] [18:41:51.024] getGlobalsAndPackages() ... DONE [18:41:51.024] - globals found/used: [n=1] 'FUN' [18:41:51.024] - needed namespaces: [n=0] [18:41:51.024] Finding globals ... DONE [18:41:51.024] - use_args: TRUE [18:41:51.025] - Getting '...' globals ... [18:41:51.025] resolve() on list ... [18:41:51.025] recursive: 0 [18:41:51.025] length: 1 [18:41:51.025] elements: '...' [18:41:51.026] length: 0 (resolved future 1) [18:41:51.026] resolve() on list ... DONE [18:41:51.026] - '...' content: [n=0] [18:41:51.026] List of 1 [18:41:51.026] $ ...: list() [18:41:51.026] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.026] - attr(*, "where")=List of 1 [18:41:51.026] ..$ ...: [18:41:51.026] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.026] - attr(*, "resolved")= logi TRUE [18:41:51.026] - attr(*, "total_size")= num NA [18:41:51.029] - Getting '...' globals ... DONE [18:41:51.029] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:51.030] List of 2 [18:41:51.030] $ ...future.FUN:function (x, ...) [18:41:51.030] $ ... : list() [18:41:51.030] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.030] - attr(*, "where")=List of 2 [18:41:51.030] ..$ ...future.FUN: [18:41:51.030] ..$ ... : [18:41:51.030] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.030] - attr(*, "resolved")= logi FALSE [18:41:51.030] - attr(*, "total_size")= int 5182 [18:41:51.033] Packages to be attached in all futures: [n=0] [18:41:51.033] getGlobalsAndPackagesXApply() ... DONE [18:41:51.034] Number of futures (= number of chunks): 2 [18:41:51.034] Launching 2 futures (chunks) ... [18:41:51.034] Chunk #1 of 2 ... [18:41:51.034] - Finding globals in 'X' for chunk #1 ... [18:41:51.034] getGlobalsAndPackages() ... [18:41:51.034] Searching for globals... [18:41:51.035] [18:41:51.035] Searching for globals ... DONE [18:41:51.035] - globals: [0] [18:41:51.035] getGlobalsAndPackages() ... DONE [18:41:51.036] + additional globals found: [n=0] [18:41:51.036] + additional namespaces needed: [n=0] [18:41:51.036] - Finding globals in 'X' for chunk #1 ... DONE [18:41:51.036] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.036] - seeds: [18:41:51.036] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.037] getGlobalsAndPackages() ... [18:41:51.037] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.037] Resolving globals: FALSE [18:41:51.037] Tweak future expression to call with '...' arguments ... [18:41:51.037] { [18:41:51.037] do.call(function(...) { [18:41:51.037] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.037] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.037] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.037] on.exit(options(oopts), add = TRUE) [18:41:51.037] } [18:41:51.037] { [18:41:51.037] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.037] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.037] ...future.FUN(...future.X_jj, ...) [18:41:51.037] }) [18:41:51.037] } [18:41:51.037] }, args = future.call.arguments) [18:41:51.037] } [18:41:51.038] Tweak future expression to call with '...' arguments ... DONE [18:41:51.038] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.038] [18:41:51.039] getGlobalsAndPackages() ... DONE [18:41:51.039] run() for 'Future' ... [18:41:51.039] - state: 'created' [18:41:51.039] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.055] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.056] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.056] - Field: 'node' [18:41:51.060] - Field: 'label' [18:41:51.060] - Field: 'local' [18:41:51.060] - Field: 'owner' [18:41:51.060] - Field: 'envir' [18:41:51.060] - Field: 'workers' [18:41:51.061] - Field: 'packages' [18:41:51.061] - Field: 'gc' [18:41:51.061] - Field: 'conditions' [18:41:51.062] - Field: 'persistent' [18:41:51.062] - Field: 'expr' [18:41:51.062] - Field: 'uuid' [18:41:51.062] - Field: 'seed' [18:41:51.063] - Field: 'version' [18:41:51.063] - Field: 'result' [18:41:51.063] - Field: 'asynchronous' [18:41:51.063] - Field: 'calls' [18:41:51.064] - Field: 'globals' [18:41:51.064] - Field: 'stdout' [18:41:51.064] - Field: 'earlySignal' [18:41:51.065] - Field: 'lazy' [18:41:51.065] - Field: 'state' [18:41:51.065] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.065] - Launch lazy future ... [18:41:51.066] Packages needed by the future expression (n = 0): [18:41:51.066] Packages needed by future strategies (n = 0): [18:41:51.067] { [18:41:51.067] { [18:41:51.067] { [18:41:51.067] ...future.startTime <- base::Sys.time() [18:41:51.067] { [18:41:51.067] { [18:41:51.067] { [18:41:51.067] { [18:41:51.067] base::local({ [18:41:51.067] has_future <- base::requireNamespace("future", [18:41:51.067] quietly = TRUE) [18:41:51.067] if (has_future) { [18:41:51.067] ns <- base::getNamespace("future") [18:41:51.067] version <- ns[[".package"]][["version"]] [18:41:51.067] if (is.null(version)) [18:41:51.067] version <- utils::packageVersion("future") [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] version <- NULL [18:41:51.067] } [18:41:51.067] if (!has_future || version < "1.8.0") { [18:41:51.067] info <- base::c(r_version = base::gsub("R version ", [18:41:51.067] "", base::R.version$version.string), [18:41:51.067] platform = base::sprintf("%s (%s-bit)", [18:41:51.067] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.067] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.067] "release", "version")], collapse = " "), [18:41:51.067] hostname = base::Sys.info()[["nodename"]]) [18:41:51.067] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.067] info) [18:41:51.067] info <- base::paste(info, collapse = "; ") [18:41:51.067] if (!has_future) { [18:41:51.067] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.067] info) [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.067] info, version) [18:41:51.067] } [18:41:51.067] base::stop(msg) [18:41:51.067] } [18:41:51.067] }) [18:41:51.067] } [18:41:51.067] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.067] base::options(mc.cores = 1L) [18:41:51.067] } [18:41:51.067] ...future.strategy.old <- future::plan("list") [18:41:51.067] options(future.plan = NULL) [18:41:51.067] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.067] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.067] } [18:41:51.067] ...future.workdir <- getwd() [18:41:51.067] } [18:41:51.067] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.067] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.067] } [18:41:51.067] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.067] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.067] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.067] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.067] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.067] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.067] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.067] base::names(...future.oldOptions)) [18:41:51.067] } [18:41:51.067] if (FALSE) { [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] if (TRUE) { [18:41:51.067] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.067] open = "w") [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.067] windows = "NUL", "/dev/null"), open = "w") [18:41:51.067] } [18:41:51.067] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.067] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.067] base::sink(type = "output", split = FALSE) [18:41:51.067] base::close(...future.stdout) [18:41:51.067] }, add = TRUE) [18:41:51.067] } [18:41:51.067] ...future.frame <- base::sys.nframe() [18:41:51.067] ...future.conditions <- base::list() [18:41:51.067] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.067] if (FALSE) { [18:41:51.067] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.067] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.067] } [18:41:51.067] ...future.result <- base::tryCatch({ [18:41:51.067] base::withCallingHandlers({ [18:41:51.067] ...future.value <- base::withVisible(base::local({ [18:41:51.067] ...future.makeSendCondition <- base::local({ [18:41:51.067] sendCondition <- NULL [18:41:51.067] function(frame = 1L) { [18:41:51.067] if (is.function(sendCondition)) [18:41:51.067] return(sendCondition) [18:41:51.067] ns <- getNamespace("parallel") [18:41:51.067] if (exists("sendData", mode = "function", [18:41:51.067] envir = ns)) { [18:41:51.067] parallel_sendData <- get("sendData", mode = "function", [18:41:51.067] envir = ns) [18:41:51.067] envir <- sys.frame(frame) [18:41:51.067] master <- NULL [18:41:51.067] while (!identical(envir, .GlobalEnv) && [18:41:51.067] !identical(envir, emptyenv())) { [18:41:51.067] if (exists("master", mode = "list", envir = envir, [18:41:51.067] inherits = FALSE)) { [18:41:51.067] master <- get("master", mode = "list", [18:41:51.067] envir = envir, inherits = FALSE) [18:41:51.067] if (inherits(master, c("SOCKnode", [18:41:51.067] "SOCK0node"))) { [18:41:51.067] sendCondition <<- function(cond) { [18:41:51.067] data <- list(type = "VALUE", value = cond, [18:41:51.067] success = TRUE) [18:41:51.067] parallel_sendData(master, data) [18:41:51.067] } [18:41:51.067] return(sendCondition) [18:41:51.067] } [18:41:51.067] } [18:41:51.067] frame <- frame + 1L [18:41:51.067] envir <- sys.frame(frame) [18:41:51.067] } [18:41:51.067] } [18:41:51.067] sendCondition <<- function(cond) NULL [18:41:51.067] } [18:41:51.067] }) [18:41:51.067] withCallingHandlers({ [18:41:51.067] { [18:41:51.067] do.call(function(...) { [18:41:51.067] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.067] if (!identical(...future.globals.maxSize.org, [18:41:51.067] ...future.globals.maxSize)) { [18:41:51.067] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.067] on.exit(options(oopts), add = TRUE) [18:41:51.067] } [18:41:51.067] { [18:41:51.067] lapply(seq_along(...future.elements_ii), [18:41:51.067] FUN = function(jj) { [18:41:51.067] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.067] ...future.FUN(...future.X_jj, ...) [18:41:51.067] }) [18:41:51.067] } [18:41:51.067] }, args = future.call.arguments) [18:41:51.067] } [18:41:51.067] }, immediateCondition = function(cond) { [18:41:51.067] sendCondition <- ...future.makeSendCondition() [18:41:51.067] sendCondition(cond) [18:41:51.067] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.067] { [18:41:51.067] inherits <- base::inherits [18:41:51.067] invokeRestart <- base::invokeRestart [18:41:51.067] is.null <- base::is.null [18:41:51.067] muffled <- FALSE [18:41:51.067] if (inherits(cond, "message")) { [18:41:51.067] muffled <- grepl(pattern, "muffleMessage") [18:41:51.067] if (muffled) [18:41:51.067] invokeRestart("muffleMessage") [18:41:51.067] } [18:41:51.067] else if (inherits(cond, "warning")) { [18:41:51.067] muffled <- grepl(pattern, "muffleWarning") [18:41:51.067] if (muffled) [18:41:51.067] invokeRestart("muffleWarning") [18:41:51.067] } [18:41:51.067] else if (inherits(cond, "condition")) { [18:41:51.067] if (!is.null(pattern)) { [18:41:51.067] computeRestarts <- base::computeRestarts [18:41:51.067] grepl <- base::grepl [18:41:51.067] restarts <- computeRestarts(cond) [18:41:51.067] for (restart in restarts) { [18:41:51.067] name <- restart$name [18:41:51.067] if (is.null(name)) [18:41:51.067] next [18:41:51.067] if (!grepl(pattern, name)) [18:41:51.067] next [18:41:51.067] invokeRestart(restart) [18:41:51.067] muffled <- TRUE [18:41:51.067] break [18:41:51.067] } [18:41:51.067] } [18:41:51.067] } [18:41:51.067] invisible(muffled) [18:41:51.067] } [18:41:51.067] muffleCondition(cond) [18:41:51.067] }) [18:41:51.067] })) [18:41:51.067] future::FutureResult(value = ...future.value$value, [18:41:51.067] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.067] ...future.rng), globalenv = if (FALSE) [18:41:51.067] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.067] ...future.globalenv.names)) [18:41:51.067] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.067] }, condition = base::local({ [18:41:51.067] c <- base::c [18:41:51.067] inherits <- base::inherits [18:41:51.067] invokeRestart <- base::invokeRestart [18:41:51.067] length <- base::length [18:41:51.067] list <- base::list [18:41:51.067] seq.int <- base::seq.int [18:41:51.067] signalCondition <- base::signalCondition [18:41:51.067] sys.calls <- base::sys.calls [18:41:51.067] `[[` <- base::`[[` [18:41:51.067] `+` <- base::`+` [18:41:51.067] `<<-` <- base::`<<-` [18:41:51.067] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.067] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.067] 3L)] [18:41:51.067] } [18:41:51.067] function(cond) { [18:41:51.067] is_error <- inherits(cond, "error") [18:41:51.067] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.067] NULL) [18:41:51.067] if (is_error) { [18:41:51.067] sessionInformation <- function() { [18:41:51.067] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.067] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.067] search = base::search(), system = base::Sys.info()) [18:41:51.067] } [18:41:51.067] ...future.conditions[[length(...future.conditions) + [18:41:51.067] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.067] cond$call), session = sessionInformation(), [18:41:51.067] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.067] signalCondition(cond) [18:41:51.067] } [18:41:51.067] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.067] "immediateCondition"))) { [18:41:51.067] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.067] ...future.conditions[[length(...future.conditions) + [18:41:51.067] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.067] if (TRUE && !signal) { [18:41:51.067] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.067] { [18:41:51.067] inherits <- base::inherits [18:41:51.067] invokeRestart <- base::invokeRestart [18:41:51.067] is.null <- base::is.null [18:41:51.067] muffled <- FALSE [18:41:51.067] if (inherits(cond, "message")) { [18:41:51.067] muffled <- grepl(pattern, "muffleMessage") [18:41:51.067] if (muffled) [18:41:51.067] invokeRestart("muffleMessage") [18:41:51.067] } [18:41:51.067] else if (inherits(cond, "warning")) { [18:41:51.067] muffled <- grepl(pattern, "muffleWarning") [18:41:51.067] if (muffled) [18:41:51.067] invokeRestart("muffleWarning") [18:41:51.067] } [18:41:51.067] else if (inherits(cond, "condition")) { [18:41:51.067] if (!is.null(pattern)) { [18:41:51.067] computeRestarts <- base::computeRestarts [18:41:51.067] grepl <- base::grepl [18:41:51.067] restarts <- computeRestarts(cond) [18:41:51.067] for (restart in restarts) { [18:41:51.067] name <- restart$name [18:41:51.067] if (is.null(name)) [18:41:51.067] next [18:41:51.067] if (!grepl(pattern, name)) [18:41:51.067] next [18:41:51.067] invokeRestart(restart) [18:41:51.067] muffled <- TRUE [18:41:51.067] break [18:41:51.067] } [18:41:51.067] } [18:41:51.067] } [18:41:51.067] invisible(muffled) [18:41:51.067] } [18:41:51.067] muffleCondition(cond, pattern = "^muffle") [18:41:51.067] } [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] if (TRUE) { [18:41:51.067] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.067] { [18:41:51.067] inherits <- base::inherits [18:41:51.067] invokeRestart <- base::invokeRestart [18:41:51.067] is.null <- base::is.null [18:41:51.067] muffled <- FALSE [18:41:51.067] if (inherits(cond, "message")) { [18:41:51.067] muffled <- grepl(pattern, "muffleMessage") [18:41:51.067] if (muffled) [18:41:51.067] invokeRestart("muffleMessage") [18:41:51.067] } [18:41:51.067] else if (inherits(cond, "warning")) { [18:41:51.067] muffled <- grepl(pattern, "muffleWarning") [18:41:51.067] if (muffled) [18:41:51.067] invokeRestart("muffleWarning") [18:41:51.067] } [18:41:51.067] else if (inherits(cond, "condition")) { [18:41:51.067] if (!is.null(pattern)) { [18:41:51.067] computeRestarts <- base::computeRestarts [18:41:51.067] grepl <- base::grepl [18:41:51.067] restarts <- computeRestarts(cond) [18:41:51.067] for (restart in restarts) { [18:41:51.067] name <- restart$name [18:41:51.067] if (is.null(name)) [18:41:51.067] next [18:41:51.067] if (!grepl(pattern, name)) [18:41:51.067] next [18:41:51.067] invokeRestart(restart) [18:41:51.067] muffled <- TRUE [18:41:51.067] break [18:41:51.067] } [18:41:51.067] } [18:41:51.067] } [18:41:51.067] invisible(muffled) [18:41:51.067] } [18:41:51.067] muffleCondition(cond, pattern = "^muffle") [18:41:51.067] } [18:41:51.067] } [18:41:51.067] } [18:41:51.067] })) [18:41:51.067] }, error = function(ex) { [18:41:51.067] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.067] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.067] ...future.rng), started = ...future.startTime, [18:41:51.067] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.067] version = "1.8"), class = "FutureResult") [18:41:51.067] }, finally = { [18:41:51.067] if (!identical(...future.workdir, getwd())) [18:41:51.067] setwd(...future.workdir) [18:41:51.067] { [18:41:51.067] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.067] ...future.oldOptions$nwarnings <- NULL [18:41:51.067] } [18:41:51.067] base::options(...future.oldOptions) [18:41:51.067] if (.Platform$OS.type == "windows") { [18:41:51.067] old_names <- names(...future.oldEnvVars) [18:41:51.067] envs <- base::Sys.getenv() [18:41:51.067] names <- names(envs) [18:41:51.067] common <- intersect(names, old_names) [18:41:51.067] added <- setdiff(names, old_names) [18:41:51.067] removed <- setdiff(old_names, names) [18:41:51.067] changed <- common[...future.oldEnvVars[common] != [18:41:51.067] envs[common]] [18:41:51.067] NAMES <- toupper(changed) [18:41:51.067] args <- list() [18:41:51.067] for (kk in seq_along(NAMES)) { [18:41:51.067] name <- changed[[kk]] [18:41:51.067] NAME <- NAMES[[kk]] [18:41:51.067] if (name != NAME && is.element(NAME, old_names)) [18:41:51.067] next [18:41:51.067] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.067] } [18:41:51.067] NAMES <- toupper(added) [18:41:51.067] for (kk in seq_along(NAMES)) { [18:41:51.067] name <- added[[kk]] [18:41:51.067] NAME <- NAMES[[kk]] [18:41:51.067] if (name != NAME && is.element(NAME, old_names)) [18:41:51.067] next [18:41:51.067] args[[name]] <- "" [18:41:51.067] } [18:41:51.067] NAMES <- toupper(removed) [18:41:51.067] for (kk in seq_along(NAMES)) { [18:41:51.067] name <- removed[[kk]] [18:41:51.067] NAME <- NAMES[[kk]] [18:41:51.067] if (name != NAME && is.element(NAME, old_names)) [18:41:51.067] next [18:41:51.067] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.067] } [18:41:51.067] if (length(args) > 0) [18:41:51.067] base::do.call(base::Sys.setenv, args = args) [18:41:51.067] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.067] } [18:41:51.067] { [18:41:51.067] if (base::length(...future.futureOptionsAdded) > [18:41:51.067] 0L) { [18:41:51.067] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.067] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.067] base::options(opts) [18:41:51.067] } [18:41:51.067] { [18:41:51.067] { [18:41:51.067] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.067] NULL [18:41:51.067] } [18:41:51.067] options(future.plan = NULL) [18:41:51.067] if (is.na(NA_character_)) [18:41:51.067] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.067] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.067] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.067] .init = FALSE) [18:41:51.067] } [18:41:51.067] } [18:41:51.067] } [18:41:51.067] }) [18:41:51.067] if (TRUE) { [18:41:51.067] base::sink(type = "output", split = FALSE) [18:41:51.067] if (TRUE) { [18:41:51.067] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.067] } [18:41:51.067] else { [18:41:51.067] ...future.result["stdout"] <- base::list(NULL) [18:41:51.067] } [18:41:51.067] base::close(...future.stdout) [18:41:51.067] ...future.stdout <- NULL [18:41:51.067] } [18:41:51.067] ...future.result$conditions <- ...future.conditions [18:41:51.067] ...future.result$finished <- base::Sys.time() [18:41:51.067] ...future.result [18:41:51.067] } [18:41:51.075] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:51.075] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:51.075] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:51.076] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.076] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.077] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.077] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.078] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.078] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.079] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.079] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.080] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:51.081] MultisessionFuture started [18:41:51.081] - Launch lazy future ... done [18:41:51.081] run() for 'MultisessionFuture' ... done [18:41:51.081] Created future: [18:41:51.095] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.095] - Validating connection of MultisessionFuture [18:41:51.095] - received message: FutureResult [18:41:51.096] - Received FutureResult [18:41:51.096] - Erased future from FutureRegistry [18:41:51.097] result() for ClusterFuture ... [18:41:51.097] - result already collected: FutureResult [18:41:51.097] result() for ClusterFuture ... done [18:41:51.097] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.081] MultisessionFuture: [18:41:51.081] Label: 'future_sapply-1' [18:41:51.081] Expression: [18:41:51.081] { [18:41:51.081] do.call(function(...) { [18:41:51.081] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.081] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.081] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.081] on.exit(options(oopts), add = TRUE) [18:41:51.081] } [18:41:51.081] { [18:41:51.081] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.081] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.081] ...future.FUN(...future.X_jj, ...) [18:41:51.081] }) [18:41:51.081] } [18:41:51.081] }, args = future.call.arguments) [18:41:51.081] } [18:41:51.081] Lazy evaluation: FALSE [18:41:51.081] Asynchronous evaluation: TRUE [18:41:51.081] Local evaluation: TRUE [18:41:51.081] Environment: R_GlobalEnv [18:41:51.081] Capture standard output: TRUE [18:41:51.081] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.081] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.081] Packages: [18:41:51.081] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.081] Resolved: TRUE [18:41:51.081] Value: [18:41:51.081] Conditions captured: [18:41:51.081] Early signaling: FALSE [18:41:51.081] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.081] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.098] Chunk #1 of 2 ... DONE [18:41:51.099] Chunk #2 of 2 ... [18:41:51.099] - Finding globals in 'X' for chunk #2 ... [18:41:51.099] getGlobalsAndPackages() ... [18:41:51.100] Searching for globals... [18:41:51.100] [18:41:51.101] Searching for globals ... DONE [18:41:51.101] - globals: [0] [18:41:51.101] getGlobalsAndPackages() ... DONE [18:41:51.101] + additional globals found: [n=0] [18:41:51.102] + additional namespaces needed: [n=0] [18:41:51.102] - Finding globals in 'X' for chunk #2 ... DONE [18:41:51.102] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.103] - seeds: [18:41:51.103] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.103] getGlobalsAndPackages() ... [18:41:51.104] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.104] Resolving globals: FALSE [18:41:51.104] Tweak future expression to call with '...' arguments ... [18:41:51.105] { [18:41:51.105] do.call(function(...) { [18:41:51.105] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.105] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.105] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.105] on.exit(options(oopts), add = TRUE) [18:41:51.105] } [18:41:51.105] { [18:41:51.105] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.105] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.105] ...future.FUN(...future.X_jj, ...) [18:41:51.105] }) [18:41:51.105] } [18:41:51.105] }, args = future.call.arguments) [18:41:51.105] } [18:41:51.105] Tweak future expression to call with '...' arguments ... DONE [18:41:51.106] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.107] [18:41:51.107] getGlobalsAndPackages() ... DONE [18:41:51.108] run() for 'Future' ... [18:41:51.108] - state: 'created' [18:41:51.108] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.138] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.138] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.138] - Field: 'node' [18:41:51.139] - Field: 'label' [18:41:51.139] - Field: 'local' [18:41:51.139] - Field: 'owner' [18:41:51.140] - Field: 'envir' [18:41:51.140] - Field: 'workers' [18:41:51.140] - Field: 'packages' [18:41:51.141] - Field: 'gc' [18:41:51.141] - Field: 'conditions' [18:41:51.141] - Field: 'persistent' [18:41:51.142] - Field: 'expr' [18:41:51.142] - Field: 'uuid' [18:41:51.142] - Field: 'seed' [18:41:51.143] - Field: 'version' [18:41:51.143] - Field: 'result' [18:41:51.143] - Field: 'asynchronous' [18:41:51.144] - Field: 'calls' [18:41:51.144] - Field: 'globals' [18:41:51.144] - Field: 'stdout' [18:41:51.145] - Field: 'earlySignal' [18:41:51.145] - Field: 'lazy' [18:41:51.145] - Field: 'state' [18:41:51.145] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.145] - Launch lazy future ... [18:41:51.146] Packages needed by the future expression (n = 0): [18:41:51.146] Packages needed by future strategies (n = 0): [18:41:51.147] { [18:41:51.147] { [18:41:51.147] { [18:41:51.147] ...future.startTime <- base::Sys.time() [18:41:51.147] { [18:41:51.147] { [18:41:51.147] { [18:41:51.147] { [18:41:51.147] base::local({ [18:41:51.147] has_future <- base::requireNamespace("future", [18:41:51.147] quietly = TRUE) [18:41:51.147] if (has_future) { [18:41:51.147] ns <- base::getNamespace("future") [18:41:51.147] version <- ns[[".package"]][["version"]] [18:41:51.147] if (is.null(version)) [18:41:51.147] version <- utils::packageVersion("future") [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] version <- NULL [18:41:51.147] } [18:41:51.147] if (!has_future || version < "1.8.0") { [18:41:51.147] info <- base::c(r_version = base::gsub("R version ", [18:41:51.147] "", base::R.version$version.string), [18:41:51.147] platform = base::sprintf("%s (%s-bit)", [18:41:51.147] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.147] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.147] "release", "version")], collapse = " "), [18:41:51.147] hostname = base::Sys.info()[["nodename"]]) [18:41:51.147] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.147] info) [18:41:51.147] info <- base::paste(info, collapse = "; ") [18:41:51.147] if (!has_future) { [18:41:51.147] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.147] info) [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.147] info, version) [18:41:51.147] } [18:41:51.147] base::stop(msg) [18:41:51.147] } [18:41:51.147] }) [18:41:51.147] } [18:41:51.147] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.147] base::options(mc.cores = 1L) [18:41:51.147] } [18:41:51.147] ...future.strategy.old <- future::plan("list") [18:41:51.147] options(future.plan = NULL) [18:41:51.147] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.147] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.147] } [18:41:51.147] ...future.workdir <- getwd() [18:41:51.147] } [18:41:51.147] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.147] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.147] } [18:41:51.147] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.147] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.147] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.147] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.147] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.147] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.147] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.147] base::names(...future.oldOptions)) [18:41:51.147] } [18:41:51.147] if (FALSE) { [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] if (TRUE) { [18:41:51.147] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.147] open = "w") [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.147] windows = "NUL", "/dev/null"), open = "w") [18:41:51.147] } [18:41:51.147] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.147] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.147] base::sink(type = "output", split = FALSE) [18:41:51.147] base::close(...future.stdout) [18:41:51.147] }, add = TRUE) [18:41:51.147] } [18:41:51.147] ...future.frame <- base::sys.nframe() [18:41:51.147] ...future.conditions <- base::list() [18:41:51.147] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.147] if (FALSE) { [18:41:51.147] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.147] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.147] } [18:41:51.147] ...future.result <- base::tryCatch({ [18:41:51.147] base::withCallingHandlers({ [18:41:51.147] ...future.value <- base::withVisible(base::local({ [18:41:51.147] ...future.makeSendCondition <- base::local({ [18:41:51.147] sendCondition <- NULL [18:41:51.147] function(frame = 1L) { [18:41:51.147] if (is.function(sendCondition)) [18:41:51.147] return(sendCondition) [18:41:51.147] ns <- getNamespace("parallel") [18:41:51.147] if (exists("sendData", mode = "function", [18:41:51.147] envir = ns)) { [18:41:51.147] parallel_sendData <- get("sendData", mode = "function", [18:41:51.147] envir = ns) [18:41:51.147] envir <- sys.frame(frame) [18:41:51.147] master <- NULL [18:41:51.147] while (!identical(envir, .GlobalEnv) && [18:41:51.147] !identical(envir, emptyenv())) { [18:41:51.147] if (exists("master", mode = "list", envir = envir, [18:41:51.147] inherits = FALSE)) { [18:41:51.147] master <- get("master", mode = "list", [18:41:51.147] envir = envir, inherits = FALSE) [18:41:51.147] if (inherits(master, c("SOCKnode", [18:41:51.147] "SOCK0node"))) { [18:41:51.147] sendCondition <<- function(cond) { [18:41:51.147] data <- list(type = "VALUE", value = cond, [18:41:51.147] success = TRUE) [18:41:51.147] parallel_sendData(master, data) [18:41:51.147] } [18:41:51.147] return(sendCondition) [18:41:51.147] } [18:41:51.147] } [18:41:51.147] frame <- frame + 1L [18:41:51.147] envir <- sys.frame(frame) [18:41:51.147] } [18:41:51.147] } [18:41:51.147] sendCondition <<- function(cond) NULL [18:41:51.147] } [18:41:51.147] }) [18:41:51.147] withCallingHandlers({ [18:41:51.147] { [18:41:51.147] do.call(function(...) { [18:41:51.147] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.147] if (!identical(...future.globals.maxSize.org, [18:41:51.147] ...future.globals.maxSize)) { [18:41:51.147] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.147] on.exit(options(oopts), add = TRUE) [18:41:51.147] } [18:41:51.147] { [18:41:51.147] lapply(seq_along(...future.elements_ii), [18:41:51.147] FUN = function(jj) { [18:41:51.147] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.147] ...future.FUN(...future.X_jj, ...) [18:41:51.147] }) [18:41:51.147] } [18:41:51.147] }, args = future.call.arguments) [18:41:51.147] } [18:41:51.147] }, immediateCondition = function(cond) { [18:41:51.147] sendCondition <- ...future.makeSendCondition() [18:41:51.147] sendCondition(cond) [18:41:51.147] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.147] { [18:41:51.147] inherits <- base::inherits [18:41:51.147] invokeRestart <- base::invokeRestart [18:41:51.147] is.null <- base::is.null [18:41:51.147] muffled <- FALSE [18:41:51.147] if (inherits(cond, "message")) { [18:41:51.147] muffled <- grepl(pattern, "muffleMessage") [18:41:51.147] if (muffled) [18:41:51.147] invokeRestart("muffleMessage") [18:41:51.147] } [18:41:51.147] else if (inherits(cond, "warning")) { [18:41:51.147] muffled <- grepl(pattern, "muffleWarning") [18:41:51.147] if (muffled) [18:41:51.147] invokeRestart("muffleWarning") [18:41:51.147] } [18:41:51.147] else if (inherits(cond, "condition")) { [18:41:51.147] if (!is.null(pattern)) { [18:41:51.147] computeRestarts <- base::computeRestarts [18:41:51.147] grepl <- base::grepl [18:41:51.147] restarts <- computeRestarts(cond) [18:41:51.147] for (restart in restarts) { [18:41:51.147] name <- restart$name [18:41:51.147] if (is.null(name)) [18:41:51.147] next [18:41:51.147] if (!grepl(pattern, name)) [18:41:51.147] next [18:41:51.147] invokeRestart(restart) [18:41:51.147] muffled <- TRUE [18:41:51.147] break [18:41:51.147] } [18:41:51.147] } [18:41:51.147] } [18:41:51.147] invisible(muffled) [18:41:51.147] } [18:41:51.147] muffleCondition(cond) [18:41:51.147] }) [18:41:51.147] })) [18:41:51.147] future::FutureResult(value = ...future.value$value, [18:41:51.147] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.147] ...future.rng), globalenv = if (FALSE) [18:41:51.147] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.147] ...future.globalenv.names)) [18:41:51.147] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.147] }, condition = base::local({ [18:41:51.147] c <- base::c [18:41:51.147] inherits <- base::inherits [18:41:51.147] invokeRestart <- base::invokeRestart [18:41:51.147] length <- base::length [18:41:51.147] list <- base::list [18:41:51.147] seq.int <- base::seq.int [18:41:51.147] signalCondition <- base::signalCondition [18:41:51.147] sys.calls <- base::sys.calls [18:41:51.147] `[[` <- base::`[[` [18:41:51.147] `+` <- base::`+` [18:41:51.147] `<<-` <- base::`<<-` [18:41:51.147] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.147] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.147] 3L)] [18:41:51.147] } [18:41:51.147] function(cond) { [18:41:51.147] is_error <- inherits(cond, "error") [18:41:51.147] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.147] NULL) [18:41:51.147] if (is_error) { [18:41:51.147] sessionInformation <- function() { [18:41:51.147] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.147] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.147] search = base::search(), system = base::Sys.info()) [18:41:51.147] } [18:41:51.147] ...future.conditions[[length(...future.conditions) + [18:41:51.147] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.147] cond$call), session = sessionInformation(), [18:41:51.147] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.147] signalCondition(cond) [18:41:51.147] } [18:41:51.147] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.147] "immediateCondition"))) { [18:41:51.147] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.147] ...future.conditions[[length(...future.conditions) + [18:41:51.147] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.147] if (TRUE && !signal) { [18:41:51.147] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.147] { [18:41:51.147] inherits <- base::inherits [18:41:51.147] invokeRestart <- base::invokeRestart [18:41:51.147] is.null <- base::is.null [18:41:51.147] muffled <- FALSE [18:41:51.147] if (inherits(cond, "message")) { [18:41:51.147] muffled <- grepl(pattern, "muffleMessage") [18:41:51.147] if (muffled) [18:41:51.147] invokeRestart("muffleMessage") [18:41:51.147] } [18:41:51.147] else if (inherits(cond, "warning")) { [18:41:51.147] muffled <- grepl(pattern, "muffleWarning") [18:41:51.147] if (muffled) [18:41:51.147] invokeRestart("muffleWarning") [18:41:51.147] } [18:41:51.147] else if (inherits(cond, "condition")) { [18:41:51.147] if (!is.null(pattern)) { [18:41:51.147] computeRestarts <- base::computeRestarts [18:41:51.147] grepl <- base::grepl [18:41:51.147] restarts <- computeRestarts(cond) [18:41:51.147] for (restart in restarts) { [18:41:51.147] name <- restart$name [18:41:51.147] if (is.null(name)) [18:41:51.147] next [18:41:51.147] if (!grepl(pattern, name)) [18:41:51.147] next [18:41:51.147] invokeRestart(restart) [18:41:51.147] muffled <- TRUE [18:41:51.147] break [18:41:51.147] } [18:41:51.147] } [18:41:51.147] } [18:41:51.147] invisible(muffled) [18:41:51.147] } [18:41:51.147] muffleCondition(cond, pattern = "^muffle") [18:41:51.147] } [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] if (TRUE) { [18:41:51.147] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.147] { [18:41:51.147] inherits <- base::inherits [18:41:51.147] invokeRestart <- base::invokeRestart [18:41:51.147] is.null <- base::is.null [18:41:51.147] muffled <- FALSE [18:41:51.147] if (inherits(cond, "message")) { [18:41:51.147] muffled <- grepl(pattern, "muffleMessage") [18:41:51.147] if (muffled) [18:41:51.147] invokeRestart("muffleMessage") [18:41:51.147] } [18:41:51.147] else if (inherits(cond, "warning")) { [18:41:51.147] muffled <- grepl(pattern, "muffleWarning") [18:41:51.147] if (muffled) [18:41:51.147] invokeRestart("muffleWarning") [18:41:51.147] } [18:41:51.147] else if (inherits(cond, "condition")) { [18:41:51.147] if (!is.null(pattern)) { [18:41:51.147] computeRestarts <- base::computeRestarts [18:41:51.147] grepl <- base::grepl [18:41:51.147] restarts <- computeRestarts(cond) [18:41:51.147] for (restart in restarts) { [18:41:51.147] name <- restart$name [18:41:51.147] if (is.null(name)) [18:41:51.147] next [18:41:51.147] if (!grepl(pattern, name)) [18:41:51.147] next [18:41:51.147] invokeRestart(restart) [18:41:51.147] muffled <- TRUE [18:41:51.147] break [18:41:51.147] } [18:41:51.147] } [18:41:51.147] } [18:41:51.147] invisible(muffled) [18:41:51.147] } [18:41:51.147] muffleCondition(cond, pattern = "^muffle") [18:41:51.147] } [18:41:51.147] } [18:41:51.147] } [18:41:51.147] })) [18:41:51.147] }, error = function(ex) { [18:41:51.147] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.147] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.147] ...future.rng), started = ...future.startTime, [18:41:51.147] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.147] version = "1.8"), class = "FutureResult") [18:41:51.147] }, finally = { [18:41:51.147] if (!identical(...future.workdir, getwd())) [18:41:51.147] setwd(...future.workdir) [18:41:51.147] { [18:41:51.147] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.147] ...future.oldOptions$nwarnings <- NULL [18:41:51.147] } [18:41:51.147] base::options(...future.oldOptions) [18:41:51.147] if (.Platform$OS.type == "windows") { [18:41:51.147] old_names <- names(...future.oldEnvVars) [18:41:51.147] envs <- base::Sys.getenv() [18:41:51.147] names <- names(envs) [18:41:51.147] common <- intersect(names, old_names) [18:41:51.147] added <- setdiff(names, old_names) [18:41:51.147] removed <- setdiff(old_names, names) [18:41:51.147] changed <- common[...future.oldEnvVars[common] != [18:41:51.147] envs[common]] [18:41:51.147] NAMES <- toupper(changed) [18:41:51.147] args <- list() [18:41:51.147] for (kk in seq_along(NAMES)) { [18:41:51.147] name <- changed[[kk]] [18:41:51.147] NAME <- NAMES[[kk]] [18:41:51.147] if (name != NAME && is.element(NAME, old_names)) [18:41:51.147] next [18:41:51.147] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.147] } [18:41:51.147] NAMES <- toupper(added) [18:41:51.147] for (kk in seq_along(NAMES)) { [18:41:51.147] name <- added[[kk]] [18:41:51.147] NAME <- NAMES[[kk]] [18:41:51.147] if (name != NAME && is.element(NAME, old_names)) [18:41:51.147] next [18:41:51.147] args[[name]] <- "" [18:41:51.147] } [18:41:51.147] NAMES <- toupper(removed) [18:41:51.147] for (kk in seq_along(NAMES)) { [18:41:51.147] name <- removed[[kk]] [18:41:51.147] NAME <- NAMES[[kk]] [18:41:51.147] if (name != NAME && is.element(NAME, old_names)) [18:41:51.147] next [18:41:51.147] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.147] } [18:41:51.147] if (length(args) > 0) [18:41:51.147] base::do.call(base::Sys.setenv, args = args) [18:41:51.147] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.147] } [18:41:51.147] { [18:41:51.147] if (base::length(...future.futureOptionsAdded) > [18:41:51.147] 0L) { [18:41:51.147] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.147] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.147] base::options(opts) [18:41:51.147] } [18:41:51.147] { [18:41:51.147] { [18:41:51.147] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.147] NULL [18:41:51.147] } [18:41:51.147] options(future.plan = NULL) [18:41:51.147] if (is.na(NA_character_)) [18:41:51.147] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.147] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.147] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.147] .init = FALSE) [18:41:51.147] } [18:41:51.147] } [18:41:51.147] } [18:41:51.147] }) [18:41:51.147] if (TRUE) { [18:41:51.147] base::sink(type = "output", split = FALSE) [18:41:51.147] if (TRUE) { [18:41:51.147] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.147] } [18:41:51.147] else { [18:41:51.147] ...future.result["stdout"] <- base::list(NULL) [18:41:51.147] } [18:41:51.147] base::close(...future.stdout) [18:41:51.147] ...future.stdout <- NULL [18:41:51.147] } [18:41:51.147] ...future.result$conditions <- ...future.conditions [18:41:51.147] ...future.result$finished <- base::Sys.time() [18:41:51.147] ...future.result [18:41:51.147] } [18:41:51.152] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:51.152] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:51.153] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:51.153] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.153] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.153] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.154] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.154] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.154] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.155] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.155] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.155] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:51.156] MultisessionFuture started [18:41:51.156] - Launch lazy future ... done [18:41:51.156] run() for 'MultisessionFuture' ... done [18:41:51.156] Created future: [18:41:51.170] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.170] - Validating connection of MultisessionFuture [18:41:51.171] - received message: FutureResult [18:41:51.171] - Received FutureResult [18:41:51.171] - Erased future from FutureRegistry [18:41:51.171] result() for ClusterFuture ... [18:41:51.171] - result already collected: FutureResult [18:41:51.172] result() for ClusterFuture ... done [18:41:51.172] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.157] MultisessionFuture: [18:41:51.157] Label: 'future_sapply-2' [18:41:51.157] Expression: [18:41:51.157] { [18:41:51.157] do.call(function(...) { [18:41:51.157] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.157] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.157] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.157] on.exit(options(oopts), add = TRUE) [18:41:51.157] } [18:41:51.157] { [18:41:51.157] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.157] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.157] ...future.FUN(...future.X_jj, ...) [18:41:51.157] }) [18:41:51.157] } [18:41:51.157] }, args = future.call.arguments) [18:41:51.157] } [18:41:51.157] Lazy evaluation: FALSE [18:41:51.157] Asynchronous evaluation: TRUE [18:41:51.157] Local evaluation: TRUE [18:41:51.157] Environment: R_GlobalEnv [18:41:51.157] Capture standard output: TRUE [18:41:51.157] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.157] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.157] Packages: [18:41:51.157] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.157] Resolved: TRUE [18:41:51.157] Value: [18:41:51.157] Conditions captured: [18:41:51.157] Early signaling: FALSE [18:41:51.157] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.157] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.172] Chunk #2 of 2 ... DONE [18:41:51.172] Launching 2 futures (chunks) ... DONE [18:41:51.172] Resolving 2 futures (chunks) ... [18:41:51.173] resolve() on list ... [18:41:51.173] recursive: 0 [18:41:51.173] length: 2 [18:41:51.173] [18:41:51.173] Future #1 [18:41:51.173] result() for ClusterFuture ... [18:41:51.174] - result already collected: FutureResult [18:41:51.174] result() for ClusterFuture ... done [18:41:51.174] result() for ClusterFuture ... [18:41:51.174] - result already collected: FutureResult [18:41:51.174] result() for ClusterFuture ... done [18:41:51.174] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:51.175] - nx: 2 [18:41:51.175] - relay: TRUE [18:41:51.175] - stdout: TRUE [18:41:51.175] - signal: TRUE [18:41:51.175] - resignal: FALSE [18:41:51.175] - force: TRUE [18:41:51.175] - relayed: [n=2] FALSE, FALSE [18:41:51.176] - queued futures: [n=2] FALSE, FALSE [18:41:51.176] - until=1 [18:41:51.176] - relaying element #1 [18:41:51.176] result() for ClusterFuture ... [18:41:51.176] - result already collected: FutureResult [18:41:51.176] result() for ClusterFuture ... done [18:41:51.177] result() for ClusterFuture ... [18:41:51.177] - result already collected: FutureResult [18:41:51.177] result() for ClusterFuture ... done [18:41:51.177] result() for ClusterFuture ... [18:41:51.177] - result already collected: FutureResult [18:41:51.177] result() for ClusterFuture ... done [18:41:51.178] result() for ClusterFuture ... [18:41:51.178] - result already collected: FutureResult [18:41:51.178] result() for ClusterFuture ... done [18:41:51.178] - relayed: [n=2] TRUE, FALSE [18:41:51.178] - queued futures: [n=2] TRUE, FALSE [18:41:51.178] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.179] length: 1 (resolved future 1) [18:41:51.179] Future #2 [18:41:51.179] result() for ClusterFuture ... [18:41:51.179] - result already collected: FutureResult [18:41:51.179] result() for ClusterFuture ... done [18:41:51.179] result() for ClusterFuture ... [18:41:51.180] - result already collected: FutureResult [18:41:51.180] result() for ClusterFuture ... done [18:41:51.180] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.180] - nx: 2 [18:41:51.180] - relay: TRUE [18:41:51.180] - stdout: TRUE [18:41:51.181] - signal: TRUE [18:41:51.181] - resignal: FALSE [18:41:51.181] - force: TRUE [18:41:51.181] - relayed: [n=2] TRUE, FALSE [18:41:51.181] - queued futures: [n=2] TRUE, FALSE [18:41:51.181] - until=2 [18:41:51.181] - relaying element #2 [18:41:51.182] result() for ClusterFuture ... [18:41:51.182] - result already collected: FutureResult [18:41:51.182] result() for ClusterFuture ... done [18:41:51.182] result() for ClusterFuture ... [18:41:51.182] - result already collected: FutureResult [18:41:51.182] result() for ClusterFuture ... done [18:41:51.183] result() for ClusterFuture ... [18:41:51.183] - result already collected: FutureResult [18:41:51.183] result() for ClusterFuture ... done [18:41:51.183] result() for ClusterFuture ... [18:41:51.183] - result already collected: FutureResult [18:41:51.183] result() for ClusterFuture ... done [18:41:51.183] - relayed: [n=2] TRUE, TRUE [18:41:51.184] - queued futures: [n=2] TRUE, TRUE [18:41:51.184] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.184] length: 0 (resolved future 2) [18:41:51.184] Relaying remaining futures [18:41:51.184] signalConditionsASAP(NULL, pos=0) ... [18:41:51.184] - nx: 2 [18:41:51.185] - relay: TRUE [18:41:51.185] - stdout: TRUE [18:41:51.185] - signal: TRUE [18:41:51.185] - resignal: FALSE [18:41:51.185] - force: TRUE [18:41:51.185] - relayed: [n=2] TRUE, TRUE [18:41:51.185] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.186] - relayed: [n=2] TRUE, TRUE [18:41:51.186] - queued futures: [n=2] TRUE, TRUE [18:41:51.186] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.186] resolve() on list ... DONE [18:41:51.186] result() for ClusterFuture ... [18:41:51.187] - result already collected: FutureResult [18:41:51.187] result() for ClusterFuture ... done [18:41:51.187] result() for ClusterFuture ... [18:41:51.187] - result already collected: FutureResult [18:41:51.187] result() for ClusterFuture ... done [18:41:51.187] result() for ClusterFuture ... [18:41:51.187] - result already collected: FutureResult [18:41:51.188] result() for ClusterFuture ... done [18:41:51.188] result() for ClusterFuture ... [18:41:51.188] - result already collected: FutureResult [18:41:51.188] result() for ClusterFuture ... done [18:41:51.188] - Number of value chunks collected: 2 [18:41:51.188] Resolving 2 futures (chunks) ... DONE [18:41:51.189] Reducing values from 2 chunks ... [18:41:51.189] - Number of values collected after concatenation: 6 [18:41:51.189] - Number of values expected: 6 [18:41:51.189] Reducing values from 2 chunks ... DONE [18:41:51.189] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:51.192] future_lapply() ... [18:41:51.195] Number of chunks: 2 [18:41:51.195] getGlobalsAndPackagesXApply() ... [18:41:51.196] - future.globals: TRUE [18:41:51.196] getGlobalsAndPackages() ... [18:41:51.196] Searching for globals... [18:41:51.198] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:51.198] Searching for globals ... DONE [18:41:51.198] Resolving globals: FALSE [18:41:51.199] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:51.199] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:51.199] - globals: [1] 'FUN' [18:41:51.200] [18:41:51.200] getGlobalsAndPackages() ... DONE [18:41:51.200] - globals found/used: [n=1] 'FUN' [18:41:51.200] - needed namespaces: [n=0] [18:41:51.200] Finding globals ... DONE [18:41:51.200] - use_args: TRUE [18:41:51.201] - Getting '...' globals ... [18:41:51.201] resolve() on list ... [18:41:51.201] recursive: 0 [18:41:51.201] length: 1 [18:41:51.202] elements: '...' [18:41:51.202] length: 0 (resolved future 1) [18:41:51.202] resolve() on list ... DONE [18:41:51.202] - '...' content: [n=0] [18:41:51.202] List of 1 [18:41:51.202] $ ...: list() [18:41:51.202] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.202] - attr(*, "where")=List of 1 [18:41:51.202] ..$ ...: [18:41:51.202] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.202] - attr(*, "resolved")= logi TRUE [18:41:51.202] - attr(*, "total_size")= num NA [18:41:51.205] - Getting '...' globals ... DONE [18:41:51.205] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:51.206] List of 2 [18:41:51.206] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:51.206] $ ... : list() [18:41:51.206] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.206] - attr(*, "where")=List of 2 [18:41:51.206] ..$ ...future.FUN: [18:41:51.206] ..$ ... : [18:41:51.206] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.206] - attr(*, "resolved")= logi FALSE [18:41:51.206] - attr(*, "total_size")= int 6664 [18:41:51.209] Packages to be attached in all futures: [n=0] [18:41:51.209] getGlobalsAndPackagesXApply() ... DONE [18:41:51.210] Number of futures (= number of chunks): 2 [18:41:51.210] Launching 2 futures (chunks) ... [18:41:51.210] Chunk #1 of 2 ... [18:41:51.210] - Finding globals in 'X' for chunk #1 ... [18:41:51.210] getGlobalsAndPackages() ... [18:41:51.210] Searching for globals... [18:41:51.211] [18:41:51.211] Searching for globals ... DONE [18:41:51.211] - globals: [0] [18:41:51.211] getGlobalsAndPackages() ... DONE [18:41:51.211] + additional globals found: [n=0] [18:41:51.212] + additional namespaces needed: [n=0] [18:41:51.212] - Finding globals in 'X' for chunk #1 ... DONE [18:41:51.212] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.212] - seeds: [18:41:51.212] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.212] getGlobalsAndPackages() ... [18:41:51.213] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.213] Resolving globals: FALSE [18:41:51.213] Tweak future expression to call with '...' arguments ... [18:41:51.213] { [18:41:51.213] do.call(function(...) { [18:41:51.213] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.213] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.213] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.213] on.exit(options(oopts), add = TRUE) [18:41:51.213] } [18:41:51.213] { [18:41:51.213] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.213] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.213] ...future.FUN(...future.X_jj, ...) [18:41:51.213] }) [18:41:51.213] } [18:41:51.213] }, args = future.call.arguments) [18:41:51.213] } [18:41:51.214] Tweak future expression to call with '...' arguments ... DONE [18:41:51.214] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.214] [18:41:51.214] getGlobalsAndPackages() ... DONE [18:41:51.215] run() for 'Future' ... [18:41:51.215] - state: 'created' [18:41:51.215] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.231] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.231] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.231] - Field: 'node' [18:41:51.232] - Field: 'label' [18:41:51.232] - Field: 'local' [18:41:51.232] - Field: 'owner' [18:41:51.232] - Field: 'envir' [18:41:51.232] - Field: 'workers' [18:41:51.233] - Field: 'packages' [18:41:51.233] - Field: 'gc' [18:41:51.233] - Field: 'conditions' [18:41:51.233] - Field: 'persistent' [18:41:51.233] - Field: 'expr' [18:41:51.233] - Field: 'uuid' [18:41:51.234] - Field: 'seed' [18:41:51.234] - Field: 'version' [18:41:51.234] - Field: 'result' [18:41:51.234] - Field: 'asynchronous' [18:41:51.234] - Field: 'calls' [18:41:51.234] - Field: 'globals' [18:41:51.235] - Field: 'stdout' [18:41:51.235] - Field: 'earlySignal' [18:41:51.235] - Field: 'lazy' [18:41:51.235] - Field: 'state' [18:41:51.235] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.236] - Launch lazy future ... [18:41:51.236] Packages needed by the future expression (n = 0): [18:41:51.236] Packages needed by future strategies (n = 0): [18:41:51.237] { [18:41:51.237] { [18:41:51.237] { [18:41:51.237] ...future.startTime <- base::Sys.time() [18:41:51.237] { [18:41:51.237] { [18:41:51.237] { [18:41:51.237] { [18:41:51.237] base::local({ [18:41:51.237] has_future <- base::requireNamespace("future", [18:41:51.237] quietly = TRUE) [18:41:51.237] if (has_future) { [18:41:51.237] ns <- base::getNamespace("future") [18:41:51.237] version <- ns[[".package"]][["version"]] [18:41:51.237] if (is.null(version)) [18:41:51.237] version <- utils::packageVersion("future") [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] version <- NULL [18:41:51.237] } [18:41:51.237] if (!has_future || version < "1.8.0") { [18:41:51.237] info <- base::c(r_version = base::gsub("R version ", [18:41:51.237] "", base::R.version$version.string), [18:41:51.237] platform = base::sprintf("%s (%s-bit)", [18:41:51.237] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.237] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.237] "release", "version")], collapse = " "), [18:41:51.237] hostname = base::Sys.info()[["nodename"]]) [18:41:51.237] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.237] info) [18:41:51.237] info <- base::paste(info, collapse = "; ") [18:41:51.237] if (!has_future) { [18:41:51.237] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.237] info) [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.237] info, version) [18:41:51.237] } [18:41:51.237] base::stop(msg) [18:41:51.237] } [18:41:51.237] }) [18:41:51.237] } [18:41:51.237] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.237] base::options(mc.cores = 1L) [18:41:51.237] } [18:41:51.237] ...future.strategy.old <- future::plan("list") [18:41:51.237] options(future.plan = NULL) [18:41:51.237] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.237] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.237] } [18:41:51.237] ...future.workdir <- getwd() [18:41:51.237] } [18:41:51.237] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.237] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.237] } [18:41:51.237] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.237] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.237] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.237] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.237] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.237] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.237] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.237] base::names(...future.oldOptions)) [18:41:51.237] } [18:41:51.237] if (FALSE) { [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] if (TRUE) { [18:41:51.237] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.237] open = "w") [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.237] windows = "NUL", "/dev/null"), open = "w") [18:41:51.237] } [18:41:51.237] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.237] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.237] base::sink(type = "output", split = FALSE) [18:41:51.237] base::close(...future.stdout) [18:41:51.237] }, add = TRUE) [18:41:51.237] } [18:41:51.237] ...future.frame <- base::sys.nframe() [18:41:51.237] ...future.conditions <- base::list() [18:41:51.237] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.237] if (FALSE) { [18:41:51.237] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.237] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.237] } [18:41:51.237] ...future.result <- base::tryCatch({ [18:41:51.237] base::withCallingHandlers({ [18:41:51.237] ...future.value <- base::withVisible(base::local({ [18:41:51.237] ...future.makeSendCondition <- base::local({ [18:41:51.237] sendCondition <- NULL [18:41:51.237] function(frame = 1L) { [18:41:51.237] if (is.function(sendCondition)) [18:41:51.237] return(sendCondition) [18:41:51.237] ns <- getNamespace("parallel") [18:41:51.237] if (exists("sendData", mode = "function", [18:41:51.237] envir = ns)) { [18:41:51.237] parallel_sendData <- get("sendData", mode = "function", [18:41:51.237] envir = ns) [18:41:51.237] envir <- sys.frame(frame) [18:41:51.237] master <- NULL [18:41:51.237] while (!identical(envir, .GlobalEnv) && [18:41:51.237] !identical(envir, emptyenv())) { [18:41:51.237] if (exists("master", mode = "list", envir = envir, [18:41:51.237] inherits = FALSE)) { [18:41:51.237] master <- get("master", mode = "list", [18:41:51.237] envir = envir, inherits = FALSE) [18:41:51.237] if (inherits(master, c("SOCKnode", [18:41:51.237] "SOCK0node"))) { [18:41:51.237] sendCondition <<- function(cond) { [18:41:51.237] data <- list(type = "VALUE", value = cond, [18:41:51.237] success = TRUE) [18:41:51.237] parallel_sendData(master, data) [18:41:51.237] } [18:41:51.237] return(sendCondition) [18:41:51.237] } [18:41:51.237] } [18:41:51.237] frame <- frame + 1L [18:41:51.237] envir <- sys.frame(frame) [18:41:51.237] } [18:41:51.237] } [18:41:51.237] sendCondition <<- function(cond) NULL [18:41:51.237] } [18:41:51.237] }) [18:41:51.237] withCallingHandlers({ [18:41:51.237] { [18:41:51.237] do.call(function(...) { [18:41:51.237] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.237] if (!identical(...future.globals.maxSize.org, [18:41:51.237] ...future.globals.maxSize)) { [18:41:51.237] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.237] on.exit(options(oopts), add = TRUE) [18:41:51.237] } [18:41:51.237] { [18:41:51.237] lapply(seq_along(...future.elements_ii), [18:41:51.237] FUN = function(jj) { [18:41:51.237] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.237] ...future.FUN(...future.X_jj, ...) [18:41:51.237] }) [18:41:51.237] } [18:41:51.237] }, args = future.call.arguments) [18:41:51.237] } [18:41:51.237] }, immediateCondition = function(cond) { [18:41:51.237] sendCondition <- ...future.makeSendCondition() [18:41:51.237] sendCondition(cond) [18:41:51.237] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.237] { [18:41:51.237] inherits <- base::inherits [18:41:51.237] invokeRestart <- base::invokeRestart [18:41:51.237] is.null <- base::is.null [18:41:51.237] muffled <- FALSE [18:41:51.237] if (inherits(cond, "message")) { [18:41:51.237] muffled <- grepl(pattern, "muffleMessage") [18:41:51.237] if (muffled) [18:41:51.237] invokeRestart("muffleMessage") [18:41:51.237] } [18:41:51.237] else if (inherits(cond, "warning")) { [18:41:51.237] muffled <- grepl(pattern, "muffleWarning") [18:41:51.237] if (muffled) [18:41:51.237] invokeRestart("muffleWarning") [18:41:51.237] } [18:41:51.237] else if (inherits(cond, "condition")) { [18:41:51.237] if (!is.null(pattern)) { [18:41:51.237] computeRestarts <- base::computeRestarts [18:41:51.237] grepl <- base::grepl [18:41:51.237] restarts <- computeRestarts(cond) [18:41:51.237] for (restart in restarts) { [18:41:51.237] name <- restart$name [18:41:51.237] if (is.null(name)) [18:41:51.237] next [18:41:51.237] if (!grepl(pattern, name)) [18:41:51.237] next [18:41:51.237] invokeRestart(restart) [18:41:51.237] muffled <- TRUE [18:41:51.237] break [18:41:51.237] } [18:41:51.237] } [18:41:51.237] } [18:41:51.237] invisible(muffled) [18:41:51.237] } [18:41:51.237] muffleCondition(cond) [18:41:51.237] }) [18:41:51.237] })) [18:41:51.237] future::FutureResult(value = ...future.value$value, [18:41:51.237] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.237] ...future.rng), globalenv = if (FALSE) [18:41:51.237] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.237] ...future.globalenv.names)) [18:41:51.237] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.237] }, condition = base::local({ [18:41:51.237] c <- base::c [18:41:51.237] inherits <- base::inherits [18:41:51.237] invokeRestart <- base::invokeRestart [18:41:51.237] length <- base::length [18:41:51.237] list <- base::list [18:41:51.237] seq.int <- base::seq.int [18:41:51.237] signalCondition <- base::signalCondition [18:41:51.237] sys.calls <- base::sys.calls [18:41:51.237] `[[` <- base::`[[` [18:41:51.237] `+` <- base::`+` [18:41:51.237] `<<-` <- base::`<<-` [18:41:51.237] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.237] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.237] 3L)] [18:41:51.237] } [18:41:51.237] function(cond) { [18:41:51.237] is_error <- inherits(cond, "error") [18:41:51.237] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.237] NULL) [18:41:51.237] if (is_error) { [18:41:51.237] sessionInformation <- function() { [18:41:51.237] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.237] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.237] search = base::search(), system = base::Sys.info()) [18:41:51.237] } [18:41:51.237] ...future.conditions[[length(...future.conditions) + [18:41:51.237] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.237] cond$call), session = sessionInformation(), [18:41:51.237] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.237] signalCondition(cond) [18:41:51.237] } [18:41:51.237] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.237] "immediateCondition"))) { [18:41:51.237] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.237] ...future.conditions[[length(...future.conditions) + [18:41:51.237] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.237] if (TRUE && !signal) { [18:41:51.237] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.237] { [18:41:51.237] inherits <- base::inherits [18:41:51.237] invokeRestart <- base::invokeRestart [18:41:51.237] is.null <- base::is.null [18:41:51.237] muffled <- FALSE [18:41:51.237] if (inherits(cond, "message")) { [18:41:51.237] muffled <- grepl(pattern, "muffleMessage") [18:41:51.237] if (muffled) [18:41:51.237] invokeRestart("muffleMessage") [18:41:51.237] } [18:41:51.237] else if (inherits(cond, "warning")) { [18:41:51.237] muffled <- grepl(pattern, "muffleWarning") [18:41:51.237] if (muffled) [18:41:51.237] invokeRestart("muffleWarning") [18:41:51.237] } [18:41:51.237] else if (inherits(cond, "condition")) { [18:41:51.237] if (!is.null(pattern)) { [18:41:51.237] computeRestarts <- base::computeRestarts [18:41:51.237] grepl <- base::grepl [18:41:51.237] restarts <- computeRestarts(cond) [18:41:51.237] for (restart in restarts) { [18:41:51.237] name <- restart$name [18:41:51.237] if (is.null(name)) [18:41:51.237] next [18:41:51.237] if (!grepl(pattern, name)) [18:41:51.237] next [18:41:51.237] invokeRestart(restart) [18:41:51.237] muffled <- TRUE [18:41:51.237] break [18:41:51.237] } [18:41:51.237] } [18:41:51.237] } [18:41:51.237] invisible(muffled) [18:41:51.237] } [18:41:51.237] muffleCondition(cond, pattern = "^muffle") [18:41:51.237] } [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] if (TRUE) { [18:41:51.237] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.237] { [18:41:51.237] inherits <- base::inherits [18:41:51.237] invokeRestart <- base::invokeRestart [18:41:51.237] is.null <- base::is.null [18:41:51.237] muffled <- FALSE [18:41:51.237] if (inherits(cond, "message")) { [18:41:51.237] muffled <- grepl(pattern, "muffleMessage") [18:41:51.237] if (muffled) [18:41:51.237] invokeRestart("muffleMessage") [18:41:51.237] } [18:41:51.237] else if (inherits(cond, "warning")) { [18:41:51.237] muffled <- grepl(pattern, "muffleWarning") [18:41:51.237] if (muffled) [18:41:51.237] invokeRestart("muffleWarning") [18:41:51.237] } [18:41:51.237] else if (inherits(cond, "condition")) { [18:41:51.237] if (!is.null(pattern)) { [18:41:51.237] computeRestarts <- base::computeRestarts [18:41:51.237] grepl <- base::grepl [18:41:51.237] restarts <- computeRestarts(cond) [18:41:51.237] for (restart in restarts) { [18:41:51.237] name <- restart$name [18:41:51.237] if (is.null(name)) [18:41:51.237] next [18:41:51.237] if (!grepl(pattern, name)) [18:41:51.237] next [18:41:51.237] invokeRestart(restart) [18:41:51.237] muffled <- TRUE [18:41:51.237] break [18:41:51.237] } [18:41:51.237] } [18:41:51.237] } [18:41:51.237] invisible(muffled) [18:41:51.237] } [18:41:51.237] muffleCondition(cond, pattern = "^muffle") [18:41:51.237] } [18:41:51.237] } [18:41:51.237] } [18:41:51.237] })) [18:41:51.237] }, error = function(ex) { [18:41:51.237] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.237] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.237] ...future.rng), started = ...future.startTime, [18:41:51.237] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.237] version = "1.8"), class = "FutureResult") [18:41:51.237] }, finally = { [18:41:51.237] if (!identical(...future.workdir, getwd())) [18:41:51.237] setwd(...future.workdir) [18:41:51.237] { [18:41:51.237] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.237] ...future.oldOptions$nwarnings <- NULL [18:41:51.237] } [18:41:51.237] base::options(...future.oldOptions) [18:41:51.237] if (.Platform$OS.type == "windows") { [18:41:51.237] old_names <- names(...future.oldEnvVars) [18:41:51.237] envs <- base::Sys.getenv() [18:41:51.237] names <- names(envs) [18:41:51.237] common <- intersect(names, old_names) [18:41:51.237] added <- setdiff(names, old_names) [18:41:51.237] removed <- setdiff(old_names, names) [18:41:51.237] changed <- common[...future.oldEnvVars[common] != [18:41:51.237] envs[common]] [18:41:51.237] NAMES <- toupper(changed) [18:41:51.237] args <- list() [18:41:51.237] for (kk in seq_along(NAMES)) { [18:41:51.237] name <- changed[[kk]] [18:41:51.237] NAME <- NAMES[[kk]] [18:41:51.237] if (name != NAME && is.element(NAME, old_names)) [18:41:51.237] next [18:41:51.237] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.237] } [18:41:51.237] NAMES <- toupper(added) [18:41:51.237] for (kk in seq_along(NAMES)) { [18:41:51.237] name <- added[[kk]] [18:41:51.237] NAME <- NAMES[[kk]] [18:41:51.237] if (name != NAME && is.element(NAME, old_names)) [18:41:51.237] next [18:41:51.237] args[[name]] <- "" [18:41:51.237] } [18:41:51.237] NAMES <- toupper(removed) [18:41:51.237] for (kk in seq_along(NAMES)) { [18:41:51.237] name <- removed[[kk]] [18:41:51.237] NAME <- NAMES[[kk]] [18:41:51.237] if (name != NAME && is.element(NAME, old_names)) [18:41:51.237] next [18:41:51.237] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.237] } [18:41:51.237] if (length(args) > 0) [18:41:51.237] base::do.call(base::Sys.setenv, args = args) [18:41:51.237] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.237] } [18:41:51.237] { [18:41:51.237] if (base::length(...future.futureOptionsAdded) > [18:41:51.237] 0L) { [18:41:51.237] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.237] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.237] base::options(opts) [18:41:51.237] } [18:41:51.237] { [18:41:51.237] { [18:41:51.237] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.237] NULL [18:41:51.237] } [18:41:51.237] options(future.plan = NULL) [18:41:51.237] if (is.na(NA_character_)) [18:41:51.237] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.237] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.237] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.237] .init = FALSE) [18:41:51.237] } [18:41:51.237] } [18:41:51.237] } [18:41:51.237] }) [18:41:51.237] if (TRUE) { [18:41:51.237] base::sink(type = "output", split = FALSE) [18:41:51.237] if (TRUE) { [18:41:51.237] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.237] } [18:41:51.237] else { [18:41:51.237] ...future.result["stdout"] <- base::list(NULL) [18:41:51.237] } [18:41:51.237] base::close(...future.stdout) [18:41:51.237] ...future.stdout <- NULL [18:41:51.237] } [18:41:51.237] ...future.result$conditions <- ...future.conditions [18:41:51.237] ...future.result$finished <- base::Sys.time() [18:41:51.237] ...future.result [18:41:51.237] } [18:41:51.242] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:51.242] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:51.243] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:51.243] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.243] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.244] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.244] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.244] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.245] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.245] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.245] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.245] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:51.246] MultisessionFuture started [18:41:51.246] - Launch lazy future ... done [18:41:51.246] run() for 'MultisessionFuture' ... done [18:41:51.247] Created future: [18:41:51.260] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.260] - Validating connection of MultisessionFuture [18:41:51.261] - received message: FutureResult [18:41:51.261] - Received FutureResult [18:41:51.261] - Erased future from FutureRegistry [18:41:51.261] result() for ClusterFuture ... [18:41:51.261] - result already collected: FutureResult [18:41:51.261] result() for ClusterFuture ... done [18:41:51.262] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.247] MultisessionFuture: [18:41:51.247] Label: 'future_sapply-1' [18:41:51.247] Expression: [18:41:51.247] { [18:41:51.247] do.call(function(...) { [18:41:51.247] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.247] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.247] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.247] on.exit(options(oopts), add = TRUE) [18:41:51.247] } [18:41:51.247] { [18:41:51.247] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.247] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.247] ...future.FUN(...future.X_jj, ...) [18:41:51.247] }) [18:41:51.247] } [18:41:51.247] }, args = future.call.arguments) [18:41:51.247] } [18:41:51.247] Lazy evaluation: FALSE [18:41:51.247] Asynchronous evaluation: TRUE [18:41:51.247] Local evaluation: TRUE [18:41:51.247] Environment: R_GlobalEnv [18:41:51.247] Capture standard output: TRUE [18:41:51.247] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.247] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.247] Packages: [18:41:51.247] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.247] Resolved: TRUE [18:41:51.247] Value: [18:41:51.247] Conditions captured: [18:41:51.247] Early signaling: FALSE [18:41:51.247] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.247] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.262] Chunk #1 of 2 ... DONE [18:41:51.262] Chunk #2 of 2 ... [18:41:51.262] - Finding globals in 'X' for chunk #2 ... [18:41:51.263] getGlobalsAndPackages() ... [18:41:51.263] Searching for globals... [18:41:51.263] [18:41:51.263] Searching for globals ... DONE [18:41:51.263] - globals: [0] [18:41:51.264] getGlobalsAndPackages() ... DONE [18:41:51.264] + additional globals found: [n=0] [18:41:51.264] + additional namespaces needed: [n=0] [18:41:51.264] - Finding globals in 'X' for chunk #2 ... DONE [18:41:51.264] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.264] - seeds: [18:41:51.264] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.265] getGlobalsAndPackages() ... [18:41:51.265] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.265] Resolving globals: FALSE [18:41:51.265] Tweak future expression to call with '...' arguments ... [18:41:51.265] { [18:41:51.265] do.call(function(...) { [18:41:51.265] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.265] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.265] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.265] on.exit(options(oopts), add = TRUE) [18:41:51.265] } [18:41:51.265] { [18:41:51.265] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.265] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.265] ...future.FUN(...future.X_jj, ...) [18:41:51.265] }) [18:41:51.265] } [18:41:51.265] }, args = future.call.arguments) [18:41:51.265] } [18:41:51.266] Tweak future expression to call with '...' arguments ... DONE [18:41:51.266] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.267] [18:41:51.267] getGlobalsAndPackages() ... DONE [18:41:51.267] run() for 'Future' ... [18:41:51.267] - state: 'created' [18:41:51.267] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.287] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.287] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.288] - Field: 'node' [18:41:51.288] - Field: 'label' [18:41:51.288] - Field: 'local' [18:41:51.288] - Field: 'owner' [18:41:51.288] - Field: 'envir' [18:41:51.289] - Field: 'workers' [18:41:51.289] - Field: 'packages' [18:41:51.289] - Field: 'gc' [18:41:51.289] - Field: 'conditions' [18:41:51.289] - Field: 'persistent' [18:41:51.289] - Field: 'expr' [18:41:51.290] - Field: 'uuid' [18:41:51.290] - Field: 'seed' [18:41:51.290] - Field: 'version' [18:41:51.290] - Field: 'result' [18:41:51.290] - Field: 'asynchronous' [18:41:51.290] - Field: 'calls' [18:41:51.291] - Field: 'globals' [18:41:51.291] - Field: 'stdout' [18:41:51.291] - Field: 'earlySignal' [18:41:51.291] - Field: 'lazy' [18:41:51.291] - Field: 'state' [18:41:51.292] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.292] - Launch lazy future ... [18:41:51.292] Packages needed by the future expression (n = 0): [18:41:51.292] Packages needed by future strategies (n = 0): [18:41:51.293] { [18:41:51.293] { [18:41:51.293] { [18:41:51.293] ...future.startTime <- base::Sys.time() [18:41:51.293] { [18:41:51.293] { [18:41:51.293] { [18:41:51.293] { [18:41:51.293] base::local({ [18:41:51.293] has_future <- base::requireNamespace("future", [18:41:51.293] quietly = TRUE) [18:41:51.293] if (has_future) { [18:41:51.293] ns <- base::getNamespace("future") [18:41:51.293] version <- ns[[".package"]][["version"]] [18:41:51.293] if (is.null(version)) [18:41:51.293] version <- utils::packageVersion("future") [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] version <- NULL [18:41:51.293] } [18:41:51.293] if (!has_future || version < "1.8.0") { [18:41:51.293] info <- base::c(r_version = base::gsub("R version ", [18:41:51.293] "", base::R.version$version.string), [18:41:51.293] platform = base::sprintf("%s (%s-bit)", [18:41:51.293] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.293] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.293] "release", "version")], collapse = " "), [18:41:51.293] hostname = base::Sys.info()[["nodename"]]) [18:41:51.293] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.293] info) [18:41:51.293] info <- base::paste(info, collapse = "; ") [18:41:51.293] if (!has_future) { [18:41:51.293] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.293] info) [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.293] info, version) [18:41:51.293] } [18:41:51.293] base::stop(msg) [18:41:51.293] } [18:41:51.293] }) [18:41:51.293] } [18:41:51.293] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.293] base::options(mc.cores = 1L) [18:41:51.293] } [18:41:51.293] ...future.strategy.old <- future::plan("list") [18:41:51.293] options(future.plan = NULL) [18:41:51.293] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.293] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.293] } [18:41:51.293] ...future.workdir <- getwd() [18:41:51.293] } [18:41:51.293] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.293] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.293] } [18:41:51.293] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.293] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.293] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.293] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.293] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.293] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.293] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.293] base::names(...future.oldOptions)) [18:41:51.293] } [18:41:51.293] if (FALSE) { [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] if (TRUE) { [18:41:51.293] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.293] open = "w") [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.293] windows = "NUL", "/dev/null"), open = "w") [18:41:51.293] } [18:41:51.293] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.293] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.293] base::sink(type = "output", split = FALSE) [18:41:51.293] base::close(...future.stdout) [18:41:51.293] }, add = TRUE) [18:41:51.293] } [18:41:51.293] ...future.frame <- base::sys.nframe() [18:41:51.293] ...future.conditions <- base::list() [18:41:51.293] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.293] if (FALSE) { [18:41:51.293] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.293] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.293] } [18:41:51.293] ...future.result <- base::tryCatch({ [18:41:51.293] base::withCallingHandlers({ [18:41:51.293] ...future.value <- base::withVisible(base::local({ [18:41:51.293] ...future.makeSendCondition <- base::local({ [18:41:51.293] sendCondition <- NULL [18:41:51.293] function(frame = 1L) { [18:41:51.293] if (is.function(sendCondition)) [18:41:51.293] return(sendCondition) [18:41:51.293] ns <- getNamespace("parallel") [18:41:51.293] if (exists("sendData", mode = "function", [18:41:51.293] envir = ns)) { [18:41:51.293] parallel_sendData <- get("sendData", mode = "function", [18:41:51.293] envir = ns) [18:41:51.293] envir <- sys.frame(frame) [18:41:51.293] master <- NULL [18:41:51.293] while (!identical(envir, .GlobalEnv) && [18:41:51.293] !identical(envir, emptyenv())) { [18:41:51.293] if (exists("master", mode = "list", envir = envir, [18:41:51.293] inherits = FALSE)) { [18:41:51.293] master <- get("master", mode = "list", [18:41:51.293] envir = envir, inherits = FALSE) [18:41:51.293] if (inherits(master, c("SOCKnode", [18:41:51.293] "SOCK0node"))) { [18:41:51.293] sendCondition <<- function(cond) { [18:41:51.293] data <- list(type = "VALUE", value = cond, [18:41:51.293] success = TRUE) [18:41:51.293] parallel_sendData(master, data) [18:41:51.293] } [18:41:51.293] return(sendCondition) [18:41:51.293] } [18:41:51.293] } [18:41:51.293] frame <- frame + 1L [18:41:51.293] envir <- sys.frame(frame) [18:41:51.293] } [18:41:51.293] } [18:41:51.293] sendCondition <<- function(cond) NULL [18:41:51.293] } [18:41:51.293] }) [18:41:51.293] withCallingHandlers({ [18:41:51.293] { [18:41:51.293] do.call(function(...) { [18:41:51.293] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.293] if (!identical(...future.globals.maxSize.org, [18:41:51.293] ...future.globals.maxSize)) { [18:41:51.293] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.293] on.exit(options(oopts), add = TRUE) [18:41:51.293] } [18:41:51.293] { [18:41:51.293] lapply(seq_along(...future.elements_ii), [18:41:51.293] FUN = function(jj) { [18:41:51.293] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.293] ...future.FUN(...future.X_jj, ...) [18:41:51.293] }) [18:41:51.293] } [18:41:51.293] }, args = future.call.arguments) [18:41:51.293] } [18:41:51.293] }, immediateCondition = function(cond) { [18:41:51.293] sendCondition <- ...future.makeSendCondition() [18:41:51.293] sendCondition(cond) [18:41:51.293] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.293] { [18:41:51.293] inherits <- base::inherits [18:41:51.293] invokeRestart <- base::invokeRestart [18:41:51.293] is.null <- base::is.null [18:41:51.293] muffled <- FALSE [18:41:51.293] if (inherits(cond, "message")) { [18:41:51.293] muffled <- grepl(pattern, "muffleMessage") [18:41:51.293] if (muffled) [18:41:51.293] invokeRestart("muffleMessage") [18:41:51.293] } [18:41:51.293] else if (inherits(cond, "warning")) { [18:41:51.293] muffled <- grepl(pattern, "muffleWarning") [18:41:51.293] if (muffled) [18:41:51.293] invokeRestart("muffleWarning") [18:41:51.293] } [18:41:51.293] else if (inherits(cond, "condition")) { [18:41:51.293] if (!is.null(pattern)) { [18:41:51.293] computeRestarts <- base::computeRestarts [18:41:51.293] grepl <- base::grepl [18:41:51.293] restarts <- computeRestarts(cond) [18:41:51.293] for (restart in restarts) { [18:41:51.293] name <- restart$name [18:41:51.293] if (is.null(name)) [18:41:51.293] next [18:41:51.293] if (!grepl(pattern, name)) [18:41:51.293] next [18:41:51.293] invokeRestart(restart) [18:41:51.293] muffled <- TRUE [18:41:51.293] break [18:41:51.293] } [18:41:51.293] } [18:41:51.293] } [18:41:51.293] invisible(muffled) [18:41:51.293] } [18:41:51.293] muffleCondition(cond) [18:41:51.293] }) [18:41:51.293] })) [18:41:51.293] future::FutureResult(value = ...future.value$value, [18:41:51.293] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.293] ...future.rng), globalenv = if (FALSE) [18:41:51.293] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.293] ...future.globalenv.names)) [18:41:51.293] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.293] }, condition = base::local({ [18:41:51.293] c <- base::c [18:41:51.293] inherits <- base::inherits [18:41:51.293] invokeRestart <- base::invokeRestart [18:41:51.293] length <- base::length [18:41:51.293] list <- base::list [18:41:51.293] seq.int <- base::seq.int [18:41:51.293] signalCondition <- base::signalCondition [18:41:51.293] sys.calls <- base::sys.calls [18:41:51.293] `[[` <- base::`[[` [18:41:51.293] `+` <- base::`+` [18:41:51.293] `<<-` <- base::`<<-` [18:41:51.293] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.293] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.293] 3L)] [18:41:51.293] } [18:41:51.293] function(cond) { [18:41:51.293] is_error <- inherits(cond, "error") [18:41:51.293] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.293] NULL) [18:41:51.293] if (is_error) { [18:41:51.293] sessionInformation <- function() { [18:41:51.293] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.293] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.293] search = base::search(), system = base::Sys.info()) [18:41:51.293] } [18:41:51.293] ...future.conditions[[length(...future.conditions) + [18:41:51.293] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.293] cond$call), session = sessionInformation(), [18:41:51.293] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.293] signalCondition(cond) [18:41:51.293] } [18:41:51.293] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.293] "immediateCondition"))) { [18:41:51.293] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.293] ...future.conditions[[length(...future.conditions) + [18:41:51.293] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.293] if (TRUE && !signal) { [18:41:51.293] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.293] { [18:41:51.293] inherits <- base::inherits [18:41:51.293] invokeRestart <- base::invokeRestart [18:41:51.293] is.null <- base::is.null [18:41:51.293] muffled <- FALSE [18:41:51.293] if (inherits(cond, "message")) { [18:41:51.293] muffled <- grepl(pattern, "muffleMessage") [18:41:51.293] if (muffled) [18:41:51.293] invokeRestart("muffleMessage") [18:41:51.293] } [18:41:51.293] else if (inherits(cond, "warning")) { [18:41:51.293] muffled <- grepl(pattern, "muffleWarning") [18:41:51.293] if (muffled) [18:41:51.293] invokeRestart("muffleWarning") [18:41:51.293] } [18:41:51.293] else if (inherits(cond, "condition")) { [18:41:51.293] if (!is.null(pattern)) { [18:41:51.293] computeRestarts <- base::computeRestarts [18:41:51.293] grepl <- base::grepl [18:41:51.293] restarts <- computeRestarts(cond) [18:41:51.293] for (restart in restarts) { [18:41:51.293] name <- restart$name [18:41:51.293] if (is.null(name)) [18:41:51.293] next [18:41:51.293] if (!grepl(pattern, name)) [18:41:51.293] next [18:41:51.293] invokeRestart(restart) [18:41:51.293] muffled <- TRUE [18:41:51.293] break [18:41:51.293] } [18:41:51.293] } [18:41:51.293] } [18:41:51.293] invisible(muffled) [18:41:51.293] } [18:41:51.293] muffleCondition(cond, pattern = "^muffle") [18:41:51.293] } [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] if (TRUE) { [18:41:51.293] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.293] { [18:41:51.293] inherits <- base::inherits [18:41:51.293] invokeRestart <- base::invokeRestart [18:41:51.293] is.null <- base::is.null [18:41:51.293] muffled <- FALSE [18:41:51.293] if (inherits(cond, "message")) { [18:41:51.293] muffled <- grepl(pattern, "muffleMessage") [18:41:51.293] if (muffled) [18:41:51.293] invokeRestart("muffleMessage") [18:41:51.293] } [18:41:51.293] else if (inherits(cond, "warning")) { [18:41:51.293] muffled <- grepl(pattern, "muffleWarning") [18:41:51.293] if (muffled) [18:41:51.293] invokeRestart("muffleWarning") [18:41:51.293] } [18:41:51.293] else if (inherits(cond, "condition")) { [18:41:51.293] if (!is.null(pattern)) { [18:41:51.293] computeRestarts <- base::computeRestarts [18:41:51.293] grepl <- base::grepl [18:41:51.293] restarts <- computeRestarts(cond) [18:41:51.293] for (restart in restarts) { [18:41:51.293] name <- restart$name [18:41:51.293] if (is.null(name)) [18:41:51.293] next [18:41:51.293] if (!grepl(pattern, name)) [18:41:51.293] next [18:41:51.293] invokeRestart(restart) [18:41:51.293] muffled <- TRUE [18:41:51.293] break [18:41:51.293] } [18:41:51.293] } [18:41:51.293] } [18:41:51.293] invisible(muffled) [18:41:51.293] } [18:41:51.293] muffleCondition(cond, pattern = "^muffle") [18:41:51.293] } [18:41:51.293] } [18:41:51.293] } [18:41:51.293] })) [18:41:51.293] }, error = function(ex) { [18:41:51.293] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.293] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.293] ...future.rng), started = ...future.startTime, [18:41:51.293] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.293] version = "1.8"), class = "FutureResult") [18:41:51.293] }, finally = { [18:41:51.293] if (!identical(...future.workdir, getwd())) [18:41:51.293] setwd(...future.workdir) [18:41:51.293] { [18:41:51.293] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.293] ...future.oldOptions$nwarnings <- NULL [18:41:51.293] } [18:41:51.293] base::options(...future.oldOptions) [18:41:51.293] if (.Platform$OS.type == "windows") { [18:41:51.293] old_names <- names(...future.oldEnvVars) [18:41:51.293] envs <- base::Sys.getenv() [18:41:51.293] names <- names(envs) [18:41:51.293] common <- intersect(names, old_names) [18:41:51.293] added <- setdiff(names, old_names) [18:41:51.293] removed <- setdiff(old_names, names) [18:41:51.293] changed <- common[...future.oldEnvVars[common] != [18:41:51.293] envs[common]] [18:41:51.293] NAMES <- toupper(changed) [18:41:51.293] args <- list() [18:41:51.293] for (kk in seq_along(NAMES)) { [18:41:51.293] name <- changed[[kk]] [18:41:51.293] NAME <- NAMES[[kk]] [18:41:51.293] if (name != NAME && is.element(NAME, old_names)) [18:41:51.293] next [18:41:51.293] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.293] } [18:41:51.293] NAMES <- toupper(added) [18:41:51.293] for (kk in seq_along(NAMES)) { [18:41:51.293] name <- added[[kk]] [18:41:51.293] NAME <- NAMES[[kk]] [18:41:51.293] if (name != NAME && is.element(NAME, old_names)) [18:41:51.293] next [18:41:51.293] args[[name]] <- "" [18:41:51.293] } [18:41:51.293] NAMES <- toupper(removed) [18:41:51.293] for (kk in seq_along(NAMES)) { [18:41:51.293] name <- removed[[kk]] [18:41:51.293] NAME <- NAMES[[kk]] [18:41:51.293] if (name != NAME && is.element(NAME, old_names)) [18:41:51.293] next [18:41:51.293] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.293] } [18:41:51.293] if (length(args) > 0) [18:41:51.293] base::do.call(base::Sys.setenv, args = args) [18:41:51.293] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.293] } [18:41:51.293] { [18:41:51.293] if (base::length(...future.futureOptionsAdded) > [18:41:51.293] 0L) { [18:41:51.293] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.293] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.293] base::options(opts) [18:41:51.293] } [18:41:51.293] { [18:41:51.293] { [18:41:51.293] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.293] NULL [18:41:51.293] } [18:41:51.293] options(future.plan = NULL) [18:41:51.293] if (is.na(NA_character_)) [18:41:51.293] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.293] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.293] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.293] .init = FALSE) [18:41:51.293] } [18:41:51.293] } [18:41:51.293] } [18:41:51.293] }) [18:41:51.293] if (TRUE) { [18:41:51.293] base::sink(type = "output", split = FALSE) [18:41:51.293] if (TRUE) { [18:41:51.293] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.293] } [18:41:51.293] else { [18:41:51.293] ...future.result["stdout"] <- base::list(NULL) [18:41:51.293] } [18:41:51.293] base::close(...future.stdout) [18:41:51.293] ...future.stdout <- NULL [18:41:51.293] } [18:41:51.293] ...future.result$conditions <- ...future.conditions [18:41:51.293] ...future.result$finished <- base::Sys.time() [18:41:51.293] ...future.result [18:41:51.293] } [18:41:51.298] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:51.298] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:51.299] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:51.299] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.299] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.300] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.300] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.300] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.301] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.301] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.301] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.301] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:51.302] MultisessionFuture started [18:41:51.302] - Launch lazy future ... done [18:41:51.302] run() for 'MultisessionFuture' ... done [18:41:51.303] Created future: [18:41:51.318] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.319] - Validating connection of MultisessionFuture [18:41:51.319] - received message: FutureResult [18:41:51.319] - Received FutureResult [18:41:51.319] - Erased future from FutureRegistry [18:41:51.319] result() for ClusterFuture ... [18:41:51.320] - result already collected: FutureResult [18:41:51.320] result() for ClusterFuture ... done [18:41:51.320] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.303] MultisessionFuture: [18:41:51.303] Label: 'future_sapply-2' [18:41:51.303] Expression: [18:41:51.303] { [18:41:51.303] do.call(function(...) { [18:41:51.303] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.303] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.303] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.303] on.exit(options(oopts), add = TRUE) [18:41:51.303] } [18:41:51.303] { [18:41:51.303] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.303] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.303] ...future.FUN(...future.X_jj, ...) [18:41:51.303] }) [18:41:51.303] } [18:41:51.303] }, args = future.call.arguments) [18:41:51.303] } [18:41:51.303] Lazy evaluation: FALSE [18:41:51.303] Asynchronous evaluation: TRUE [18:41:51.303] Local evaluation: TRUE [18:41:51.303] Environment: R_GlobalEnv [18:41:51.303] Capture standard output: TRUE [18:41:51.303] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.303] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.303] Packages: [18:41:51.303] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.303] Resolved: TRUE [18:41:51.303] Value: [18:41:51.303] Conditions captured: [18:41:51.303] Early signaling: FALSE [18:41:51.303] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.303] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.320] Chunk #2 of 2 ... DONE [18:41:51.320] Launching 2 futures (chunks) ... DONE [18:41:51.321] Resolving 2 futures (chunks) ... [18:41:51.321] resolve() on list ... [18:41:51.321] recursive: 0 [18:41:51.321] length: 2 [18:41:51.321] [18:41:51.321] Future #1 [18:41:51.322] result() for ClusterFuture ... [18:41:51.322] - result already collected: FutureResult [18:41:51.322] result() for ClusterFuture ... done [18:41:51.322] result() for ClusterFuture ... [18:41:51.322] - result already collected: FutureResult [18:41:51.322] result() for ClusterFuture ... done [18:41:51.323] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:51.323] - nx: 2 [18:41:51.323] - relay: TRUE [18:41:51.323] - stdout: TRUE [18:41:51.323] - signal: TRUE [18:41:51.323] - resignal: FALSE [18:41:51.323] - force: TRUE [18:41:51.324] - relayed: [n=2] FALSE, FALSE [18:41:51.324] - queued futures: [n=2] FALSE, FALSE [18:41:51.324] - until=1 [18:41:51.324] - relaying element #1 [18:41:51.324] result() for ClusterFuture ... [18:41:51.324] - result already collected: FutureResult [18:41:51.325] result() for ClusterFuture ... done [18:41:51.325] result() for ClusterFuture ... [18:41:51.325] - result already collected: FutureResult [18:41:51.325] result() for ClusterFuture ... done [18:41:51.325] result() for ClusterFuture ... [18:41:51.325] - result already collected: FutureResult [18:41:51.326] result() for ClusterFuture ... done [18:41:51.326] result() for ClusterFuture ... [18:41:51.326] - result already collected: FutureResult [18:41:51.326] result() for ClusterFuture ... done [18:41:51.326] - relayed: [n=2] TRUE, FALSE [18:41:51.326] - queued futures: [n=2] TRUE, FALSE [18:41:51.327] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.327] length: 1 (resolved future 1) [18:41:51.327] Future #2 [18:41:51.327] result() for ClusterFuture ... [18:41:51.327] - result already collected: FutureResult [18:41:51.327] result() for ClusterFuture ... done [18:41:51.328] result() for ClusterFuture ... [18:41:51.328] - result already collected: FutureResult [18:41:51.328] result() for ClusterFuture ... done [18:41:51.328] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.328] - nx: 2 [18:41:51.328] - relay: TRUE [18:41:51.328] - stdout: TRUE [18:41:51.329] - signal: TRUE [18:41:51.329] - resignal: FALSE [18:41:51.329] - force: TRUE [18:41:51.329] - relayed: [n=2] TRUE, FALSE [18:41:51.329] - queued futures: [n=2] TRUE, FALSE [18:41:51.329] - until=2 [18:41:51.330] - relaying element #2 [18:41:51.330] result() for ClusterFuture ... [18:41:51.330] - result already collected: FutureResult [18:41:51.330] result() for ClusterFuture ... done [18:41:51.330] result() for ClusterFuture ... [18:41:51.330] - result already collected: FutureResult [18:41:51.330] result() for ClusterFuture ... done [18:41:51.331] result() for ClusterFuture ... [18:41:51.331] - result already collected: FutureResult [18:41:51.331] result() for ClusterFuture ... done [18:41:51.331] result() for ClusterFuture ... [18:41:51.331] - result already collected: FutureResult [18:41:51.331] result() for ClusterFuture ... done [18:41:51.332] - relayed: [n=2] TRUE, TRUE [18:41:51.332] - queued futures: [n=2] TRUE, TRUE [18:41:51.332] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.332] length: 0 (resolved future 2) [18:41:51.332] Relaying remaining futures [18:41:51.332] signalConditionsASAP(NULL, pos=0) ... [18:41:51.333] - nx: 2 [18:41:51.333] - relay: TRUE [18:41:51.333] - stdout: TRUE [18:41:51.333] - signal: TRUE [18:41:51.333] - resignal: FALSE [18:41:51.333] - force: TRUE [18:41:51.333] - relayed: [n=2] TRUE, TRUE [18:41:51.334] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.334] - relayed: [n=2] TRUE, TRUE [18:41:51.334] - queued futures: [n=2] TRUE, TRUE [18:41:51.334] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.334] resolve() on list ... DONE [18:41:51.335] result() for ClusterFuture ... [18:41:51.335] - result already collected: FutureResult [18:41:51.335] result() for ClusterFuture ... done [18:41:51.335] result() for ClusterFuture ... [18:41:51.335] - result already collected: FutureResult [18:41:51.335] result() for ClusterFuture ... done [18:41:51.336] result() for ClusterFuture ... [18:41:51.336] - result already collected: FutureResult [18:41:51.336] result() for ClusterFuture ... done [18:41:51.336] result() for ClusterFuture ... [18:41:51.336] - result already collected: FutureResult [18:41:51.336] result() for ClusterFuture ... done [18:41:51.336] - Number of value chunks collected: 2 [18:41:51.337] Resolving 2 futures (chunks) ... DONE [18:41:51.337] Reducing values from 2 chunks ... [18:41:51.337] - Number of values collected after concatenation: 6 [18:41:51.337] - Number of values expected: 6 [18:41:51.337] Reducing values from 2 chunks ... DONE [18:41:51.337] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:51.341] future_lapply() ... [18:41:51.344] Number of chunks: 2 [18:41:51.344] getGlobalsAndPackagesXApply() ... [18:41:51.344] - future.globals: TRUE [18:41:51.345] getGlobalsAndPackages() ... [18:41:51.345] Searching for globals... [18:41:51.346] - globals found: [1] 'FUN' [18:41:51.346] Searching for globals ... DONE [18:41:51.346] Resolving globals: FALSE [18:41:51.347] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:51.347] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:51.347] - globals: [1] 'FUN' [18:41:51.348] [18:41:51.348] getGlobalsAndPackages() ... DONE [18:41:51.348] - globals found/used: [n=1] 'FUN' [18:41:51.349] - needed namespaces: [n=0] [18:41:51.349] Finding globals ... DONE [18:41:51.349] - use_args: TRUE [18:41:51.350] - Getting '...' globals ... [18:41:51.351] resolve() on list ... [18:41:51.351] recursive: 0 [18:41:51.351] length: 1 [18:41:51.351] elements: '...' [18:41:51.352] length: 0 (resolved future 1) [18:41:51.352] resolve() on list ... DONE [18:41:51.352] - '...' content: [n=0] [18:41:51.352] List of 1 [18:41:51.352] $ ...: list() [18:41:51.352] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.352] - attr(*, "where")=List of 1 [18:41:51.352] ..$ ...: [18:41:51.352] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.352] - attr(*, "resolved")= logi TRUE [18:41:51.352] - attr(*, "total_size")= num NA [18:41:51.356] - Getting '...' globals ... DONE [18:41:51.356] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:51.356] List of 2 [18:41:51.356] $ ...future.FUN:function (x) [18:41:51.356] $ ... : list() [18:41:51.356] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.356] - attr(*, "where")=List of 2 [18:41:51.356] ..$ ...future.FUN: [18:41:51.356] ..$ ... : [18:41:51.356] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.356] - attr(*, "resolved")= logi FALSE [18:41:51.356] - attr(*, "total_size")= int 4942 [18:41:51.360] Packages to be attached in all futures: [n=0] [18:41:51.360] getGlobalsAndPackagesXApply() ... DONE [18:41:51.361] Number of futures (= number of chunks): 2 [18:41:51.361] Launching 2 futures (chunks) ... [18:41:51.361] Chunk #1 of 2 ... [18:41:51.361] - Finding globals in 'X' for chunk #1 ... [18:41:51.362] getGlobalsAndPackages() ... [18:41:51.362] Searching for globals... [18:41:51.362] [18:41:51.362] Searching for globals ... DONE [18:41:51.363] - globals: [0] [18:41:51.363] getGlobalsAndPackages() ... DONE [18:41:51.363] + additional globals found: [n=0] [18:41:51.363] + additional namespaces needed: [n=0] [18:41:51.363] - Finding globals in 'X' for chunk #1 ... DONE [18:41:51.364] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.364] - seeds: [18:41:51.364] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.364] getGlobalsAndPackages() ... [18:41:51.364] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.365] Resolving globals: FALSE [18:41:51.365] Tweak future expression to call with '...' arguments ... [18:41:51.365] { [18:41:51.365] do.call(function(...) { [18:41:51.365] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.365] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.365] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.365] on.exit(options(oopts), add = TRUE) [18:41:51.365] } [18:41:51.365] { [18:41:51.365] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.365] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.365] ...future.FUN(...future.X_jj, ...) [18:41:51.365] }) [18:41:51.365] } [18:41:51.365] }, args = future.call.arguments) [18:41:51.365] } [18:41:51.366] Tweak future expression to call with '...' arguments ... DONE [18:41:51.366] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.367] [18:41:51.367] getGlobalsAndPackages() ... DONE [18:41:51.367] run() for 'Future' ... [18:41:51.367] - state: 'created' [18:41:51.368] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.386] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.387] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.387] - Field: 'node' [18:41:51.387] - Field: 'label' [18:41:51.387] - Field: 'local' [18:41:51.387] - Field: 'owner' [18:41:51.388] - Field: 'envir' [18:41:51.388] - Field: 'workers' [18:41:51.388] - Field: 'packages' [18:41:51.388] - Field: 'gc' [18:41:51.389] - Field: 'conditions' [18:41:51.389] - Field: 'persistent' [18:41:51.389] - Field: 'expr' [18:41:51.389] - Field: 'uuid' [18:41:51.389] - Field: 'seed' [18:41:51.390] - Field: 'version' [18:41:51.390] - Field: 'result' [18:41:51.390] - Field: 'asynchronous' [18:41:51.390] - Field: 'calls' [18:41:51.390] - Field: 'globals' [18:41:51.391] - Field: 'stdout' [18:41:51.391] - Field: 'earlySignal' [18:41:51.391] - Field: 'lazy' [18:41:51.391] - Field: 'state' [18:41:51.391] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.392] - Launch lazy future ... [18:41:51.392] Packages needed by the future expression (n = 0): [18:41:51.393] Packages needed by future strategies (n = 0): [18:41:51.393] { [18:41:51.393] { [18:41:51.393] { [18:41:51.393] ...future.startTime <- base::Sys.time() [18:41:51.393] { [18:41:51.393] { [18:41:51.393] { [18:41:51.393] { [18:41:51.393] base::local({ [18:41:51.393] has_future <- base::requireNamespace("future", [18:41:51.393] quietly = TRUE) [18:41:51.393] if (has_future) { [18:41:51.393] ns <- base::getNamespace("future") [18:41:51.393] version <- ns[[".package"]][["version"]] [18:41:51.393] if (is.null(version)) [18:41:51.393] version <- utils::packageVersion("future") [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] version <- NULL [18:41:51.393] } [18:41:51.393] if (!has_future || version < "1.8.0") { [18:41:51.393] info <- base::c(r_version = base::gsub("R version ", [18:41:51.393] "", base::R.version$version.string), [18:41:51.393] platform = base::sprintf("%s (%s-bit)", [18:41:51.393] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.393] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.393] "release", "version")], collapse = " "), [18:41:51.393] hostname = base::Sys.info()[["nodename"]]) [18:41:51.393] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.393] info) [18:41:51.393] info <- base::paste(info, collapse = "; ") [18:41:51.393] if (!has_future) { [18:41:51.393] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.393] info) [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.393] info, version) [18:41:51.393] } [18:41:51.393] base::stop(msg) [18:41:51.393] } [18:41:51.393] }) [18:41:51.393] } [18:41:51.393] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.393] base::options(mc.cores = 1L) [18:41:51.393] } [18:41:51.393] ...future.strategy.old <- future::plan("list") [18:41:51.393] options(future.plan = NULL) [18:41:51.393] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.393] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.393] } [18:41:51.393] ...future.workdir <- getwd() [18:41:51.393] } [18:41:51.393] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.393] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.393] } [18:41:51.393] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.393] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.393] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.393] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.393] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.393] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.393] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.393] base::names(...future.oldOptions)) [18:41:51.393] } [18:41:51.393] if (FALSE) { [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] if (TRUE) { [18:41:51.393] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.393] open = "w") [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.393] windows = "NUL", "/dev/null"), open = "w") [18:41:51.393] } [18:41:51.393] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.393] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.393] base::sink(type = "output", split = FALSE) [18:41:51.393] base::close(...future.stdout) [18:41:51.393] }, add = TRUE) [18:41:51.393] } [18:41:51.393] ...future.frame <- base::sys.nframe() [18:41:51.393] ...future.conditions <- base::list() [18:41:51.393] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.393] if (FALSE) { [18:41:51.393] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.393] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.393] } [18:41:51.393] ...future.result <- base::tryCatch({ [18:41:51.393] base::withCallingHandlers({ [18:41:51.393] ...future.value <- base::withVisible(base::local({ [18:41:51.393] ...future.makeSendCondition <- base::local({ [18:41:51.393] sendCondition <- NULL [18:41:51.393] function(frame = 1L) { [18:41:51.393] if (is.function(sendCondition)) [18:41:51.393] return(sendCondition) [18:41:51.393] ns <- getNamespace("parallel") [18:41:51.393] if (exists("sendData", mode = "function", [18:41:51.393] envir = ns)) { [18:41:51.393] parallel_sendData <- get("sendData", mode = "function", [18:41:51.393] envir = ns) [18:41:51.393] envir <- sys.frame(frame) [18:41:51.393] master <- NULL [18:41:51.393] while (!identical(envir, .GlobalEnv) && [18:41:51.393] !identical(envir, emptyenv())) { [18:41:51.393] if (exists("master", mode = "list", envir = envir, [18:41:51.393] inherits = FALSE)) { [18:41:51.393] master <- get("master", mode = "list", [18:41:51.393] envir = envir, inherits = FALSE) [18:41:51.393] if (inherits(master, c("SOCKnode", [18:41:51.393] "SOCK0node"))) { [18:41:51.393] sendCondition <<- function(cond) { [18:41:51.393] data <- list(type = "VALUE", value = cond, [18:41:51.393] success = TRUE) [18:41:51.393] parallel_sendData(master, data) [18:41:51.393] } [18:41:51.393] return(sendCondition) [18:41:51.393] } [18:41:51.393] } [18:41:51.393] frame <- frame + 1L [18:41:51.393] envir <- sys.frame(frame) [18:41:51.393] } [18:41:51.393] } [18:41:51.393] sendCondition <<- function(cond) NULL [18:41:51.393] } [18:41:51.393] }) [18:41:51.393] withCallingHandlers({ [18:41:51.393] { [18:41:51.393] do.call(function(...) { [18:41:51.393] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.393] if (!identical(...future.globals.maxSize.org, [18:41:51.393] ...future.globals.maxSize)) { [18:41:51.393] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.393] on.exit(options(oopts), add = TRUE) [18:41:51.393] } [18:41:51.393] { [18:41:51.393] lapply(seq_along(...future.elements_ii), [18:41:51.393] FUN = function(jj) { [18:41:51.393] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.393] ...future.FUN(...future.X_jj, ...) [18:41:51.393] }) [18:41:51.393] } [18:41:51.393] }, args = future.call.arguments) [18:41:51.393] } [18:41:51.393] }, immediateCondition = function(cond) { [18:41:51.393] sendCondition <- ...future.makeSendCondition() [18:41:51.393] sendCondition(cond) [18:41:51.393] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.393] { [18:41:51.393] inherits <- base::inherits [18:41:51.393] invokeRestart <- base::invokeRestart [18:41:51.393] is.null <- base::is.null [18:41:51.393] muffled <- FALSE [18:41:51.393] if (inherits(cond, "message")) { [18:41:51.393] muffled <- grepl(pattern, "muffleMessage") [18:41:51.393] if (muffled) [18:41:51.393] invokeRestart("muffleMessage") [18:41:51.393] } [18:41:51.393] else if (inherits(cond, "warning")) { [18:41:51.393] muffled <- grepl(pattern, "muffleWarning") [18:41:51.393] if (muffled) [18:41:51.393] invokeRestart("muffleWarning") [18:41:51.393] } [18:41:51.393] else if (inherits(cond, "condition")) { [18:41:51.393] if (!is.null(pattern)) { [18:41:51.393] computeRestarts <- base::computeRestarts [18:41:51.393] grepl <- base::grepl [18:41:51.393] restarts <- computeRestarts(cond) [18:41:51.393] for (restart in restarts) { [18:41:51.393] name <- restart$name [18:41:51.393] if (is.null(name)) [18:41:51.393] next [18:41:51.393] if (!grepl(pattern, name)) [18:41:51.393] next [18:41:51.393] invokeRestart(restart) [18:41:51.393] muffled <- TRUE [18:41:51.393] break [18:41:51.393] } [18:41:51.393] } [18:41:51.393] } [18:41:51.393] invisible(muffled) [18:41:51.393] } [18:41:51.393] muffleCondition(cond) [18:41:51.393] }) [18:41:51.393] })) [18:41:51.393] future::FutureResult(value = ...future.value$value, [18:41:51.393] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.393] ...future.rng), globalenv = if (FALSE) [18:41:51.393] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.393] ...future.globalenv.names)) [18:41:51.393] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.393] }, condition = base::local({ [18:41:51.393] c <- base::c [18:41:51.393] inherits <- base::inherits [18:41:51.393] invokeRestart <- base::invokeRestart [18:41:51.393] length <- base::length [18:41:51.393] list <- base::list [18:41:51.393] seq.int <- base::seq.int [18:41:51.393] signalCondition <- base::signalCondition [18:41:51.393] sys.calls <- base::sys.calls [18:41:51.393] `[[` <- base::`[[` [18:41:51.393] `+` <- base::`+` [18:41:51.393] `<<-` <- base::`<<-` [18:41:51.393] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.393] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.393] 3L)] [18:41:51.393] } [18:41:51.393] function(cond) { [18:41:51.393] is_error <- inherits(cond, "error") [18:41:51.393] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.393] NULL) [18:41:51.393] if (is_error) { [18:41:51.393] sessionInformation <- function() { [18:41:51.393] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.393] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.393] search = base::search(), system = base::Sys.info()) [18:41:51.393] } [18:41:51.393] ...future.conditions[[length(...future.conditions) + [18:41:51.393] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.393] cond$call), session = sessionInformation(), [18:41:51.393] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.393] signalCondition(cond) [18:41:51.393] } [18:41:51.393] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.393] "immediateCondition"))) { [18:41:51.393] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.393] ...future.conditions[[length(...future.conditions) + [18:41:51.393] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.393] if (TRUE && !signal) { [18:41:51.393] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.393] { [18:41:51.393] inherits <- base::inherits [18:41:51.393] invokeRestart <- base::invokeRestart [18:41:51.393] is.null <- base::is.null [18:41:51.393] muffled <- FALSE [18:41:51.393] if (inherits(cond, "message")) { [18:41:51.393] muffled <- grepl(pattern, "muffleMessage") [18:41:51.393] if (muffled) [18:41:51.393] invokeRestart("muffleMessage") [18:41:51.393] } [18:41:51.393] else if (inherits(cond, "warning")) { [18:41:51.393] muffled <- grepl(pattern, "muffleWarning") [18:41:51.393] if (muffled) [18:41:51.393] invokeRestart("muffleWarning") [18:41:51.393] } [18:41:51.393] else if (inherits(cond, "condition")) { [18:41:51.393] if (!is.null(pattern)) { [18:41:51.393] computeRestarts <- base::computeRestarts [18:41:51.393] grepl <- base::grepl [18:41:51.393] restarts <- computeRestarts(cond) [18:41:51.393] for (restart in restarts) { [18:41:51.393] name <- restart$name [18:41:51.393] if (is.null(name)) [18:41:51.393] next [18:41:51.393] if (!grepl(pattern, name)) [18:41:51.393] next [18:41:51.393] invokeRestart(restart) [18:41:51.393] muffled <- TRUE [18:41:51.393] break [18:41:51.393] } [18:41:51.393] } [18:41:51.393] } [18:41:51.393] invisible(muffled) [18:41:51.393] } [18:41:51.393] muffleCondition(cond, pattern = "^muffle") [18:41:51.393] } [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] if (TRUE) { [18:41:51.393] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.393] { [18:41:51.393] inherits <- base::inherits [18:41:51.393] invokeRestart <- base::invokeRestart [18:41:51.393] is.null <- base::is.null [18:41:51.393] muffled <- FALSE [18:41:51.393] if (inherits(cond, "message")) { [18:41:51.393] muffled <- grepl(pattern, "muffleMessage") [18:41:51.393] if (muffled) [18:41:51.393] invokeRestart("muffleMessage") [18:41:51.393] } [18:41:51.393] else if (inherits(cond, "warning")) { [18:41:51.393] muffled <- grepl(pattern, "muffleWarning") [18:41:51.393] if (muffled) [18:41:51.393] invokeRestart("muffleWarning") [18:41:51.393] } [18:41:51.393] else if (inherits(cond, "condition")) { [18:41:51.393] if (!is.null(pattern)) { [18:41:51.393] computeRestarts <- base::computeRestarts [18:41:51.393] grepl <- base::grepl [18:41:51.393] restarts <- computeRestarts(cond) [18:41:51.393] for (restart in restarts) { [18:41:51.393] name <- restart$name [18:41:51.393] if (is.null(name)) [18:41:51.393] next [18:41:51.393] if (!grepl(pattern, name)) [18:41:51.393] next [18:41:51.393] invokeRestart(restart) [18:41:51.393] muffled <- TRUE [18:41:51.393] break [18:41:51.393] } [18:41:51.393] } [18:41:51.393] } [18:41:51.393] invisible(muffled) [18:41:51.393] } [18:41:51.393] muffleCondition(cond, pattern = "^muffle") [18:41:51.393] } [18:41:51.393] } [18:41:51.393] } [18:41:51.393] })) [18:41:51.393] }, error = function(ex) { [18:41:51.393] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.393] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.393] ...future.rng), started = ...future.startTime, [18:41:51.393] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.393] version = "1.8"), class = "FutureResult") [18:41:51.393] }, finally = { [18:41:51.393] if (!identical(...future.workdir, getwd())) [18:41:51.393] setwd(...future.workdir) [18:41:51.393] { [18:41:51.393] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.393] ...future.oldOptions$nwarnings <- NULL [18:41:51.393] } [18:41:51.393] base::options(...future.oldOptions) [18:41:51.393] if (.Platform$OS.type == "windows") { [18:41:51.393] old_names <- names(...future.oldEnvVars) [18:41:51.393] envs <- base::Sys.getenv() [18:41:51.393] names <- names(envs) [18:41:51.393] common <- intersect(names, old_names) [18:41:51.393] added <- setdiff(names, old_names) [18:41:51.393] removed <- setdiff(old_names, names) [18:41:51.393] changed <- common[...future.oldEnvVars[common] != [18:41:51.393] envs[common]] [18:41:51.393] NAMES <- toupper(changed) [18:41:51.393] args <- list() [18:41:51.393] for (kk in seq_along(NAMES)) { [18:41:51.393] name <- changed[[kk]] [18:41:51.393] NAME <- NAMES[[kk]] [18:41:51.393] if (name != NAME && is.element(NAME, old_names)) [18:41:51.393] next [18:41:51.393] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.393] } [18:41:51.393] NAMES <- toupper(added) [18:41:51.393] for (kk in seq_along(NAMES)) { [18:41:51.393] name <- added[[kk]] [18:41:51.393] NAME <- NAMES[[kk]] [18:41:51.393] if (name != NAME && is.element(NAME, old_names)) [18:41:51.393] next [18:41:51.393] args[[name]] <- "" [18:41:51.393] } [18:41:51.393] NAMES <- toupper(removed) [18:41:51.393] for (kk in seq_along(NAMES)) { [18:41:51.393] name <- removed[[kk]] [18:41:51.393] NAME <- NAMES[[kk]] [18:41:51.393] if (name != NAME && is.element(NAME, old_names)) [18:41:51.393] next [18:41:51.393] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.393] } [18:41:51.393] if (length(args) > 0) [18:41:51.393] base::do.call(base::Sys.setenv, args = args) [18:41:51.393] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.393] } [18:41:51.393] { [18:41:51.393] if (base::length(...future.futureOptionsAdded) > [18:41:51.393] 0L) { [18:41:51.393] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.393] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.393] base::options(opts) [18:41:51.393] } [18:41:51.393] { [18:41:51.393] { [18:41:51.393] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.393] NULL [18:41:51.393] } [18:41:51.393] options(future.plan = NULL) [18:41:51.393] if (is.na(NA_character_)) [18:41:51.393] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.393] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.393] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.393] .init = FALSE) [18:41:51.393] } [18:41:51.393] } [18:41:51.393] } [18:41:51.393] }) [18:41:51.393] if (TRUE) { [18:41:51.393] base::sink(type = "output", split = FALSE) [18:41:51.393] if (TRUE) { [18:41:51.393] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.393] } [18:41:51.393] else { [18:41:51.393] ...future.result["stdout"] <- base::list(NULL) [18:41:51.393] } [18:41:51.393] base::close(...future.stdout) [18:41:51.393] ...future.stdout <- NULL [18:41:51.393] } [18:41:51.393] ...future.result$conditions <- ...future.conditions [18:41:51.393] ...future.result$finished <- base::Sys.time() [18:41:51.393] ...future.result [18:41:51.393] } [18:41:51.399] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:51.399] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:51.400] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:51.400] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.401] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.401] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.401] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.401] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.402] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.402] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.402] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.402] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:51.403] MultisessionFuture started [18:41:51.403] - Launch lazy future ... done [18:41:51.404] run() for 'MultisessionFuture' ... done [18:41:51.404] Created future: [18:41:51.417] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.417] - Validating connection of MultisessionFuture [18:41:51.417] - received message: FutureResult [18:41:51.417] - Received FutureResult [18:41:51.417] - Erased future from FutureRegistry [18:41:51.418] result() for ClusterFuture ... [18:41:51.418] - result already collected: FutureResult [18:41:51.418] result() for ClusterFuture ... done [18:41:51.418] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.404] MultisessionFuture: [18:41:51.404] Label: 'future_sapply-1' [18:41:51.404] Expression: [18:41:51.404] { [18:41:51.404] do.call(function(...) { [18:41:51.404] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.404] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.404] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.404] on.exit(options(oopts), add = TRUE) [18:41:51.404] } [18:41:51.404] { [18:41:51.404] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.404] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.404] ...future.FUN(...future.X_jj, ...) [18:41:51.404] }) [18:41:51.404] } [18:41:51.404] }, args = future.call.arguments) [18:41:51.404] } [18:41:51.404] Lazy evaluation: FALSE [18:41:51.404] Asynchronous evaluation: TRUE [18:41:51.404] Local evaluation: TRUE [18:41:51.404] Environment: R_GlobalEnv [18:41:51.404] Capture standard output: TRUE [18:41:51.404] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.404] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.404] Packages: [18:41:51.404] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.404] Resolved: TRUE [18:41:51.404] Value: [18:41:51.404] Conditions captured: [18:41:51.404] Early signaling: FALSE [18:41:51.404] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.404] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.419] Chunk #1 of 2 ... DONE [18:41:51.419] Chunk #2 of 2 ... [18:41:51.419] - Finding globals in 'X' for chunk #2 ... [18:41:51.419] getGlobalsAndPackages() ... [18:41:51.419] Searching for globals... [18:41:51.420] [18:41:51.420] Searching for globals ... DONE [18:41:51.420] - globals: [0] [18:41:51.420] getGlobalsAndPackages() ... DONE [18:41:51.420] + additional globals found: [n=0] [18:41:51.420] + additional namespaces needed: [n=0] [18:41:51.421] - Finding globals in 'X' for chunk #2 ... DONE [18:41:51.421] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.421] - seeds: [18:41:51.421] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.421] getGlobalsAndPackages() ... [18:41:51.421] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.422] Resolving globals: FALSE [18:41:51.422] Tweak future expression to call with '...' arguments ... [18:41:51.422] { [18:41:51.422] do.call(function(...) { [18:41:51.422] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.422] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.422] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.422] on.exit(options(oopts), add = TRUE) [18:41:51.422] } [18:41:51.422] { [18:41:51.422] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.422] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.422] ...future.FUN(...future.X_jj, ...) [18:41:51.422] }) [18:41:51.422] } [18:41:51.422] }, args = future.call.arguments) [18:41:51.422] } [18:41:51.422] Tweak future expression to call with '...' arguments ... DONE [18:41:51.423] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.423] [18:41:51.423] getGlobalsAndPackages() ... DONE [18:41:51.424] run() for 'Future' ... [18:41:51.424] - state: 'created' [18:41:51.424] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.439] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.439] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.439] - Field: 'node' [18:41:51.440] - Field: 'label' [18:41:51.440] - Field: 'local' [18:41:51.440] - Field: 'owner' [18:41:51.440] - Field: 'envir' [18:41:51.440] - Field: 'workers' [18:41:51.441] - Field: 'packages' [18:41:51.441] - Field: 'gc' [18:41:51.441] - Field: 'conditions' [18:41:51.441] - Field: 'persistent' [18:41:51.441] - Field: 'expr' [18:41:51.442] - Field: 'uuid' [18:41:51.442] - Field: 'seed' [18:41:51.442] - Field: 'version' [18:41:51.442] - Field: 'result' [18:41:51.442] - Field: 'asynchronous' [18:41:51.442] - Field: 'calls' [18:41:51.443] - Field: 'globals' [18:41:51.443] - Field: 'stdout' [18:41:51.443] - Field: 'earlySignal' [18:41:51.443] - Field: 'lazy' [18:41:51.443] - Field: 'state' [18:41:51.443] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.444] - Launch lazy future ... [18:41:51.444] Packages needed by the future expression (n = 0): [18:41:51.444] Packages needed by future strategies (n = 0): [18:41:51.445] { [18:41:51.445] { [18:41:51.445] { [18:41:51.445] ...future.startTime <- base::Sys.time() [18:41:51.445] { [18:41:51.445] { [18:41:51.445] { [18:41:51.445] { [18:41:51.445] base::local({ [18:41:51.445] has_future <- base::requireNamespace("future", [18:41:51.445] quietly = TRUE) [18:41:51.445] if (has_future) { [18:41:51.445] ns <- base::getNamespace("future") [18:41:51.445] version <- ns[[".package"]][["version"]] [18:41:51.445] if (is.null(version)) [18:41:51.445] version <- utils::packageVersion("future") [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] version <- NULL [18:41:51.445] } [18:41:51.445] if (!has_future || version < "1.8.0") { [18:41:51.445] info <- base::c(r_version = base::gsub("R version ", [18:41:51.445] "", base::R.version$version.string), [18:41:51.445] platform = base::sprintf("%s (%s-bit)", [18:41:51.445] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.445] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.445] "release", "version")], collapse = " "), [18:41:51.445] hostname = base::Sys.info()[["nodename"]]) [18:41:51.445] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.445] info) [18:41:51.445] info <- base::paste(info, collapse = "; ") [18:41:51.445] if (!has_future) { [18:41:51.445] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.445] info) [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.445] info, version) [18:41:51.445] } [18:41:51.445] base::stop(msg) [18:41:51.445] } [18:41:51.445] }) [18:41:51.445] } [18:41:51.445] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.445] base::options(mc.cores = 1L) [18:41:51.445] } [18:41:51.445] ...future.strategy.old <- future::plan("list") [18:41:51.445] options(future.plan = NULL) [18:41:51.445] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.445] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.445] } [18:41:51.445] ...future.workdir <- getwd() [18:41:51.445] } [18:41:51.445] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.445] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.445] } [18:41:51.445] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.445] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.445] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.445] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.445] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.445] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.445] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.445] base::names(...future.oldOptions)) [18:41:51.445] } [18:41:51.445] if (FALSE) { [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] if (TRUE) { [18:41:51.445] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.445] open = "w") [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.445] windows = "NUL", "/dev/null"), open = "w") [18:41:51.445] } [18:41:51.445] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.445] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.445] base::sink(type = "output", split = FALSE) [18:41:51.445] base::close(...future.stdout) [18:41:51.445] }, add = TRUE) [18:41:51.445] } [18:41:51.445] ...future.frame <- base::sys.nframe() [18:41:51.445] ...future.conditions <- base::list() [18:41:51.445] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.445] if (FALSE) { [18:41:51.445] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.445] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.445] } [18:41:51.445] ...future.result <- base::tryCatch({ [18:41:51.445] base::withCallingHandlers({ [18:41:51.445] ...future.value <- base::withVisible(base::local({ [18:41:51.445] ...future.makeSendCondition <- base::local({ [18:41:51.445] sendCondition <- NULL [18:41:51.445] function(frame = 1L) { [18:41:51.445] if (is.function(sendCondition)) [18:41:51.445] return(sendCondition) [18:41:51.445] ns <- getNamespace("parallel") [18:41:51.445] if (exists("sendData", mode = "function", [18:41:51.445] envir = ns)) { [18:41:51.445] parallel_sendData <- get("sendData", mode = "function", [18:41:51.445] envir = ns) [18:41:51.445] envir <- sys.frame(frame) [18:41:51.445] master <- NULL [18:41:51.445] while (!identical(envir, .GlobalEnv) && [18:41:51.445] !identical(envir, emptyenv())) { [18:41:51.445] if (exists("master", mode = "list", envir = envir, [18:41:51.445] inherits = FALSE)) { [18:41:51.445] master <- get("master", mode = "list", [18:41:51.445] envir = envir, inherits = FALSE) [18:41:51.445] if (inherits(master, c("SOCKnode", [18:41:51.445] "SOCK0node"))) { [18:41:51.445] sendCondition <<- function(cond) { [18:41:51.445] data <- list(type = "VALUE", value = cond, [18:41:51.445] success = TRUE) [18:41:51.445] parallel_sendData(master, data) [18:41:51.445] } [18:41:51.445] return(sendCondition) [18:41:51.445] } [18:41:51.445] } [18:41:51.445] frame <- frame + 1L [18:41:51.445] envir <- sys.frame(frame) [18:41:51.445] } [18:41:51.445] } [18:41:51.445] sendCondition <<- function(cond) NULL [18:41:51.445] } [18:41:51.445] }) [18:41:51.445] withCallingHandlers({ [18:41:51.445] { [18:41:51.445] do.call(function(...) { [18:41:51.445] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.445] if (!identical(...future.globals.maxSize.org, [18:41:51.445] ...future.globals.maxSize)) { [18:41:51.445] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.445] on.exit(options(oopts), add = TRUE) [18:41:51.445] } [18:41:51.445] { [18:41:51.445] lapply(seq_along(...future.elements_ii), [18:41:51.445] FUN = function(jj) { [18:41:51.445] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.445] ...future.FUN(...future.X_jj, ...) [18:41:51.445] }) [18:41:51.445] } [18:41:51.445] }, args = future.call.arguments) [18:41:51.445] } [18:41:51.445] }, immediateCondition = function(cond) { [18:41:51.445] sendCondition <- ...future.makeSendCondition() [18:41:51.445] sendCondition(cond) [18:41:51.445] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.445] { [18:41:51.445] inherits <- base::inherits [18:41:51.445] invokeRestart <- base::invokeRestart [18:41:51.445] is.null <- base::is.null [18:41:51.445] muffled <- FALSE [18:41:51.445] if (inherits(cond, "message")) { [18:41:51.445] muffled <- grepl(pattern, "muffleMessage") [18:41:51.445] if (muffled) [18:41:51.445] invokeRestart("muffleMessage") [18:41:51.445] } [18:41:51.445] else if (inherits(cond, "warning")) { [18:41:51.445] muffled <- grepl(pattern, "muffleWarning") [18:41:51.445] if (muffled) [18:41:51.445] invokeRestart("muffleWarning") [18:41:51.445] } [18:41:51.445] else if (inherits(cond, "condition")) { [18:41:51.445] if (!is.null(pattern)) { [18:41:51.445] computeRestarts <- base::computeRestarts [18:41:51.445] grepl <- base::grepl [18:41:51.445] restarts <- computeRestarts(cond) [18:41:51.445] for (restart in restarts) { [18:41:51.445] name <- restart$name [18:41:51.445] if (is.null(name)) [18:41:51.445] next [18:41:51.445] if (!grepl(pattern, name)) [18:41:51.445] next [18:41:51.445] invokeRestart(restart) [18:41:51.445] muffled <- TRUE [18:41:51.445] break [18:41:51.445] } [18:41:51.445] } [18:41:51.445] } [18:41:51.445] invisible(muffled) [18:41:51.445] } [18:41:51.445] muffleCondition(cond) [18:41:51.445] }) [18:41:51.445] })) [18:41:51.445] future::FutureResult(value = ...future.value$value, [18:41:51.445] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.445] ...future.rng), globalenv = if (FALSE) [18:41:51.445] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.445] ...future.globalenv.names)) [18:41:51.445] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.445] }, condition = base::local({ [18:41:51.445] c <- base::c [18:41:51.445] inherits <- base::inherits [18:41:51.445] invokeRestart <- base::invokeRestart [18:41:51.445] length <- base::length [18:41:51.445] list <- base::list [18:41:51.445] seq.int <- base::seq.int [18:41:51.445] signalCondition <- base::signalCondition [18:41:51.445] sys.calls <- base::sys.calls [18:41:51.445] `[[` <- base::`[[` [18:41:51.445] `+` <- base::`+` [18:41:51.445] `<<-` <- base::`<<-` [18:41:51.445] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.445] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.445] 3L)] [18:41:51.445] } [18:41:51.445] function(cond) { [18:41:51.445] is_error <- inherits(cond, "error") [18:41:51.445] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.445] NULL) [18:41:51.445] if (is_error) { [18:41:51.445] sessionInformation <- function() { [18:41:51.445] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.445] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.445] search = base::search(), system = base::Sys.info()) [18:41:51.445] } [18:41:51.445] ...future.conditions[[length(...future.conditions) + [18:41:51.445] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.445] cond$call), session = sessionInformation(), [18:41:51.445] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.445] signalCondition(cond) [18:41:51.445] } [18:41:51.445] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.445] "immediateCondition"))) { [18:41:51.445] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.445] ...future.conditions[[length(...future.conditions) + [18:41:51.445] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.445] if (TRUE && !signal) { [18:41:51.445] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.445] { [18:41:51.445] inherits <- base::inherits [18:41:51.445] invokeRestart <- base::invokeRestart [18:41:51.445] is.null <- base::is.null [18:41:51.445] muffled <- FALSE [18:41:51.445] if (inherits(cond, "message")) { [18:41:51.445] muffled <- grepl(pattern, "muffleMessage") [18:41:51.445] if (muffled) [18:41:51.445] invokeRestart("muffleMessage") [18:41:51.445] } [18:41:51.445] else if (inherits(cond, "warning")) { [18:41:51.445] muffled <- grepl(pattern, "muffleWarning") [18:41:51.445] if (muffled) [18:41:51.445] invokeRestart("muffleWarning") [18:41:51.445] } [18:41:51.445] else if (inherits(cond, "condition")) { [18:41:51.445] if (!is.null(pattern)) { [18:41:51.445] computeRestarts <- base::computeRestarts [18:41:51.445] grepl <- base::grepl [18:41:51.445] restarts <- computeRestarts(cond) [18:41:51.445] for (restart in restarts) { [18:41:51.445] name <- restart$name [18:41:51.445] if (is.null(name)) [18:41:51.445] next [18:41:51.445] if (!grepl(pattern, name)) [18:41:51.445] next [18:41:51.445] invokeRestart(restart) [18:41:51.445] muffled <- TRUE [18:41:51.445] break [18:41:51.445] } [18:41:51.445] } [18:41:51.445] } [18:41:51.445] invisible(muffled) [18:41:51.445] } [18:41:51.445] muffleCondition(cond, pattern = "^muffle") [18:41:51.445] } [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] if (TRUE) { [18:41:51.445] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.445] { [18:41:51.445] inherits <- base::inherits [18:41:51.445] invokeRestart <- base::invokeRestart [18:41:51.445] is.null <- base::is.null [18:41:51.445] muffled <- FALSE [18:41:51.445] if (inherits(cond, "message")) { [18:41:51.445] muffled <- grepl(pattern, "muffleMessage") [18:41:51.445] if (muffled) [18:41:51.445] invokeRestart("muffleMessage") [18:41:51.445] } [18:41:51.445] else if (inherits(cond, "warning")) { [18:41:51.445] muffled <- grepl(pattern, "muffleWarning") [18:41:51.445] if (muffled) [18:41:51.445] invokeRestart("muffleWarning") [18:41:51.445] } [18:41:51.445] else if (inherits(cond, "condition")) { [18:41:51.445] if (!is.null(pattern)) { [18:41:51.445] computeRestarts <- base::computeRestarts [18:41:51.445] grepl <- base::grepl [18:41:51.445] restarts <- computeRestarts(cond) [18:41:51.445] for (restart in restarts) { [18:41:51.445] name <- restart$name [18:41:51.445] if (is.null(name)) [18:41:51.445] next [18:41:51.445] if (!grepl(pattern, name)) [18:41:51.445] next [18:41:51.445] invokeRestart(restart) [18:41:51.445] muffled <- TRUE [18:41:51.445] break [18:41:51.445] } [18:41:51.445] } [18:41:51.445] } [18:41:51.445] invisible(muffled) [18:41:51.445] } [18:41:51.445] muffleCondition(cond, pattern = "^muffle") [18:41:51.445] } [18:41:51.445] } [18:41:51.445] } [18:41:51.445] })) [18:41:51.445] }, error = function(ex) { [18:41:51.445] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.445] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.445] ...future.rng), started = ...future.startTime, [18:41:51.445] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.445] version = "1.8"), class = "FutureResult") [18:41:51.445] }, finally = { [18:41:51.445] if (!identical(...future.workdir, getwd())) [18:41:51.445] setwd(...future.workdir) [18:41:51.445] { [18:41:51.445] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.445] ...future.oldOptions$nwarnings <- NULL [18:41:51.445] } [18:41:51.445] base::options(...future.oldOptions) [18:41:51.445] if (.Platform$OS.type == "windows") { [18:41:51.445] old_names <- names(...future.oldEnvVars) [18:41:51.445] envs <- base::Sys.getenv() [18:41:51.445] names <- names(envs) [18:41:51.445] common <- intersect(names, old_names) [18:41:51.445] added <- setdiff(names, old_names) [18:41:51.445] removed <- setdiff(old_names, names) [18:41:51.445] changed <- common[...future.oldEnvVars[common] != [18:41:51.445] envs[common]] [18:41:51.445] NAMES <- toupper(changed) [18:41:51.445] args <- list() [18:41:51.445] for (kk in seq_along(NAMES)) { [18:41:51.445] name <- changed[[kk]] [18:41:51.445] NAME <- NAMES[[kk]] [18:41:51.445] if (name != NAME && is.element(NAME, old_names)) [18:41:51.445] next [18:41:51.445] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.445] } [18:41:51.445] NAMES <- toupper(added) [18:41:51.445] for (kk in seq_along(NAMES)) { [18:41:51.445] name <- added[[kk]] [18:41:51.445] NAME <- NAMES[[kk]] [18:41:51.445] if (name != NAME && is.element(NAME, old_names)) [18:41:51.445] next [18:41:51.445] args[[name]] <- "" [18:41:51.445] } [18:41:51.445] NAMES <- toupper(removed) [18:41:51.445] for (kk in seq_along(NAMES)) { [18:41:51.445] name <- removed[[kk]] [18:41:51.445] NAME <- NAMES[[kk]] [18:41:51.445] if (name != NAME && is.element(NAME, old_names)) [18:41:51.445] next [18:41:51.445] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.445] } [18:41:51.445] if (length(args) > 0) [18:41:51.445] base::do.call(base::Sys.setenv, args = args) [18:41:51.445] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.445] } [18:41:51.445] { [18:41:51.445] if (base::length(...future.futureOptionsAdded) > [18:41:51.445] 0L) { [18:41:51.445] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.445] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.445] base::options(opts) [18:41:51.445] } [18:41:51.445] { [18:41:51.445] { [18:41:51.445] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.445] NULL [18:41:51.445] } [18:41:51.445] options(future.plan = NULL) [18:41:51.445] if (is.na(NA_character_)) [18:41:51.445] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.445] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.445] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.445] .init = FALSE) [18:41:51.445] } [18:41:51.445] } [18:41:51.445] } [18:41:51.445] }) [18:41:51.445] if (TRUE) { [18:41:51.445] base::sink(type = "output", split = FALSE) [18:41:51.445] if (TRUE) { [18:41:51.445] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.445] } [18:41:51.445] else { [18:41:51.445] ...future.result["stdout"] <- base::list(NULL) [18:41:51.445] } [18:41:51.445] base::close(...future.stdout) [18:41:51.445] ...future.stdout <- NULL [18:41:51.445] } [18:41:51.445] ...future.result$conditions <- ...future.conditions [18:41:51.445] ...future.result$finished <- base::Sys.time() [18:41:51.445] ...future.result [18:41:51.445] } [18:41:51.450] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:51.450] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:51.451] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:51.451] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.451] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.452] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.452] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.452] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.453] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.453] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.453] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.453] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:51.454] MultisessionFuture started [18:41:51.454] - Launch lazy future ... done [18:41:51.454] run() for 'MultisessionFuture' ... done [18:41:51.455] Created future: [18:41:51.468] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.469] - Validating connection of MultisessionFuture [18:41:51.469] - received message: FutureResult [18:41:51.469] - Received FutureResult [18:41:51.469] - Erased future from FutureRegistry [18:41:51.470] result() for ClusterFuture ... [18:41:51.470] - result already collected: FutureResult [18:41:51.470] result() for ClusterFuture ... done [18:41:51.470] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.455] MultisessionFuture: [18:41:51.455] Label: 'future_sapply-2' [18:41:51.455] Expression: [18:41:51.455] { [18:41:51.455] do.call(function(...) { [18:41:51.455] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.455] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.455] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.455] on.exit(options(oopts), add = TRUE) [18:41:51.455] } [18:41:51.455] { [18:41:51.455] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.455] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.455] ...future.FUN(...future.X_jj, ...) [18:41:51.455] }) [18:41:51.455] } [18:41:51.455] }, args = future.call.arguments) [18:41:51.455] } [18:41:51.455] Lazy evaluation: FALSE [18:41:51.455] Asynchronous evaluation: TRUE [18:41:51.455] Local evaluation: TRUE [18:41:51.455] Environment: R_GlobalEnv [18:41:51.455] Capture standard output: TRUE [18:41:51.455] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.455] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.455] Packages: [18:41:51.455] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.455] Resolved: TRUE [18:41:51.455] Value: [18:41:51.455] Conditions captured: [18:41:51.455] Early signaling: FALSE [18:41:51.455] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.455] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.470] Chunk #2 of 2 ... DONE [18:41:51.471] Launching 2 futures (chunks) ... DONE [18:41:51.471] Resolving 2 futures (chunks) ... [18:41:51.471] resolve() on list ... [18:41:51.474] recursive: 0 [18:41:51.474] length: 2 [18:41:51.475] [18:41:51.475] Future #1 [18:41:51.475] result() for ClusterFuture ... [18:41:51.475] - result already collected: FutureResult [18:41:51.475] result() for ClusterFuture ... done [18:41:51.476] result() for ClusterFuture ... [18:41:51.476] - result already collected: FutureResult [18:41:51.476] result() for ClusterFuture ... done [18:41:51.476] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:51.476] - nx: 2 [18:41:51.476] - relay: TRUE [18:41:51.476] - stdout: TRUE [18:41:51.477] - signal: TRUE [18:41:51.477] - resignal: FALSE [18:41:51.477] - force: TRUE [18:41:51.477] - relayed: [n=2] FALSE, FALSE [18:41:51.477] - queued futures: [n=2] FALSE, FALSE [18:41:51.477] - until=1 [18:41:51.478] - relaying element #1 [18:41:51.478] result() for ClusterFuture ... [18:41:51.478] - result already collected: FutureResult [18:41:51.478] result() for ClusterFuture ... done [18:41:51.478] result() for ClusterFuture ... [18:41:51.478] - result already collected: FutureResult [18:41:51.479] result() for ClusterFuture ... done [18:41:51.479] result() for ClusterFuture ... [18:41:51.479] - result already collected: FutureResult [18:41:51.479] result() for ClusterFuture ... done [18:41:51.479] result() for ClusterFuture ... [18:41:51.479] - result already collected: FutureResult [18:41:51.479] result() for ClusterFuture ... done [18:41:51.480] - relayed: [n=2] TRUE, FALSE [18:41:51.480] - queued futures: [n=2] TRUE, FALSE [18:41:51.480] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.480] length: 1 (resolved future 1) [18:41:51.480] Future #2 [18:41:51.481] result() for ClusterFuture ... [18:41:51.481] - result already collected: FutureResult [18:41:51.481] result() for ClusterFuture ... done [18:41:51.481] result() for ClusterFuture ... [18:41:51.481] - result already collected: FutureResult [18:41:51.481] result() for ClusterFuture ... done [18:41:51.481] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.482] - nx: 2 [18:41:51.482] - relay: TRUE [18:41:51.482] - stdout: TRUE [18:41:51.482] - signal: TRUE [18:41:51.482] - resignal: FALSE [18:41:51.482] - force: TRUE [18:41:51.483] - relayed: [n=2] TRUE, FALSE [18:41:51.483] - queued futures: [n=2] TRUE, FALSE [18:41:51.483] - until=2 [18:41:51.483] - relaying element #2 [18:41:51.483] result() for ClusterFuture ... [18:41:51.483] - result already collected: FutureResult [18:41:51.483] result() for ClusterFuture ... done [18:41:51.484] result() for ClusterFuture ... [18:41:51.484] - result already collected: FutureResult [18:41:51.484] result() for ClusterFuture ... done [18:41:51.484] result() for ClusterFuture ... [18:41:51.484] - result already collected: FutureResult [18:41:51.484] result() for ClusterFuture ... done [18:41:51.485] result() for ClusterFuture ... [18:41:51.485] - result already collected: FutureResult [18:41:51.485] result() for ClusterFuture ... done [18:41:51.485] - relayed: [n=2] TRUE, TRUE [18:41:51.485] - queued futures: [n=2] TRUE, TRUE [18:41:51.485] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.486] length: 0 (resolved future 2) [18:41:51.486] Relaying remaining futures [18:41:51.486] signalConditionsASAP(NULL, pos=0) ... [18:41:51.486] - nx: 2 [18:41:51.486] - relay: TRUE [18:41:51.486] - stdout: TRUE [18:41:51.486] - signal: TRUE [18:41:51.487] - resignal: FALSE [18:41:51.487] - force: TRUE [18:41:51.487] - relayed: [n=2] TRUE, TRUE [18:41:51.487] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.487] - relayed: [n=2] TRUE, TRUE [18:41:51.487] - queued futures: [n=2] TRUE, TRUE [18:41:51.488] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.488] resolve() on list ... DONE [18:41:51.488] result() for ClusterFuture ... [18:41:51.488] - result already collected: FutureResult [18:41:51.488] result() for ClusterFuture ... done [18:41:51.488] result() for ClusterFuture ... [18:41:51.489] - result already collected: FutureResult [18:41:51.489] result() for ClusterFuture ... done [18:41:51.489] result() for ClusterFuture ... [18:41:51.489] - result already collected: FutureResult [18:41:51.489] result() for ClusterFuture ... done [18:41:51.489] result() for ClusterFuture ... [18:41:51.490] - result already collected: FutureResult [18:41:51.490] result() for ClusterFuture ... done [18:41:51.490] - Number of value chunks collected: 2 [18:41:51.490] Resolving 2 futures (chunks) ... DONE [18:41:51.490] Reducing values from 2 chunks ... [18:41:51.490] - Number of values collected after concatenation: 6 [18:41:51.491] - Number of values expected: 6 [18:41:51.491] Reducing values from 2 chunks ... DONE [18:41:51.491] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y1:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 List of 2 $ y0:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 $ y2:List of 6 ..$ a1: int 1 ..$ a2: int 2 ..$ b1: int 2 ..$ b2: int 3 ..$ c1: int 3 ..$ c2: int 4 [18:41:51.502] future_lapply() ... [18:41:51.505] Number of chunks: 2 [18:41:51.505] getGlobalsAndPackagesXApply() ... [18:41:51.505] - future.globals: TRUE [18:41:51.505] getGlobalsAndPackages() ... [18:41:51.506] Searching for globals... [18:41:51.507] - globals found: [2] 'FUN', 'UseMethod' [18:41:51.507] Searching for globals ... DONE [18:41:51.507] Resolving globals: FALSE [18:41:51.508] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:51.508] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:51.508] - globals: [1] 'FUN' [18:41:51.509] [18:41:51.509] getGlobalsAndPackages() ... DONE [18:41:51.509] - globals found/used: [n=1] 'FUN' [18:41:51.509] - needed namespaces: [n=0] [18:41:51.509] Finding globals ... DONE [18:41:51.509] - use_args: TRUE [18:41:51.510] - Getting '...' globals ... [18:41:51.510] resolve() on list ... [18:41:51.510] recursive: 0 [18:41:51.510] length: 1 [18:41:51.511] elements: '...' [18:41:51.511] length: 0 (resolved future 1) [18:41:51.511] resolve() on list ... DONE [18:41:51.511] - '...' content: [n=0] [18:41:51.511] List of 1 [18:41:51.511] $ ...: list() [18:41:51.511] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.511] - attr(*, "where")=List of 1 [18:41:51.511] ..$ ...: [18:41:51.511] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.511] - attr(*, "resolved")= logi TRUE [18:41:51.511] - attr(*, "total_size")= num NA [18:41:51.514] - Getting '...' globals ... DONE [18:41:51.514] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:51.515] List of 2 [18:41:51.515] $ ...future.FUN:function (x, ...) [18:41:51.515] $ ... : list() [18:41:51.515] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.515] - attr(*, "where")=List of 2 [18:41:51.515] ..$ ...future.FUN: [18:41:51.515] ..$ ... : [18:41:51.515] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.515] - attr(*, "resolved")= logi FALSE [18:41:51.515] - attr(*, "total_size")= int 5182 [18:41:51.518] Packages to be attached in all futures: [n=0] [18:41:51.518] getGlobalsAndPackagesXApply() ... DONE [18:41:51.518] Number of futures (= number of chunks): 2 [18:41:51.519] Launching 2 futures (chunks) ... [18:41:51.519] Chunk #1 of 2 ... [18:41:51.519] - Finding globals in 'X' for chunk #1 ... [18:41:51.519] getGlobalsAndPackages() ... [18:41:51.519] Searching for globals... [18:41:51.520] [18:41:51.520] Searching for globals ... DONE [18:41:51.520] - globals: [0] [18:41:51.520] getGlobalsAndPackages() ... DONE [18:41:51.521] + additional globals found: [n=0] [18:41:51.521] + additional namespaces needed: [n=0] [18:41:51.521] - Finding globals in 'X' for chunk #1 ... DONE [18:41:51.522] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.522] - seeds: [18:41:51.522] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.523] getGlobalsAndPackages() ... [18:41:51.523] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.523] Resolving globals: FALSE [18:41:51.523] Tweak future expression to call with '...' arguments ... [18:41:51.524] { [18:41:51.524] do.call(function(...) { [18:41:51.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.524] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.524] on.exit(options(oopts), add = TRUE) [18:41:51.524] } [18:41:51.524] { [18:41:51.524] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.524] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.524] ...future.FUN(...future.X_jj, ...) [18:41:51.524] }) [18:41:51.524] } [18:41:51.524] }, args = future.call.arguments) [18:41:51.524] } [18:41:51.524] Tweak future expression to call with '...' arguments ... DONE [18:41:51.525] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.525] [18:41:51.525] getGlobalsAndPackages() ... DONE [18:41:51.525] run() for 'Future' ... [18:41:51.526] - state: 'created' [18:41:51.526] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.541] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.542] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.542] - Field: 'node' [18:41:51.542] - Field: 'label' [18:41:51.542] - Field: 'local' [18:41:51.542] - Field: 'owner' [18:41:51.542] - Field: 'envir' [18:41:51.543] - Field: 'workers' [18:41:51.543] - Field: 'packages' [18:41:51.543] - Field: 'gc' [18:41:51.543] - Field: 'conditions' [18:41:51.543] - Field: 'persistent' [18:41:51.543] - Field: 'expr' [18:41:51.544] - Field: 'uuid' [18:41:51.544] - Field: 'seed' [18:41:51.544] - Field: 'version' [18:41:51.544] - Field: 'result' [18:41:51.544] - Field: 'asynchronous' [18:41:51.544] - Field: 'calls' [18:41:51.545] - Field: 'globals' [18:41:51.545] - Field: 'stdout' [18:41:51.545] - Field: 'earlySignal' [18:41:51.545] - Field: 'lazy' [18:41:51.545] - Field: 'state' [18:41:51.545] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.546] - Launch lazy future ... [18:41:51.546] Packages needed by the future expression (n = 0): [18:41:51.546] Packages needed by future strategies (n = 0): [18:41:51.547] { [18:41:51.547] { [18:41:51.547] { [18:41:51.547] ...future.startTime <- base::Sys.time() [18:41:51.547] { [18:41:51.547] { [18:41:51.547] { [18:41:51.547] { [18:41:51.547] base::local({ [18:41:51.547] has_future <- base::requireNamespace("future", [18:41:51.547] quietly = TRUE) [18:41:51.547] if (has_future) { [18:41:51.547] ns <- base::getNamespace("future") [18:41:51.547] version <- ns[[".package"]][["version"]] [18:41:51.547] if (is.null(version)) [18:41:51.547] version <- utils::packageVersion("future") [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] version <- NULL [18:41:51.547] } [18:41:51.547] if (!has_future || version < "1.8.0") { [18:41:51.547] info <- base::c(r_version = base::gsub("R version ", [18:41:51.547] "", base::R.version$version.string), [18:41:51.547] platform = base::sprintf("%s (%s-bit)", [18:41:51.547] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.547] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.547] "release", "version")], collapse = " "), [18:41:51.547] hostname = base::Sys.info()[["nodename"]]) [18:41:51.547] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.547] info) [18:41:51.547] info <- base::paste(info, collapse = "; ") [18:41:51.547] if (!has_future) { [18:41:51.547] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.547] info) [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.547] info, version) [18:41:51.547] } [18:41:51.547] base::stop(msg) [18:41:51.547] } [18:41:51.547] }) [18:41:51.547] } [18:41:51.547] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.547] base::options(mc.cores = 1L) [18:41:51.547] } [18:41:51.547] ...future.strategy.old <- future::plan("list") [18:41:51.547] options(future.plan = NULL) [18:41:51.547] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.547] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.547] } [18:41:51.547] ...future.workdir <- getwd() [18:41:51.547] } [18:41:51.547] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.547] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.547] } [18:41:51.547] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.547] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.547] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.547] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.547] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.547] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.547] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.547] base::names(...future.oldOptions)) [18:41:51.547] } [18:41:51.547] if (FALSE) { [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] if (TRUE) { [18:41:51.547] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.547] open = "w") [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.547] windows = "NUL", "/dev/null"), open = "w") [18:41:51.547] } [18:41:51.547] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.547] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.547] base::sink(type = "output", split = FALSE) [18:41:51.547] base::close(...future.stdout) [18:41:51.547] }, add = TRUE) [18:41:51.547] } [18:41:51.547] ...future.frame <- base::sys.nframe() [18:41:51.547] ...future.conditions <- base::list() [18:41:51.547] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.547] if (FALSE) { [18:41:51.547] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.547] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.547] } [18:41:51.547] ...future.result <- base::tryCatch({ [18:41:51.547] base::withCallingHandlers({ [18:41:51.547] ...future.value <- base::withVisible(base::local({ [18:41:51.547] ...future.makeSendCondition <- base::local({ [18:41:51.547] sendCondition <- NULL [18:41:51.547] function(frame = 1L) { [18:41:51.547] if (is.function(sendCondition)) [18:41:51.547] return(sendCondition) [18:41:51.547] ns <- getNamespace("parallel") [18:41:51.547] if (exists("sendData", mode = "function", [18:41:51.547] envir = ns)) { [18:41:51.547] parallel_sendData <- get("sendData", mode = "function", [18:41:51.547] envir = ns) [18:41:51.547] envir <- sys.frame(frame) [18:41:51.547] master <- NULL [18:41:51.547] while (!identical(envir, .GlobalEnv) && [18:41:51.547] !identical(envir, emptyenv())) { [18:41:51.547] if (exists("master", mode = "list", envir = envir, [18:41:51.547] inherits = FALSE)) { [18:41:51.547] master <- get("master", mode = "list", [18:41:51.547] envir = envir, inherits = FALSE) [18:41:51.547] if (inherits(master, c("SOCKnode", [18:41:51.547] "SOCK0node"))) { [18:41:51.547] sendCondition <<- function(cond) { [18:41:51.547] data <- list(type = "VALUE", value = cond, [18:41:51.547] success = TRUE) [18:41:51.547] parallel_sendData(master, data) [18:41:51.547] } [18:41:51.547] return(sendCondition) [18:41:51.547] } [18:41:51.547] } [18:41:51.547] frame <- frame + 1L [18:41:51.547] envir <- sys.frame(frame) [18:41:51.547] } [18:41:51.547] } [18:41:51.547] sendCondition <<- function(cond) NULL [18:41:51.547] } [18:41:51.547] }) [18:41:51.547] withCallingHandlers({ [18:41:51.547] { [18:41:51.547] do.call(function(...) { [18:41:51.547] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.547] if (!identical(...future.globals.maxSize.org, [18:41:51.547] ...future.globals.maxSize)) { [18:41:51.547] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.547] on.exit(options(oopts), add = TRUE) [18:41:51.547] } [18:41:51.547] { [18:41:51.547] lapply(seq_along(...future.elements_ii), [18:41:51.547] FUN = function(jj) { [18:41:51.547] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.547] ...future.FUN(...future.X_jj, ...) [18:41:51.547] }) [18:41:51.547] } [18:41:51.547] }, args = future.call.arguments) [18:41:51.547] } [18:41:51.547] }, immediateCondition = function(cond) { [18:41:51.547] sendCondition <- ...future.makeSendCondition() [18:41:51.547] sendCondition(cond) [18:41:51.547] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.547] { [18:41:51.547] inherits <- base::inherits [18:41:51.547] invokeRestart <- base::invokeRestart [18:41:51.547] is.null <- base::is.null [18:41:51.547] muffled <- FALSE [18:41:51.547] if (inherits(cond, "message")) { [18:41:51.547] muffled <- grepl(pattern, "muffleMessage") [18:41:51.547] if (muffled) [18:41:51.547] invokeRestart("muffleMessage") [18:41:51.547] } [18:41:51.547] else if (inherits(cond, "warning")) { [18:41:51.547] muffled <- grepl(pattern, "muffleWarning") [18:41:51.547] if (muffled) [18:41:51.547] invokeRestart("muffleWarning") [18:41:51.547] } [18:41:51.547] else if (inherits(cond, "condition")) { [18:41:51.547] if (!is.null(pattern)) { [18:41:51.547] computeRestarts <- base::computeRestarts [18:41:51.547] grepl <- base::grepl [18:41:51.547] restarts <- computeRestarts(cond) [18:41:51.547] for (restart in restarts) { [18:41:51.547] name <- restart$name [18:41:51.547] if (is.null(name)) [18:41:51.547] next [18:41:51.547] if (!grepl(pattern, name)) [18:41:51.547] next [18:41:51.547] invokeRestart(restart) [18:41:51.547] muffled <- TRUE [18:41:51.547] break [18:41:51.547] } [18:41:51.547] } [18:41:51.547] } [18:41:51.547] invisible(muffled) [18:41:51.547] } [18:41:51.547] muffleCondition(cond) [18:41:51.547] }) [18:41:51.547] })) [18:41:51.547] future::FutureResult(value = ...future.value$value, [18:41:51.547] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.547] ...future.rng), globalenv = if (FALSE) [18:41:51.547] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.547] ...future.globalenv.names)) [18:41:51.547] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.547] }, condition = base::local({ [18:41:51.547] c <- base::c [18:41:51.547] inherits <- base::inherits [18:41:51.547] invokeRestart <- base::invokeRestart [18:41:51.547] length <- base::length [18:41:51.547] list <- base::list [18:41:51.547] seq.int <- base::seq.int [18:41:51.547] signalCondition <- base::signalCondition [18:41:51.547] sys.calls <- base::sys.calls [18:41:51.547] `[[` <- base::`[[` [18:41:51.547] `+` <- base::`+` [18:41:51.547] `<<-` <- base::`<<-` [18:41:51.547] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.547] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.547] 3L)] [18:41:51.547] } [18:41:51.547] function(cond) { [18:41:51.547] is_error <- inherits(cond, "error") [18:41:51.547] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.547] NULL) [18:41:51.547] if (is_error) { [18:41:51.547] sessionInformation <- function() { [18:41:51.547] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.547] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.547] search = base::search(), system = base::Sys.info()) [18:41:51.547] } [18:41:51.547] ...future.conditions[[length(...future.conditions) + [18:41:51.547] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.547] cond$call), session = sessionInformation(), [18:41:51.547] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.547] signalCondition(cond) [18:41:51.547] } [18:41:51.547] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.547] "immediateCondition"))) { [18:41:51.547] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.547] ...future.conditions[[length(...future.conditions) + [18:41:51.547] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.547] if (TRUE && !signal) { [18:41:51.547] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.547] { [18:41:51.547] inherits <- base::inherits [18:41:51.547] invokeRestart <- base::invokeRestart [18:41:51.547] is.null <- base::is.null [18:41:51.547] muffled <- FALSE [18:41:51.547] if (inherits(cond, "message")) { [18:41:51.547] muffled <- grepl(pattern, "muffleMessage") [18:41:51.547] if (muffled) [18:41:51.547] invokeRestart("muffleMessage") [18:41:51.547] } [18:41:51.547] else if (inherits(cond, "warning")) { [18:41:51.547] muffled <- grepl(pattern, "muffleWarning") [18:41:51.547] if (muffled) [18:41:51.547] invokeRestart("muffleWarning") [18:41:51.547] } [18:41:51.547] else if (inherits(cond, "condition")) { [18:41:51.547] if (!is.null(pattern)) { [18:41:51.547] computeRestarts <- base::computeRestarts [18:41:51.547] grepl <- base::grepl [18:41:51.547] restarts <- computeRestarts(cond) [18:41:51.547] for (restart in restarts) { [18:41:51.547] name <- restart$name [18:41:51.547] if (is.null(name)) [18:41:51.547] next [18:41:51.547] if (!grepl(pattern, name)) [18:41:51.547] next [18:41:51.547] invokeRestart(restart) [18:41:51.547] muffled <- TRUE [18:41:51.547] break [18:41:51.547] } [18:41:51.547] } [18:41:51.547] } [18:41:51.547] invisible(muffled) [18:41:51.547] } [18:41:51.547] muffleCondition(cond, pattern = "^muffle") [18:41:51.547] } [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] if (TRUE) { [18:41:51.547] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.547] { [18:41:51.547] inherits <- base::inherits [18:41:51.547] invokeRestart <- base::invokeRestart [18:41:51.547] is.null <- base::is.null [18:41:51.547] muffled <- FALSE [18:41:51.547] if (inherits(cond, "message")) { [18:41:51.547] muffled <- grepl(pattern, "muffleMessage") [18:41:51.547] if (muffled) [18:41:51.547] invokeRestart("muffleMessage") [18:41:51.547] } [18:41:51.547] else if (inherits(cond, "warning")) { [18:41:51.547] muffled <- grepl(pattern, "muffleWarning") [18:41:51.547] if (muffled) [18:41:51.547] invokeRestart("muffleWarning") [18:41:51.547] } [18:41:51.547] else if (inherits(cond, "condition")) { [18:41:51.547] if (!is.null(pattern)) { [18:41:51.547] computeRestarts <- base::computeRestarts [18:41:51.547] grepl <- base::grepl [18:41:51.547] restarts <- computeRestarts(cond) [18:41:51.547] for (restart in restarts) { [18:41:51.547] name <- restart$name [18:41:51.547] if (is.null(name)) [18:41:51.547] next [18:41:51.547] if (!grepl(pattern, name)) [18:41:51.547] next [18:41:51.547] invokeRestart(restart) [18:41:51.547] muffled <- TRUE [18:41:51.547] break [18:41:51.547] } [18:41:51.547] } [18:41:51.547] } [18:41:51.547] invisible(muffled) [18:41:51.547] } [18:41:51.547] muffleCondition(cond, pattern = "^muffle") [18:41:51.547] } [18:41:51.547] } [18:41:51.547] } [18:41:51.547] })) [18:41:51.547] }, error = function(ex) { [18:41:51.547] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.547] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.547] ...future.rng), started = ...future.startTime, [18:41:51.547] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.547] version = "1.8"), class = "FutureResult") [18:41:51.547] }, finally = { [18:41:51.547] if (!identical(...future.workdir, getwd())) [18:41:51.547] setwd(...future.workdir) [18:41:51.547] { [18:41:51.547] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.547] ...future.oldOptions$nwarnings <- NULL [18:41:51.547] } [18:41:51.547] base::options(...future.oldOptions) [18:41:51.547] if (.Platform$OS.type == "windows") { [18:41:51.547] old_names <- names(...future.oldEnvVars) [18:41:51.547] envs <- base::Sys.getenv() [18:41:51.547] names <- names(envs) [18:41:51.547] common <- intersect(names, old_names) [18:41:51.547] added <- setdiff(names, old_names) [18:41:51.547] removed <- setdiff(old_names, names) [18:41:51.547] changed <- common[...future.oldEnvVars[common] != [18:41:51.547] envs[common]] [18:41:51.547] NAMES <- toupper(changed) [18:41:51.547] args <- list() [18:41:51.547] for (kk in seq_along(NAMES)) { [18:41:51.547] name <- changed[[kk]] [18:41:51.547] NAME <- NAMES[[kk]] [18:41:51.547] if (name != NAME && is.element(NAME, old_names)) [18:41:51.547] next [18:41:51.547] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.547] } [18:41:51.547] NAMES <- toupper(added) [18:41:51.547] for (kk in seq_along(NAMES)) { [18:41:51.547] name <- added[[kk]] [18:41:51.547] NAME <- NAMES[[kk]] [18:41:51.547] if (name != NAME && is.element(NAME, old_names)) [18:41:51.547] next [18:41:51.547] args[[name]] <- "" [18:41:51.547] } [18:41:51.547] NAMES <- toupper(removed) [18:41:51.547] for (kk in seq_along(NAMES)) { [18:41:51.547] name <- removed[[kk]] [18:41:51.547] NAME <- NAMES[[kk]] [18:41:51.547] if (name != NAME && is.element(NAME, old_names)) [18:41:51.547] next [18:41:51.547] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.547] } [18:41:51.547] if (length(args) > 0) [18:41:51.547] base::do.call(base::Sys.setenv, args = args) [18:41:51.547] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.547] } [18:41:51.547] { [18:41:51.547] if (base::length(...future.futureOptionsAdded) > [18:41:51.547] 0L) { [18:41:51.547] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.547] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.547] base::options(opts) [18:41:51.547] } [18:41:51.547] { [18:41:51.547] { [18:41:51.547] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.547] NULL [18:41:51.547] } [18:41:51.547] options(future.plan = NULL) [18:41:51.547] if (is.na(NA_character_)) [18:41:51.547] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.547] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.547] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.547] .init = FALSE) [18:41:51.547] } [18:41:51.547] } [18:41:51.547] } [18:41:51.547] }) [18:41:51.547] if (TRUE) { [18:41:51.547] base::sink(type = "output", split = FALSE) [18:41:51.547] if (TRUE) { [18:41:51.547] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.547] } [18:41:51.547] else { [18:41:51.547] ...future.result["stdout"] <- base::list(NULL) [18:41:51.547] } [18:41:51.547] base::close(...future.stdout) [18:41:51.547] ...future.stdout <- NULL [18:41:51.547] } [18:41:51.547] ...future.result$conditions <- ...future.conditions [18:41:51.547] ...future.result$finished <- base::Sys.time() [18:41:51.547] ...future.result [18:41:51.547] } [18:41:51.552] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:51.552] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:51.552] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:51.553] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.553] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.553] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.554] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.554] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.554] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.554] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.555] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.555] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:51.556] MultisessionFuture started [18:41:51.556] - Launch lazy future ... done [18:41:51.556] run() for 'MultisessionFuture' ... done [18:41:51.556] Created future: [18:41:51.569] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.569] - Validating connection of MultisessionFuture [18:41:51.569] - received message: FutureResult [18:41:51.570] - Received FutureResult [18:41:51.570] - Erased future from FutureRegistry [18:41:51.570] result() for ClusterFuture ... [18:41:51.570] - result already collected: FutureResult [18:41:51.570] result() for ClusterFuture ... done [18:41:51.570] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.556] MultisessionFuture: [18:41:51.556] Label: 'future_sapply-1' [18:41:51.556] Expression: [18:41:51.556] { [18:41:51.556] do.call(function(...) { [18:41:51.556] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.556] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.556] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.556] on.exit(options(oopts), add = TRUE) [18:41:51.556] } [18:41:51.556] { [18:41:51.556] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.556] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.556] ...future.FUN(...future.X_jj, ...) [18:41:51.556] }) [18:41:51.556] } [18:41:51.556] }, args = future.call.arguments) [18:41:51.556] } [18:41:51.556] Lazy evaluation: FALSE [18:41:51.556] Asynchronous evaluation: TRUE [18:41:51.556] Local evaluation: TRUE [18:41:51.556] Environment: R_GlobalEnv [18:41:51.556] Capture standard output: TRUE [18:41:51.556] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.556] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.556] Packages: [18:41:51.556] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.556] Resolved: TRUE [18:41:51.556] Value: [18:41:51.556] Conditions captured: [18:41:51.556] Early signaling: FALSE [18:41:51.556] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.556] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.571] Chunk #1 of 2 ... DONE [18:41:51.571] Chunk #2 of 2 ... [18:41:51.571] - Finding globals in 'X' for chunk #2 ... [18:41:51.571] getGlobalsAndPackages() ... [18:41:51.572] Searching for globals... [18:41:51.572] [18:41:51.572] Searching for globals ... DONE [18:41:51.572] - globals: [0] [18:41:51.572] getGlobalsAndPackages() ... DONE [18:41:51.572] + additional globals found: [n=0] [18:41:51.573] + additional namespaces needed: [n=0] [18:41:51.573] - Finding globals in 'X' for chunk #2 ... DONE [18:41:51.573] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.573] - seeds: [18:41:51.573] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.573] getGlobalsAndPackages() ... [18:41:51.574] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.574] Resolving globals: FALSE [18:41:51.574] Tweak future expression to call with '...' arguments ... [18:41:51.574] { [18:41:51.574] do.call(function(...) { [18:41:51.574] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.574] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.574] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.574] on.exit(options(oopts), add = TRUE) [18:41:51.574] } [18:41:51.574] { [18:41:51.574] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.574] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.574] ...future.FUN(...future.X_jj, ...) [18:41:51.574] }) [18:41:51.574] } [18:41:51.574] }, args = future.call.arguments) [18:41:51.574] } [18:41:51.575] Tweak future expression to call with '...' arguments ... DONE [18:41:51.575] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.575] [18:41:51.575] getGlobalsAndPackages() ... DONE [18:41:51.576] run() for 'Future' ... [18:41:51.576] - state: 'created' [18:41:51.576] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.590] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.591] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.591] - Field: 'node' [18:41:51.591] - Field: 'label' [18:41:51.591] - Field: 'local' [18:41:51.591] - Field: 'owner' [18:41:51.592] - Field: 'envir' [18:41:51.592] - Field: 'workers' [18:41:51.592] - Field: 'packages' [18:41:51.592] - Field: 'gc' [18:41:51.592] - Field: 'conditions' [18:41:51.592] - Field: 'persistent' [18:41:51.593] - Field: 'expr' [18:41:51.593] - Field: 'uuid' [18:41:51.593] - Field: 'seed' [18:41:51.593] - Field: 'version' [18:41:51.593] - Field: 'result' [18:41:51.593] - Field: 'asynchronous' [18:41:51.594] - Field: 'calls' [18:41:51.594] - Field: 'globals' [18:41:51.594] - Field: 'stdout' [18:41:51.594] - Field: 'earlySignal' [18:41:51.594] - Field: 'lazy' [18:41:51.594] - Field: 'state' [18:41:51.595] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.595] - Launch lazy future ... [18:41:51.595] Packages needed by the future expression (n = 0): [18:41:51.595] Packages needed by future strategies (n = 0): [18:41:51.596] { [18:41:51.596] { [18:41:51.596] { [18:41:51.596] ...future.startTime <- base::Sys.time() [18:41:51.596] { [18:41:51.596] { [18:41:51.596] { [18:41:51.596] { [18:41:51.596] base::local({ [18:41:51.596] has_future <- base::requireNamespace("future", [18:41:51.596] quietly = TRUE) [18:41:51.596] if (has_future) { [18:41:51.596] ns <- base::getNamespace("future") [18:41:51.596] version <- ns[[".package"]][["version"]] [18:41:51.596] if (is.null(version)) [18:41:51.596] version <- utils::packageVersion("future") [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] version <- NULL [18:41:51.596] } [18:41:51.596] if (!has_future || version < "1.8.0") { [18:41:51.596] info <- base::c(r_version = base::gsub("R version ", [18:41:51.596] "", base::R.version$version.string), [18:41:51.596] platform = base::sprintf("%s (%s-bit)", [18:41:51.596] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.596] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.596] "release", "version")], collapse = " "), [18:41:51.596] hostname = base::Sys.info()[["nodename"]]) [18:41:51.596] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.596] info) [18:41:51.596] info <- base::paste(info, collapse = "; ") [18:41:51.596] if (!has_future) { [18:41:51.596] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.596] info) [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.596] info, version) [18:41:51.596] } [18:41:51.596] base::stop(msg) [18:41:51.596] } [18:41:51.596] }) [18:41:51.596] } [18:41:51.596] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.596] base::options(mc.cores = 1L) [18:41:51.596] } [18:41:51.596] ...future.strategy.old <- future::plan("list") [18:41:51.596] options(future.plan = NULL) [18:41:51.596] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.596] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.596] } [18:41:51.596] ...future.workdir <- getwd() [18:41:51.596] } [18:41:51.596] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.596] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.596] } [18:41:51.596] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.596] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.596] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.596] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.596] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.596] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.596] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.596] base::names(...future.oldOptions)) [18:41:51.596] } [18:41:51.596] if (FALSE) { [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] if (TRUE) { [18:41:51.596] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.596] open = "w") [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.596] windows = "NUL", "/dev/null"), open = "w") [18:41:51.596] } [18:41:51.596] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.596] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.596] base::sink(type = "output", split = FALSE) [18:41:51.596] base::close(...future.stdout) [18:41:51.596] }, add = TRUE) [18:41:51.596] } [18:41:51.596] ...future.frame <- base::sys.nframe() [18:41:51.596] ...future.conditions <- base::list() [18:41:51.596] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.596] if (FALSE) { [18:41:51.596] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.596] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.596] } [18:41:51.596] ...future.result <- base::tryCatch({ [18:41:51.596] base::withCallingHandlers({ [18:41:51.596] ...future.value <- base::withVisible(base::local({ [18:41:51.596] ...future.makeSendCondition <- base::local({ [18:41:51.596] sendCondition <- NULL [18:41:51.596] function(frame = 1L) { [18:41:51.596] if (is.function(sendCondition)) [18:41:51.596] return(sendCondition) [18:41:51.596] ns <- getNamespace("parallel") [18:41:51.596] if (exists("sendData", mode = "function", [18:41:51.596] envir = ns)) { [18:41:51.596] parallel_sendData <- get("sendData", mode = "function", [18:41:51.596] envir = ns) [18:41:51.596] envir <- sys.frame(frame) [18:41:51.596] master <- NULL [18:41:51.596] while (!identical(envir, .GlobalEnv) && [18:41:51.596] !identical(envir, emptyenv())) { [18:41:51.596] if (exists("master", mode = "list", envir = envir, [18:41:51.596] inherits = FALSE)) { [18:41:51.596] master <- get("master", mode = "list", [18:41:51.596] envir = envir, inherits = FALSE) [18:41:51.596] if (inherits(master, c("SOCKnode", [18:41:51.596] "SOCK0node"))) { [18:41:51.596] sendCondition <<- function(cond) { [18:41:51.596] data <- list(type = "VALUE", value = cond, [18:41:51.596] success = TRUE) [18:41:51.596] parallel_sendData(master, data) [18:41:51.596] } [18:41:51.596] return(sendCondition) [18:41:51.596] } [18:41:51.596] } [18:41:51.596] frame <- frame + 1L [18:41:51.596] envir <- sys.frame(frame) [18:41:51.596] } [18:41:51.596] } [18:41:51.596] sendCondition <<- function(cond) NULL [18:41:51.596] } [18:41:51.596] }) [18:41:51.596] withCallingHandlers({ [18:41:51.596] { [18:41:51.596] do.call(function(...) { [18:41:51.596] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.596] if (!identical(...future.globals.maxSize.org, [18:41:51.596] ...future.globals.maxSize)) { [18:41:51.596] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.596] on.exit(options(oopts), add = TRUE) [18:41:51.596] } [18:41:51.596] { [18:41:51.596] lapply(seq_along(...future.elements_ii), [18:41:51.596] FUN = function(jj) { [18:41:51.596] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.596] ...future.FUN(...future.X_jj, ...) [18:41:51.596] }) [18:41:51.596] } [18:41:51.596] }, args = future.call.arguments) [18:41:51.596] } [18:41:51.596] }, immediateCondition = function(cond) { [18:41:51.596] sendCondition <- ...future.makeSendCondition() [18:41:51.596] sendCondition(cond) [18:41:51.596] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.596] { [18:41:51.596] inherits <- base::inherits [18:41:51.596] invokeRestart <- base::invokeRestart [18:41:51.596] is.null <- base::is.null [18:41:51.596] muffled <- FALSE [18:41:51.596] if (inherits(cond, "message")) { [18:41:51.596] muffled <- grepl(pattern, "muffleMessage") [18:41:51.596] if (muffled) [18:41:51.596] invokeRestart("muffleMessage") [18:41:51.596] } [18:41:51.596] else if (inherits(cond, "warning")) { [18:41:51.596] muffled <- grepl(pattern, "muffleWarning") [18:41:51.596] if (muffled) [18:41:51.596] invokeRestart("muffleWarning") [18:41:51.596] } [18:41:51.596] else if (inherits(cond, "condition")) { [18:41:51.596] if (!is.null(pattern)) { [18:41:51.596] computeRestarts <- base::computeRestarts [18:41:51.596] grepl <- base::grepl [18:41:51.596] restarts <- computeRestarts(cond) [18:41:51.596] for (restart in restarts) { [18:41:51.596] name <- restart$name [18:41:51.596] if (is.null(name)) [18:41:51.596] next [18:41:51.596] if (!grepl(pattern, name)) [18:41:51.596] next [18:41:51.596] invokeRestart(restart) [18:41:51.596] muffled <- TRUE [18:41:51.596] break [18:41:51.596] } [18:41:51.596] } [18:41:51.596] } [18:41:51.596] invisible(muffled) [18:41:51.596] } [18:41:51.596] muffleCondition(cond) [18:41:51.596] }) [18:41:51.596] })) [18:41:51.596] future::FutureResult(value = ...future.value$value, [18:41:51.596] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.596] ...future.rng), globalenv = if (FALSE) [18:41:51.596] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.596] ...future.globalenv.names)) [18:41:51.596] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.596] }, condition = base::local({ [18:41:51.596] c <- base::c [18:41:51.596] inherits <- base::inherits [18:41:51.596] invokeRestart <- base::invokeRestart [18:41:51.596] length <- base::length [18:41:51.596] list <- base::list [18:41:51.596] seq.int <- base::seq.int [18:41:51.596] signalCondition <- base::signalCondition [18:41:51.596] sys.calls <- base::sys.calls [18:41:51.596] `[[` <- base::`[[` [18:41:51.596] `+` <- base::`+` [18:41:51.596] `<<-` <- base::`<<-` [18:41:51.596] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.596] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.596] 3L)] [18:41:51.596] } [18:41:51.596] function(cond) { [18:41:51.596] is_error <- inherits(cond, "error") [18:41:51.596] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.596] NULL) [18:41:51.596] if (is_error) { [18:41:51.596] sessionInformation <- function() { [18:41:51.596] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.596] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.596] search = base::search(), system = base::Sys.info()) [18:41:51.596] } [18:41:51.596] ...future.conditions[[length(...future.conditions) + [18:41:51.596] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.596] cond$call), session = sessionInformation(), [18:41:51.596] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.596] signalCondition(cond) [18:41:51.596] } [18:41:51.596] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.596] "immediateCondition"))) { [18:41:51.596] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.596] ...future.conditions[[length(...future.conditions) + [18:41:51.596] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.596] if (TRUE && !signal) { [18:41:51.596] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.596] { [18:41:51.596] inherits <- base::inherits [18:41:51.596] invokeRestart <- base::invokeRestart [18:41:51.596] is.null <- base::is.null [18:41:51.596] muffled <- FALSE [18:41:51.596] if (inherits(cond, "message")) { [18:41:51.596] muffled <- grepl(pattern, "muffleMessage") [18:41:51.596] if (muffled) [18:41:51.596] invokeRestart("muffleMessage") [18:41:51.596] } [18:41:51.596] else if (inherits(cond, "warning")) { [18:41:51.596] muffled <- grepl(pattern, "muffleWarning") [18:41:51.596] if (muffled) [18:41:51.596] invokeRestart("muffleWarning") [18:41:51.596] } [18:41:51.596] else if (inherits(cond, "condition")) { [18:41:51.596] if (!is.null(pattern)) { [18:41:51.596] computeRestarts <- base::computeRestarts [18:41:51.596] grepl <- base::grepl [18:41:51.596] restarts <- computeRestarts(cond) [18:41:51.596] for (restart in restarts) { [18:41:51.596] name <- restart$name [18:41:51.596] if (is.null(name)) [18:41:51.596] next [18:41:51.596] if (!grepl(pattern, name)) [18:41:51.596] next [18:41:51.596] invokeRestart(restart) [18:41:51.596] muffled <- TRUE [18:41:51.596] break [18:41:51.596] } [18:41:51.596] } [18:41:51.596] } [18:41:51.596] invisible(muffled) [18:41:51.596] } [18:41:51.596] muffleCondition(cond, pattern = "^muffle") [18:41:51.596] } [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] if (TRUE) { [18:41:51.596] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.596] { [18:41:51.596] inherits <- base::inherits [18:41:51.596] invokeRestart <- base::invokeRestart [18:41:51.596] is.null <- base::is.null [18:41:51.596] muffled <- FALSE [18:41:51.596] if (inherits(cond, "message")) { [18:41:51.596] muffled <- grepl(pattern, "muffleMessage") [18:41:51.596] if (muffled) [18:41:51.596] invokeRestart("muffleMessage") [18:41:51.596] } [18:41:51.596] else if (inherits(cond, "warning")) { [18:41:51.596] muffled <- grepl(pattern, "muffleWarning") [18:41:51.596] if (muffled) [18:41:51.596] invokeRestart("muffleWarning") [18:41:51.596] } [18:41:51.596] else if (inherits(cond, "condition")) { [18:41:51.596] if (!is.null(pattern)) { [18:41:51.596] computeRestarts <- base::computeRestarts [18:41:51.596] grepl <- base::grepl [18:41:51.596] restarts <- computeRestarts(cond) [18:41:51.596] for (restart in restarts) { [18:41:51.596] name <- restart$name [18:41:51.596] if (is.null(name)) [18:41:51.596] next [18:41:51.596] if (!grepl(pattern, name)) [18:41:51.596] next [18:41:51.596] invokeRestart(restart) [18:41:51.596] muffled <- TRUE [18:41:51.596] break [18:41:51.596] } [18:41:51.596] } [18:41:51.596] } [18:41:51.596] invisible(muffled) [18:41:51.596] } [18:41:51.596] muffleCondition(cond, pattern = "^muffle") [18:41:51.596] } [18:41:51.596] } [18:41:51.596] } [18:41:51.596] })) [18:41:51.596] }, error = function(ex) { [18:41:51.596] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.596] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.596] ...future.rng), started = ...future.startTime, [18:41:51.596] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.596] version = "1.8"), class = "FutureResult") [18:41:51.596] }, finally = { [18:41:51.596] if (!identical(...future.workdir, getwd())) [18:41:51.596] setwd(...future.workdir) [18:41:51.596] { [18:41:51.596] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.596] ...future.oldOptions$nwarnings <- NULL [18:41:51.596] } [18:41:51.596] base::options(...future.oldOptions) [18:41:51.596] if (.Platform$OS.type == "windows") { [18:41:51.596] old_names <- names(...future.oldEnvVars) [18:41:51.596] envs <- base::Sys.getenv() [18:41:51.596] names <- names(envs) [18:41:51.596] common <- intersect(names, old_names) [18:41:51.596] added <- setdiff(names, old_names) [18:41:51.596] removed <- setdiff(old_names, names) [18:41:51.596] changed <- common[...future.oldEnvVars[common] != [18:41:51.596] envs[common]] [18:41:51.596] NAMES <- toupper(changed) [18:41:51.596] args <- list() [18:41:51.596] for (kk in seq_along(NAMES)) { [18:41:51.596] name <- changed[[kk]] [18:41:51.596] NAME <- NAMES[[kk]] [18:41:51.596] if (name != NAME && is.element(NAME, old_names)) [18:41:51.596] next [18:41:51.596] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.596] } [18:41:51.596] NAMES <- toupper(added) [18:41:51.596] for (kk in seq_along(NAMES)) { [18:41:51.596] name <- added[[kk]] [18:41:51.596] NAME <- NAMES[[kk]] [18:41:51.596] if (name != NAME && is.element(NAME, old_names)) [18:41:51.596] next [18:41:51.596] args[[name]] <- "" [18:41:51.596] } [18:41:51.596] NAMES <- toupper(removed) [18:41:51.596] for (kk in seq_along(NAMES)) { [18:41:51.596] name <- removed[[kk]] [18:41:51.596] NAME <- NAMES[[kk]] [18:41:51.596] if (name != NAME && is.element(NAME, old_names)) [18:41:51.596] next [18:41:51.596] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.596] } [18:41:51.596] if (length(args) > 0) [18:41:51.596] base::do.call(base::Sys.setenv, args = args) [18:41:51.596] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.596] } [18:41:51.596] { [18:41:51.596] if (base::length(...future.futureOptionsAdded) > [18:41:51.596] 0L) { [18:41:51.596] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.596] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.596] base::options(opts) [18:41:51.596] } [18:41:51.596] { [18:41:51.596] { [18:41:51.596] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.596] NULL [18:41:51.596] } [18:41:51.596] options(future.plan = NULL) [18:41:51.596] if (is.na(NA_character_)) [18:41:51.596] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.596] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.596] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.596] .init = FALSE) [18:41:51.596] } [18:41:51.596] } [18:41:51.596] } [18:41:51.596] }) [18:41:51.596] if (TRUE) { [18:41:51.596] base::sink(type = "output", split = FALSE) [18:41:51.596] if (TRUE) { [18:41:51.596] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.596] } [18:41:51.596] else { [18:41:51.596] ...future.result["stdout"] <- base::list(NULL) [18:41:51.596] } [18:41:51.596] base::close(...future.stdout) [18:41:51.596] ...future.stdout <- NULL [18:41:51.596] } [18:41:51.596] ...future.result$conditions <- ...future.conditions [18:41:51.596] ...future.result$finished <- base::Sys.time() [18:41:51.596] ...future.result [18:41:51.596] } [18:41:51.601] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:51.601] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:51.601] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:51.602] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.602] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.602] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.603] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.603] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.603] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.603] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.604] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.604] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:51.605] MultisessionFuture started [18:41:51.605] - Launch lazy future ... done [18:41:51.605] run() for 'MultisessionFuture' ... done [18:41:51.605] Created future: [18:41:51.619] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.619] - Validating connection of MultisessionFuture [18:41:51.619] - received message: FutureResult [18:41:51.620] - Received FutureResult [18:41:51.620] - Erased future from FutureRegistry [18:41:51.620] result() for ClusterFuture ... [18:41:51.620] - result already collected: FutureResult [18:41:51.620] result() for ClusterFuture ... done [18:41:51.620] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.605] MultisessionFuture: [18:41:51.605] Label: 'future_sapply-2' [18:41:51.605] Expression: [18:41:51.605] { [18:41:51.605] do.call(function(...) { [18:41:51.605] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.605] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.605] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.605] on.exit(options(oopts), add = TRUE) [18:41:51.605] } [18:41:51.605] { [18:41:51.605] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.605] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.605] ...future.FUN(...future.X_jj, ...) [18:41:51.605] }) [18:41:51.605] } [18:41:51.605] }, args = future.call.arguments) [18:41:51.605] } [18:41:51.605] Lazy evaluation: FALSE [18:41:51.605] Asynchronous evaluation: TRUE [18:41:51.605] Local evaluation: TRUE [18:41:51.605] Environment: R_GlobalEnv [18:41:51.605] Capture standard output: TRUE [18:41:51.605] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.605] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.605] Packages: [18:41:51.605] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.605] Resolved: TRUE [18:41:51.605] Value: [18:41:51.605] Conditions captured: [18:41:51.605] Early signaling: FALSE [18:41:51.605] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.605] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.621] Chunk #2 of 2 ... DONE [18:41:51.621] Launching 2 futures (chunks) ... DONE [18:41:51.621] Resolving 2 futures (chunks) ... [18:41:51.621] resolve() on list ... [18:41:51.622] recursive: 0 [18:41:51.622] length: 2 [18:41:51.622] [18:41:51.622] Future #1 [18:41:51.622] result() for ClusterFuture ... [18:41:51.622] - result already collected: FutureResult [18:41:51.622] result() for ClusterFuture ... done [18:41:51.623] result() for ClusterFuture ... [18:41:51.623] - result already collected: FutureResult [18:41:51.623] result() for ClusterFuture ... done [18:41:51.623] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:51.623] - nx: 2 [18:41:51.623] - relay: TRUE [18:41:51.624] - stdout: TRUE [18:41:51.624] - signal: TRUE [18:41:51.624] - resignal: FALSE [18:41:51.624] - force: TRUE [18:41:51.624] - relayed: [n=2] FALSE, FALSE [18:41:51.624] - queued futures: [n=2] FALSE, FALSE [18:41:51.624] - until=1 [18:41:51.625] - relaying element #1 [18:41:51.625] result() for ClusterFuture ... [18:41:51.625] - result already collected: FutureResult [18:41:51.625] result() for ClusterFuture ... done [18:41:51.625] result() for ClusterFuture ... [18:41:51.625] - result already collected: FutureResult [18:41:51.626] result() for ClusterFuture ... done [18:41:51.626] result() for ClusterFuture ... [18:41:51.626] - result already collected: FutureResult [18:41:51.626] result() for ClusterFuture ... done [18:41:51.626] result() for ClusterFuture ... [18:41:51.629] - result already collected: FutureResult [18:41:51.630] result() for ClusterFuture ... done [18:41:51.630] - relayed: [n=2] TRUE, FALSE [18:41:51.630] - queued futures: [n=2] TRUE, FALSE [18:41:51.630] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.630] length: 1 (resolved future 1) [18:41:51.630] Future #2 [18:41:51.631] result() for ClusterFuture ... [18:41:51.631] - result already collected: FutureResult [18:41:51.631] result() for ClusterFuture ... done [18:41:51.631] result() for ClusterFuture ... [18:41:51.631] - result already collected: FutureResult [18:41:51.631] result() for ClusterFuture ... done [18:41:51.632] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.632] - nx: 2 [18:41:51.632] - relay: TRUE [18:41:51.632] - stdout: TRUE [18:41:51.632] - signal: TRUE [18:41:51.632] - resignal: FALSE [18:41:51.632] - force: TRUE [18:41:51.633] - relayed: [n=2] TRUE, FALSE [18:41:51.633] - queued futures: [n=2] TRUE, FALSE [18:41:51.633] - until=2 [18:41:51.633] - relaying element #2 [18:41:51.633] result() for ClusterFuture ... [18:41:51.633] - result already collected: FutureResult [18:41:51.634] result() for ClusterFuture ... done [18:41:51.634] result() for ClusterFuture ... [18:41:51.634] - result already collected: FutureResult [18:41:51.634] result() for ClusterFuture ... done [18:41:51.634] result() for ClusterFuture ... [18:41:51.634] - result already collected: FutureResult [18:41:51.634] result() for ClusterFuture ... done [18:41:51.635] result() for ClusterFuture ... [18:41:51.635] - result already collected: FutureResult [18:41:51.635] result() for ClusterFuture ... done [18:41:51.635] - relayed: [n=2] TRUE, TRUE [18:41:51.635] - queued futures: [n=2] TRUE, TRUE [18:41:51.635] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.636] length: 0 (resolved future 2) [18:41:51.636] Relaying remaining futures [18:41:51.636] signalConditionsASAP(NULL, pos=0) ... [18:41:51.636] - nx: 2 [18:41:51.636] - relay: TRUE [18:41:51.636] - stdout: TRUE [18:41:51.636] - signal: TRUE [18:41:51.637] - resignal: FALSE [18:41:51.637] - force: TRUE [18:41:51.637] - relayed: [n=2] TRUE, TRUE [18:41:51.637] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.637] - relayed: [n=2] TRUE, TRUE [18:41:51.637] - queued futures: [n=2] TRUE, TRUE [18:41:51.638] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.638] resolve() on list ... DONE [18:41:51.638] result() for ClusterFuture ... [18:41:51.638] - result already collected: FutureResult [18:41:51.638] result() for ClusterFuture ... done [18:41:51.638] result() for ClusterFuture ... [18:41:51.638] - result already collected: FutureResult [18:41:51.639] result() for ClusterFuture ... done [18:41:51.639] result() for ClusterFuture ... [18:41:51.639] - result already collected: FutureResult [18:41:51.639] result() for ClusterFuture ... done [18:41:51.639] result() for ClusterFuture ... [18:41:51.639] - result already collected: FutureResult [18:41:51.639] result() for ClusterFuture ... done [18:41:51.640] - Number of value chunks collected: 2 [18:41:51.640] Resolving 2 futures (chunks) ... DONE [18:41:51.640] Reducing values from 2 chunks ... [18:41:51.640] - Number of values collected after concatenation: 6 [18:41:51.640] - Number of values expected: 6 [18:41:51.640] Reducing values from 2 chunks ... DONE [18:41:51.641] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y1:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 List of 2 $ y0:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 $ y2:List of 6 ..$ a1: int [1, 1] 1 ..$ a2: int [1, 1] 2 ..$ b1: int [1, 1] 2 ..$ b2: int [1, 1] 3 ..$ c1: int [1, 1] 3 ..$ c2: int [1, 1] 4 [18:41:51.654] future_lapply() ... [18:41:51.657] Number of chunks: 2 [18:41:51.657] getGlobalsAndPackagesXApply() ... [18:41:51.657] - future.globals: TRUE [18:41:51.658] getGlobalsAndPackages() ... [18:41:51.658] Searching for globals... [18:41:51.660] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:51.660] Searching for globals ... DONE [18:41:51.660] Resolving globals: FALSE [18:41:51.661] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:51.661] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:51.662] - globals: [1] 'FUN' [18:41:51.662] [18:41:51.662] getGlobalsAndPackages() ... DONE [18:41:51.662] - globals found/used: [n=1] 'FUN' [18:41:51.663] - needed namespaces: [n=0] [18:41:51.663] Finding globals ... DONE [18:41:51.663] - use_args: TRUE [18:41:51.663] - Getting '...' globals ... [18:41:51.663] resolve() on list ... [18:41:51.664] recursive: 0 [18:41:51.664] length: 1 [18:41:51.664] elements: '...' [18:41:51.664] length: 0 (resolved future 1) [18:41:51.664] resolve() on list ... DONE [18:41:51.665] - '...' content: [n=0] [18:41:51.665] List of 1 [18:41:51.665] $ ...: list() [18:41:51.665] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.665] - attr(*, "where")=List of 1 [18:41:51.665] ..$ ...: [18:41:51.665] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.665] - attr(*, "resolved")= logi TRUE [18:41:51.665] - attr(*, "total_size")= num NA [18:41:51.668] - Getting '...' globals ... DONE [18:41:51.668] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:51.668] List of 2 [18:41:51.668] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:51.668] $ ... : list() [18:41:51.668] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.668] - attr(*, "where")=List of 2 [18:41:51.668] ..$ ...future.FUN: [18:41:51.668] ..$ ... : [18:41:51.668] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.668] - attr(*, "resolved")= logi FALSE [18:41:51.668] - attr(*, "total_size")= int 6664 [18:41:51.671] Packages to be attached in all futures: [n=0] [18:41:51.672] getGlobalsAndPackagesXApply() ... DONE [18:41:51.672] Number of futures (= number of chunks): 2 [18:41:51.672] Launching 2 futures (chunks) ... [18:41:51.672] Chunk #1 of 2 ... [18:41:51.672] - Finding globals in 'X' for chunk #1 ... [18:41:51.673] getGlobalsAndPackages() ... [18:41:51.673] Searching for globals... [18:41:51.673] [18:41:51.673] Searching for globals ... DONE [18:41:51.673] - globals: [0] [18:41:51.674] getGlobalsAndPackages() ... DONE [18:41:51.674] + additional globals found: [n=0] [18:41:51.674] + additional namespaces needed: [n=0] [18:41:51.674] - Finding globals in 'X' for chunk #1 ... DONE [18:41:51.674] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.674] - seeds: [18:41:51.675] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.675] getGlobalsAndPackages() ... [18:41:51.675] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.675] Resolving globals: FALSE [18:41:51.675] Tweak future expression to call with '...' arguments ... [18:41:51.675] { [18:41:51.675] do.call(function(...) { [18:41:51.675] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.675] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.675] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.675] on.exit(options(oopts), add = TRUE) [18:41:51.675] } [18:41:51.675] { [18:41:51.675] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.675] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.675] ...future.FUN(...future.X_jj, ...) [18:41:51.675] }) [18:41:51.675] } [18:41:51.675] }, args = future.call.arguments) [18:41:51.675] } [18:41:51.676] Tweak future expression to call with '...' arguments ... DONE [18:41:51.677] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.677] [18:41:51.677] getGlobalsAndPackages() ... DONE [18:41:51.678] run() for 'Future' ... [18:41:51.678] - state: 'created' [18:41:51.679] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.695] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.695] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.695] - Field: 'node' [18:41:51.695] - Field: 'label' [18:41:51.696] - Field: 'local' [18:41:51.696] - Field: 'owner' [18:41:51.696] - Field: 'envir' [18:41:51.696] - Field: 'workers' [18:41:51.696] - Field: 'packages' [18:41:51.696] - Field: 'gc' [18:41:51.697] - Field: 'conditions' [18:41:51.697] - Field: 'persistent' [18:41:51.697] - Field: 'expr' [18:41:51.697] - Field: 'uuid' [18:41:51.697] - Field: 'seed' [18:41:51.697] - Field: 'version' [18:41:51.698] - Field: 'result' [18:41:51.698] - Field: 'asynchronous' [18:41:51.698] - Field: 'calls' [18:41:51.698] - Field: 'globals' [18:41:51.698] - Field: 'stdout' [18:41:51.699] - Field: 'earlySignal' [18:41:51.699] - Field: 'lazy' [18:41:51.699] - Field: 'state' [18:41:51.699] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.699] - Launch lazy future ... [18:41:51.700] Packages needed by the future expression (n = 0): [18:41:51.700] Packages needed by future strategies (n = 0): [18:41:51.700] { [18:41:51.700] { [18:41:51.700] { [18:41:51.700] ...future.startTime <- base::Sys.time() [18:41:51.700] { [18:41:51.700] { [18:41:51.700] { [18:41:51.700] { [18:41:51.700] base::local({ [18:41:51.700] has_future <- base::requireNamespace("future", [18:41:51.700] quietly = TRUE) [18:41:51.700] if (has_future) { [18:41:51.700] ns <- base::getNamespace("future") [18:41:51.700] version <- ns[[".package"]][["version"]] [18:41:51.700] if (is.null(version)) [18:41:51.700] version <- utils::packageVersion("future") [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] version <- NULL [18:41:51.700] } [18:41:51.700] if (!has_future || version < "1.8.0") { [18:41:51.700] info <- base::c(r_version = base::gsub("R version ", [18:41:51.700] "", base::R.version$version.string), [18:41:51.700] platform = base::sprintf("%s (%s-bit)", [18:41:51.700] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.700] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.700] "release", "version")], collapse = " "), [18:41:51.700] hostname = base::Sys.info()[["nodename"]]) [18:41:51.700] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.700] info) [18:41:51.700] info <- base::paste(info, collapse = "; ") [18:41:51.700] if (!has_future) { [18:41:51.700] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.700] info) [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.700] info, version) [18:41:51.700] } [18:41:51.700] base::stop(msg) [18:41:51.700] } [18:41:51.700] }) [18:41:51.700] } [18:41:51.700] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.700] base::options(mc.cores = 1L) [18:41:51.700] } [18:41:51.700] ...future.strategy.old <- future::plan("list") [18:41:51.700] options(future.plan = NULL) [18:41:51.700] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.700] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.700] } [18:41:51.700] ...future.workdir <- getwd() [18:41:51.700] } [18:41:51.700] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.700] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.700] } [18:41:51.700] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.700] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.700] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.700] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.700] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.700] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.700] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.700] base::names(...future.oldOptions)) [18:41:51.700] } [18:41:51.700] if (FALSE) { [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] if (TRUE) { [18:41:51.700] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.700] open = "w") [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.700] windows = "NUL", "/dev/null"), open = "w") [18:41:51.700] } [18:41:51.700] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.700] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.700] base::sink(type = "output", split = FALSE) [18:41:51.700] base::close(...future.stdout) [18:41:51.700] }, add = TRUE) [18:41:51.700] } [18:41:51.700] ...future.frame <- base::sys.nframe() [18:41:51.700] ...future.conditions <- base::list() [18:41:51.700] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.700] if (FALSE) { [18:41:51.700] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.700] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.700] } [18:41:51.700] ...future.result <- base::tryCatch({ [18:41:51.700] base::withCallingHandlers({ [18:41:51.700] ...future.value <- base::withVisible(base::local({ [18:41:51.700] ...future.makeSendCondition <- base::local({ [18:41:51.700] sendCondition <- NULL [18:41:51.700] function(frame = 1L) { [18:41:51.700] if (is.function(sendCondition)) [18:41:51.700] return(sendCondition) [18:41:51.700] ns <- getNamespace("parallel") [18:41:51.700] if (exists("sendData", mode = "function", [18:41:51.700] envir = ns)) { [18:41:51.700] parallel_sendData <- get("sendData", mode = "function", [18:41:51.700] envir = ns) [18:41:51.700] envir <- sys.frame(frame) [18:41:51.700] master <- NULL [18:41:51.700] while (!identical(envir, .GlobalEnv) && [18:41:51.700] !identical(envir, emptyenv())) { [18:41:51.700] if (exists("master", mode = "list", envir = envir, [18:41:51.700] inherits = FALSE)) { [18:41:51.700] master <- get("master", mode = "list", [18:41:51.700] envir = envir, inherits = FALSE) [18:41:51.700] if (inherits(master, c("SOCKnode", [18:41:51.700] "SOCK0node"))) { [18:41:51.700] sendCondition <<- function(cond) { [18:41:51.700] data <- list(type = "VALUE", value = cond, [18:41:51.700] success = TRUE) [18:41:51.700] parallel_sendData(master, data) [18:41:51.700] } [18:41:51.700] return(sendCondition) [18:41:51.700] } [18:41:51.700] } [18:41:51.700] frame <- frame + 1L [18:41:51.700] envir <- sys.frame(frame) [18:41:51.700] } [18:41:51.700] } [18:41:51.700] sendCondition <<- function(cond) NULL [18:41:51.700] } [18:41:51.700] }) [18:41:51.700] withCallingHandlers({ [18:41:51.700] { [18:41:51.700] do.call(function(...) { [18:41:51.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.700] if (!identical(...future.globals.maxSize.org, [18:41:51.700] ...future.globals.maxSize)) { [18:41:51.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.700] on.exit(options(oopts), add = TRUE) [18:41:51.700] } [18:41:51.700] { [18:41:51.700] lapply(seq_along(...future.elements_ii), [18:41:51.700] FUN = function(jj) { [18:41:51.700] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.700] ...future.FUN(...future.X_jj, ...) [18:41:51.700] }) [18:41:51.700] } [18:41:51.700] }, args = future.call.arguments) [18:41:51.700] } [18:41:51.700] }, immediateCondition = function(cond) { [18:41:51.700] sendCondition <- ...future.makeSendCondition() [18:41:51.700] sendCondition(cond) [18:41:51.700] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.700] { [18:41:51.700] inherits <- base::inherits [18:41:51.700] invokeRestart <- base::invokeRestart [18:41:51.700] is.null <- base::is.null [18:41:51.700] muffled <- FALSE [18:41:51.700] if (inherits(cond, "message")) { [18:41:51.700] muffled <- grepl(pattern, "muffleMessage") [18:41:51.700] if (muffled) [18:41:51.700] invokeRestart("muffleMessage") [18:41:51.700] } [18:41:51.700] else if (inherits(cond, "warning")) { [18:41:51.700] muffled <- grepl(pattern, "muffleWarning") [18:41:51.700] if (muffled) [18:41:51.700] invokeRestart("muffleWarning") [18:41:51.700] } [18:41:51.700] else if (inherits(cond, "condition")) { [18:41:51.700] if (!is.null(pattern)) { [18:41:51.700] computeRestarts <- base::computeRestarts [18:41:51.700] grepl <- base::grepl [18:41:51.700] restarts <- computeRestarts(cond) [18:41:51.700] for (restart in restarts) { [18:41:51.700] name <- restart$name [18:41:51.700] if (is.null(name)) [18:41:51.700] next [18:41:51.700] if (!grepl(pattern, name)) [18:41:51.700] next [18:41:51.700] invokeRestart(restart) [18:41:51.700] muffled <- TRUE [18:41:51.700] break [18:41:51.700] } [18:41:51.700] } [18:41:51.700] } [18:41:51.700] invisible(muffled) [18:41:51.700] } [18:41:51.700] muffleCondition(cond) [18:41:51.700] }) [18:41:51.700] })) [18:41:51.700] future::FutureResult(value = ...future.value$value, [18:41:51.700] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.700] ...future.rng), globalenv = if (FALSE) [18:41:51.700] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.700] ...future.globalenv.names)) [18:41:51.700] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.700] }, condition = base::local({ [18:41:51.700] c <- base::c [18:41:51.700] inherits <- base::inherits [18:41:51.700] invokeRestart <- base::invokeRestart [18:41:51.700] length <- base::length [18:41:51.700] list <- base::list [18:41:51.700] seq.int <- base::seq.int [18:41:51.700] signalCondition <- base::signalCondition [18:41:51.700] sys.calls <- base::sys.calls [18:41:51.700] `[[` <- base::`[[` [18:41:51.700] `+` <- base::`+` [18:41:51.700] `<<-` <- base::`<<-` [18:41:51.700] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.700] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.700] 3L)] [18:41:51.700] } [18:41:51.700] function(cond) { [18:41:51.700] is_error <- inherits(cond, "error") [18:41:51.700] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.700] NULL) [18:41:51.700] if (is_error) { [18:41:51.700] sessionInformation <- function() { [18:41:51.700] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.700] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.700] search = base::search(), system = base::Sys.info()) [18:41:51.700] } [18:41:51.700] ...future.conditions[[length(...future.conditions) + [18:41:51.700] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.700] cond$call), session = sessionInformation(), [18:41:51.700] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.700] signalCondition(cond) [18:41:51.700] } [18:41:51.700] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.700] "immediateCondition"))) { [18:41:51.700] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.700] ...future.conditions[[length(...future.conditions) + [18:41:51.700] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.700] if (TRUE && !signal) { [18:41:51.700] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.700] { [18:41:51.700] inherits <- base::inherits [18:41:51.700] invokeRestart <- base::invokeRestart [18:41:51.700] is.null <- base::is.null [18:41:51.700] muffled <- FALSE [18:41:51.700] if (inherits(cond, "message")) { [18:41:51.700] muffled <- grepl(pattern, "muffleMessage") [18:41:51.700] if (muffled) [18:41:51.700] invokeRestart("muffleMessage") [18:41:51.700] } [18:41:51.700] else if (inherits(cond, "warning")) { [18:41:51.700] muffled <- grepl(pattern, "muffleWarning") [18:41:51.700] if (muffled) [18:41:51.700] invokeRestart("muffleWarning") [18:41:51.700] } [18:41:51.700] else if (inherits(cond, "condition")) { [18:41:51.700] if (!is.null(pattern)) { [18:41:51.700] computeRestarts <- base::computeRestarts [18:41:51.700] grepl <- base::grepl [18:41:51.700] restarts <- computeRestarts(cond) [18:41:51.700] for (restart in restarts) { [18:41:51.700] name <- restart$name [18:41:51.700] if (is.null(name)) [18:41:51.700] next [18:41:51.700] if (!grepl(pattern, name)) [18:41:51.700] next [18:41:51.700] invokeRestart(restart) [18:41:51.700] muffled <- TRUE [18:41:51.700] break [18:41:51.700] } [18:41:51.700] } [18:41:51.700] } [18:41:51.700] invisible(muffled) [18:41:51.700] } [18:41:51.700] muffleCondition(cond, pattern = "^muffle") [18:41:51.700] } [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] if (TRUE) { [18:41:51.700] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.700] { [18:41:51.700] inherits <- base::inherits [18:41:51.700] invokeRestart <- base::invokeRestart [18:41:51.700] is.null <- base::is.null [18:41:51.700] muffled <- FALSE [18:41:51.700] if (inherits(cond, "message")) { [18:41:51.700] muffled <- grepl(pattern, "muffleMessage") [18:41:51.700] if (muffled) [18:41:51.700] invokeRestart("muffleMessage") [18:41:51.700] } [18:41:51.700] else if (inherits(cond, "warning")) { [18:41:51.700] muffled <- grepl(pattern, "muffleWarning") [18:41:51.700] if (muffled) [18:41:51.700] invokeRestart("muffleWarning") [18:41:51.700] } [18:41:51.700] else if (inherits(cond, "condition")) { [18:41:51.700] if (!is.null(pattern)) { [18:41:51.700] computeRestarts <- base::computeRestarts [18:41:51.700] grepl <- base::grepl [18:41:51.700] restarts <- computeRestarts(cond) [18:41:51.700] for (restart in restarts) { [18:41:51.700] name <- restart$name [18:41:51.700] if (is.null(name)) [18:41:51.700] next [18:41:51.700] if (!grepl(pattern, name)) [18:41:51.700] next [18:41:51.700] invokeRestart(restart) [18:41:51.700] muffled <- TRUE [18:41:51.700] break [18:41:51.700] } [18:41:51.700] } [18:41:51.700] } [18:41:51.700] invisible(muffled) [18:41:51.700] } [18:41:51.700] muffleCondition(cond, pattern = "^muffle") [18:41:51.700] } [18:41:51.700] } [18:41:51.700] } [18:41:51.700] })) [18:41:51.700] }, error = function(ex) { [18:41:51.700] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.700] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.700] ...future.rng), started = ...future.startTime, [18:41:51.700] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.700] version = "1.8"), class = "FutureResult") [18:41:51.700] }, finally = { [18:41:51.700] if (!identical(...future.workdir, getwd())) [18:41:51.700] setwd(...future.workdir) [18:41:51.700] { [18:41:51.700] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.700] ...future.oldOptions$nwarnings <- NULL [18:41:51.700] } [18:41:51.700] base::options(...future.oldOptions) [18:41:51.700] if (.Platform$OS.type == "windows") { [18:41:51.700] old_names <- names(...future.oldEnvVars) [18:41:51.700] envs <- base::Sys.getenv() [18:41:51.700] names <- names(envs) [18:41:51.700] common <- intersect(names, old_names) [18:41:51.700] added <- setdiff(names, old_names) [18:41:51.700] removed <- setdiff(old_names, names) [18:41:51.700] changed <- common[...future.oldEnvVars[common] != [18:41:51.700] envs[common]] [18:41:51.700] NAMES <- toupper(changed) [18:41:51.700] args <- list() [18:41:51.700] for (kk in seq_along(NAMES)) { [18:41:51.700] name <- changed[[kk]] [18:41:51.700] NAME <- NAMES[[kk]] [18:41:51.700] if (name != NAME && is.element(NAME, old_names)) [18:41:51.700] next [18:41:51.700] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.700] } [18:41:51.700] NAMES <- toupper(added) [18:41:51.700] for (kk in seq_along(NAMES)) { [18:41:51.700] name <- added[[kk]] [18:41:51.700] NAME <- NAMES[[kk]] [18:41:51.700] if (name != NAME && is.element(NAME, old_names)) [18:41:51.700] next [18:41:51.700] args[[name]] <- "" [18:41:51.700] } [18:41:51.700] NAMES <- toupper(removed) [18:41:51.700] for (kk in seq_along(NAMES)) { [18:41:51.700] name <- removed[[kk]] [18:41:51.700] NAME <- NAMES[[kk]] [18:41:51.700] if (name != NAME && is.element(NAME, old_names)) [18:41:51.700] next [18:41:51.700] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.700] } [18:41:51.700] if (length(args) > 0) [18:41:51.700] base::do.call(base::Sys.setenv, args = args) [18:41:51.700] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.700] } [18:41:51.700] { [18:41:51.700] if (base::length(...future.futureOptionsAdded) > [18:41:51.700] 0L) { [18:41:51.700] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.700] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.700] base::options(opts) [18:41:51.700] } [18:41:51.700] { [18:41:51.700] { [18:41:51.700] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.700] NULL [18:41:51.700] } [18:41:51.700] options(future.plan = NULL) [18:41:51.700] if (is.na(NA_character_)) [18:41:51.700] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.700] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.700] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.700] .init = FALSE) [18:41:51.700] } [18:41:51.700] } [18:41:51.700] } [18:41:51.700] }) [18:41:51.700] if (TRUE) { [18:41:51.700] base::sink(type = "output", split = FALSE) [18:41:51.700] if (TRUE) { [18:41:51.700] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.700] } [18:41:51.700] else { [18:41:51.700] ...future.result["stdout"] <- base::list(NULL) [18:41:51.700] } [18:41:51.700] base::close(...future.stdout) [18:41:51.700] ...future.stdout <- NULL [18:41:51.700] } [18:41:51.700] ...future.result$conditions <- ...future.conditions [18:41:51.700] ...future.result$finished <- base::Sys.time() [18:41:51.700] ...future.result [18:41:51.700] } [18:41:51.706] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:51.706] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:51.706] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:51.707] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.707] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.707] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.708] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.708] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.708] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.709] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.709] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.709] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:51.710] MultisessionFuture started [18:41:51.710] - Launch lazy future ... done [18:41:51.710] run() for 'MultisessionFuture' ... done [18:41:51.710] Created future: [18:41:51.728] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.728] - Validating connection of MultisessionFuture [18:41:51.728] - received message: FutureResult [18:41:51.728] - Received FutureResult [18:41:51.728] - Erased future from FutureRegistry [18:41:51.729] result() for ClusterFuture ... [18:41:51.729] - result already collected: FutureResult [18:41:51.729] result() for ClusterFuture ... done [18:41:51.729] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.710] MultisessionFuture: [18:41:51.710] Label: 'future_sapply-1' [18:41:51.710] Expression: [18:41:51.710] { [18:41:51.710] do.call(function(...) { [18:41:51.710] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.710] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.710] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.710] on.exit(options(oopts), add = TRUE) [18:41:51.710] } [18:41:51.710] { [18:41:51.710] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.710] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.710] ...future.FUN(...future.X_jj, ...) [18:41:51.710] }) [18:41:51.710] } [18:41:51.710] }, args = future.call.arguments) [18:41:51.710] } [18:41:51.710] Lazy evaluation: FALSE [18:41:51.710] Asynchronous evaluation: TRUE [18:41:51.710] Local evaluation: TRUE [18:41:51.710] Environment: R_GlobalEnv [18:41:51.710] Capture standard output: TRUE [18:41:51.710] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.710] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.710] Packages: [18:41:51.710] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.710] Resolved: TRUE [18:41:51.710] Value: [18:41:51.710] Conditions captured: [18:41:51.710] Early signaling: FALSE [18:41:51.710] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.710] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.730] Chunk #1 of 2 ... DONE [18:41:51.730] Chunk #2 of 2 ... [18:41:51.730] - Finding globals in 'X' for chunk #2 ... [18:41:51.730] getGlobalsAndPackages() ... [18:41:51.730] Searching for globals... [18:41:51.731] [18:41:51.731] Searching for globals ... DONE [18:41:51.731] - globals: [0] [18:41:51.731] getGlobalsAndPackages() ... DONE [18:41:51.731] + additional globals found: [n=0] [18:41:51.731] + additional namespaces needed: [n=0] [18:41:51.732] - Finding globals in 'X' for chunk #2 ... DONE [18:41:51.732] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.732] - seeds: [18:41:51.732] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.732] getGlobalsAndPackages() ... [18:41:51.732] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.733] Resolving globals: FALSE [18:41:51.733] Tweak future expression to call with '...' arguments ... [18:41:51.733] { [18:41:51.733] do.call(function(...) { [18:41:51.733] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.733] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.733] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.733] on.exit(options(oopts), add = TRUE) [18:41:51.733] } [18:41:51.733] { [18:41:51.733] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.733] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.733] ...future.FUN(...future.X_jj, ...) [18:41:51.733] }) [18:41:51.733] } [18:41:51.733] }, args = future.call.arguments) [18:41:51.733] } [18:41:51.733] Tweak future expression to call with '...' arguments ... DONE [18:41:51.734] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.734] [18:41:51.734] getGlobalsAndPackages() ... DONE [18:41:51.734] run() for 'Future' ... [18:41:51.735] - state: 'created' [18:41:51.735] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.750] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.751] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.751] - Field: 'node' [18:41:51.751] - Field: 'label' [18:41:51.751] - Field: 'local' [18:41:51.751] - Field: 'owner' [18:41:51.751] - Field: 'envir' [18:41:51.752] - Field: 'workers' [18:41:51.752] - Field: 'packages' [18:41:51.752] - Field: 'gc' [18:41:51.752] - Field: 'conditions' [18:41:51.752] - Field: 'persistent' [18:41:51.753] - Field: 'expr' [18:41:51.753] - Field: 'uuid' [18:41:51.753] - Field: 'seed' [18:41:51.753] - Field: 'version' [18:41:51.753] - Field: 'result' [18:41:51.753] - Field: 'asynchronous' [18:41:51.754] - Field: 'calls' [18:41:51.754] - Field: 'globals' [18:41:51.754] - Field: 'stdout' [18:41:51.754] - Field: 'earlySignal' [18:41:51.754] - Field: 'lazy' [18:41:51.755] - Field: 'state' [18:41:51.755] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.755] - Launch lazy future ... [18:41:51.755] Packages needed by the future expression (n = 0): [18:41:51.755] Packages needed by future strategies (n = 0): [18:41:51.756] { [18:41:51.756] { [18:41:51.756] { [18:41:51.756] ...future.startTime <- base::Sys.time() [18:41:51.756] { [18:41:51.756] { [18:41:51.756] { [18:41:51.756] { [18:41:51.756] base::local({ [18:41:51.756] has_future <- base::requireNamespace("future", [18:41:51.756] quietly = TRUE) [18:41:51.756] if (has_future) { [18:41:51.756] ns <- base::getNamespace("future") [18:41:51.756] version <- ns[[".package"]][["version"]] [18:41:51.756] if (is.null(version)) [18:41:51.756] version <- utils::packageVersion("future") [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] version <- NULL [18:41:51.756] } [18:41:51.756] if (!has_future || version < "1.8.0") { [18:41:51.756] info <- base::c(r_version = base::gsub("R version ", [18:41:51.756] "", base::R.version$version.string), [18:41:51.756] platform = base::sprintf("%s (%s-bit)", [18:41:51.756] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.756] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.756] "release", "version")], collapse = " "), [18:41:51.756] hostname = base::Sys.info()[["nodename"]]) [18:41:51.756] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.756] info) [18:41:51.756] info <- base::paste(info, collapse = "; ") [18:41:51.756] if (!has_future) { [18:41:51.756] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.756] info) [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.756] info, version) [18:41:51.756] } [18:41:51.756] base::stop(msg) [18:41:51.756] } [18:41:51.756] }) [18:41:51.756] } [18:41:51.756] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.756] base::options(mc.cores = 1L) [18:41:51.756] } [18:41:51.756] ...future.strategy.old <- future::plan("list") [18:41:51.756] options(future.plan = NULL) [18:41:51.756] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.756] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.756] } [18:41:51.756] ...future.workdir <- getwd() [18:41:51.756] } [18:41:51.756] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.756] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.756] } [18:41:51.756] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.756] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.756] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.756] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.756] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.756] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.756] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.756] base::names(...future.oldOptions)) [18:41:51.756] } [18:41:51.756] if (FALSE) { [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] if (TRUE) { [18:41:51.756] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.756] open = "w") [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.756] windows = "NUL", "/dev/null"), open = "w") [18:41:51.756] } [18:41:51.756] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.756] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.756] base::sink(type = "output", split = FALSE) [18:41:51.756] base::close(...future.stdout) [18:41:51.756] }, add = TRUE) [18:41:51.756] } [18:41:51.756] ...future.frame <- base::sys.nframe() [18:41:51.756] ...future.conditions <- base::list() [18:41:51.756] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.756] if (FALSE) { [18:41:51.756] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.756] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.756] } [18:41:51.756] ...future.result <- base::tryCatch({ [18:41:51.756] base::withCallingHandlers({ [18:41:51.756] ...future.value <- base::withVisible(base::local({ [18:41:51.756] ...future.makeSendCondition <- base::local({ [18:41:51.756] sendCondition <- NULL [18:41:51.756] function(frame = 1L) { [18:41:51.756] if (is.function(sendCondition)) [18:41:51.756] return(sendCondition) [18:41:51.756] ns <- getNamespace("parallel") [18:41:51.756] if (exists("sendData", mode = "function", [18:41:51.756] envir = ns)) { [18:41:51.756] parallel_sendData <- get("sendData", mode = "function", [18:41:51.756] envir = ns) [18:41:51.756] envir <- sys.frame(frame) [18:41:51.756] master <- NULL [18:41:51.756] while (!identical(envir, .GlobalEnv) && [18:41:51.756] !identical(envir, emptyenv())) { [18:41:51.756] if (exists("master", mode = "list", envir = envir, [18:41:51.756] inherits = FALSE)) { [18:41:51.756] master <- get("master", mode = "list", [18:41:51.756] envir = envir, inherits = FALSE) [18:41:51.756] if (inherits(master, c("SOCKnode", [18:41:51.756] "SOCK0node"))) { [18:41:51.756] sendCondition <<- function(cond) { [18:41:51.756] data <- list(type = "VALUE", value = cond, [18:41:51.756] success = TRUE) [18:41:51.756] parallel_sendData(master, data) [18:41:51.756] } [18:41:51.756] return(sendCondition) [18:41:51.756] } [18:41:51.756] } [18:41:51.756] frame <- frame + 1L [18:41:51.756] envir <- sys.frame(frame) [18:41:51.756] } [18:41:51.756] } [18:41:51.756] sendCondition <<- function(cond) NULL [18:41:51.756] } [18:41:51.756] }) [18:41:51.756] withCallingHandlers({ [18:41:51.756] { [18:41:51.756] do.call(function(...) { [18:41:51.756] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.756] if (!identical(...future.globals.maxSize.org, [18:41:51.756] ...future.globals.maxSize)) { [18:41:51.756] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.756] on.exit(options(oopts), add = TRUE) [18:41:51.756] } [18:41:51.756] { [18:41:51.756] lapply(seq_along(...future.elements_ii), [18:41:51.756] FUN = function(jj) { [18:41:51.756] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.756] ...future.FUN(...future.X_jj, ...) [18:41:51.756] }) [18:41:51.756] } [18:41:51.756] }, args = future.call.arguments) [18:41:51.756] } [18:41:51.756] }, immediateCondition = function(cond) { [18:41:51.756] sendCondition <- ...future.makeSendCondition() [18:41:51.756] sendCondition(cond) [18:41:51.756] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.756] { [18:41:51.756] inherits <- base::inherits [18:41:51.756] invokeRestart <- base::invokeRestart [18:41:51.756] is.null <- base::is.null [18:41:51.756] muffled <- FALSE [18:41:51.756] if (inherits(cond, "message")) { [18:41:51.756] muffled <- grepl(pattern, "muffleMessage") [18:41:51.756] if (muffled) [18:41:51.756] invokeRestart("muffleMessage") [18:41:51.756] } [18:41:51.756] else if (inherits(cond, "warning")) { [18:41:51.756] muffled <- grepl(pattern, "muffleWarning") [18:41:51.756] if (muffled) [18:41:51.756] invokeRestart("muffleWarning") [18:41:51.756] } [18:41:51.756] else if (inherits(cond, "condition")) { [18:41:51.756] if (!is.null(pattern)) { [18:41:51.756] computeRestarts <- base::computeRestarts [18:41:51.756] grepl <- base::grepl [18:41:51.756] restarts <- computeRestarts(cond) [18:41:51.756] for (restart in restarts) { [18:41:51.756] name <- restart$name [18:41:51.756] if (is.null(name)) [18:41:51.756] next [18:41:51.756] if (!grepl(pattern, name)) [18:41:51.756] next [18:41:51.756] invokeRestart(restart) [18:41:51.756] muffled <- TRUE [18:41:51.756] break [18:41:51.756] } [18:41:51.756] } [18:41:51.756] } [18:41:51.756] invisible(muffled) [18:41:51.756] } [18:41:51.756] muffleCondition(cond) [18:41:51.756] }) [18:41:51.756] })) [18:41:51.756] future::FutureResult(value = ...future.value$value, [18:41:51.756] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.756] ...future.rng), globalenv = if (FALSE) [18:41:51.756] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.756] ...future.globalenv.names)) [18:41:51.756] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.756] }, condition = base::local({ [18:41:51.756] c <- base::c [18:41:51.756] inherits <- base::inherits [18:41:51.756] invokeRestart <- base::invokeRestart [18:41:51.756] length <- base::length [18:41:51.756] list <- base::list [18:41:51.756] seq.int <- base::seq.int [18:41:51.756] signalCondition <- base::signalCondition [18:41:51.756] sys.calls <- base::sys.calls [18:41:51.756] `[[` <- base::`[[` [18:41:51.756] `+` <- base::`+` [18:41:51.756] `<<-` <- base::`<<-` [18:41:51.756] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.756] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.756] 3L)] [18:41:51.756] } [18:41:51.756] function(cond) { [18:41:51.756] is_error <- inherits(cond, "error") [18:41:51.756] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.756] NULL) [18:41:51.756] if (is_error) { [18:41:51.756] sessionInformation <- function() { [18:41:51.756] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.756] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.756] search = base::search(), system = base::Sys.info()) [18:41:51.756] } [18:41:51.756] ...future.conditions[[length(...future.conditions) + [18:41:51.756] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.756] cond$call), session = sessionInformation(), [18:41:51.756] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.756] signalCondition(cond) [18:41:51.756] } [18:41:51.756] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.756] "immediateCondition"))) { [18:41:51.756] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.756] ...future.conditions[[length(...future.conditions) + [18:41:51.756] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.756] if (TRUE && !signal) { [18:41:51.756] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.756] { [18:41:51.756] inherits <- base::inherits [18:41:51.756] invokeRestart <- base::invokeRestart [18:41:51.756] is.null <- base::is.null [18:41:51.756] muffled <- FALSE [18:41:51.756] if (inherits(cond, "message")) { [18:41:51.756] muffled <- grepl(pattern, "muffleMessage") [18:41:51.756] if (muffled) [18:41:51.756] invokeRestart("muffleMessage") [18:41:51.756] } [18:41:51.756] else if (inherits(cond, "warning")) { [18:41:51.756] muffled <- grepl(pattern, "muffleWarning") [18:41:51.756] if (muffled) [18:41:51.756] invokeRestart("muffleWarning") [18:41:51.756] } [18:41:51.756] else if (inherits(cond, "condition")) { [18:41:51.756] if (!is.null(pattern)) { [18:41:51.756] computeRestarts <- base::computeRestarts [18:41:51.756] grepl <- base::grepl [18:41:51.756] restarts <- computeRestarts(cond) [18:41:51.756] for (restart in restarts) { [18:41:51.756] name <- restart$name [18:41:51.756] if (is.null(name)) [18:41:51.756] next [18:41:51.756] if (!grepl(pattern, name)) [18:41:51.756] next [18:41:51.756] invokeRestart(restart) [18:41:51.756] muffled <- TRUE [18:41:51.756] break [18:41:51.756] } [18:41:51.756] } [18:41:51.756] } [18:41:51.756] invisible(muffled) [18:41:51.756] } [18:41:51.756] muffleCondition(cond, pattern = "^muffle") [18:41:51.756] } [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] if (TRUE) { [18:41:51.756] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.756] { [18:41:51.756] inherits <- base::inherits [18:41:51.756] invokeRestart <- base::invokeRestart [18:41:51.756] is.null <- base::is.null [18:41:51.756] muffled <- FALSE [18:41:51.756] if (inherits(cond, "message")) { [18:41:51.756] muffled <- grepl(pattern, "muffleMessage") [18:41:51.756] if (muffled) [18:41:51.756] invokeRestart("muffleMessage") [18:41:51.756] } [18:41:51.756] else if (inherits(cond, "warning")) { [18:41:51.756] muffled <- grepl(pattern, "muffleWarning") [18:41:51.756] if (muffled) [18:41:51.756] invokeRestart("muffleWarning") [18:41:51.756] } [18:41:51.756] else if (inherits(cond, "condition")) { [18:41:51.756] if (!is.null(pattern)) { [18:41:51.756] computeRestarts <- base::computeRestarts [18:41:51.756] grepl <- base::grepl [18:41:51.756] restarts <- computeRestarts(cond) [18:41:51.756] for (restart in restarts) { [18:41:51.756] name <- restart$name [18:41:51.756] if (is.null(name)) [18:41:51.756] next [18:41:51.756] if (!grepl(pattern, name)) [18:41:51.756] next [18:41:51.756] invokeRestart(restart) [18:41:51.756] muffled <- TRUE [18:41:51.756] break [18:41:51.756] } [18:41:51.756] } [18:41:51.756] } [18:41:51.756] invisible(muffled) [18:41:51.756] } [18:41:51.756] muffleCondition(cond, pattern = "^muffle") [18:41:51.756] } [18:41:51.756] } [18:41:51.756] } [18:41:51.756] })) [18:41:51.756] }, error = function(ex) { [18:41:51.756] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.756] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.756] ...future.rng), started = ...future.startTime, [18:41:51.756] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.756] version = "1.8"), class = "FutureResult") [18:41:51.756] }, finally = { [18:41:51.756] if (!identical(...future.workdir, getwd())) [18:41:51.756] setwd(...future.workdir) [18:41:51.756] { [18:41:51.756] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.756] ...future.oldOptions$nwarnings <- NULL [18:41:51.756] } [18:41:51.756] base::options(...future.oldOptions) [18:41:51.756] if (.Platform$OS.type == "windows") { [18:41:51.756] old_names <- names(...future.oldEnvVars) [18:41:51.756] envs <- base::Sys.getenv() [18:41:51.756] names <- names(envs) [18:41:51.756] common <- intersect(names, old_names) [18:41:51.756] added <- setdiff(names, old_names) [18:41:51.756] removed <- setdiff(old_names, names) [18:41:51.756] changed <- common[...future.oldEnvVars[common] != [18:41:51.756] envs[common]] [18:41:51.756] NAMES <- toupper(changed) [18:41:51.756] args <- list() [18:41:51.756] for (kk in seq_along(NAMES)) { [18:41:51.756] name <- changed[[kk]] [18:41:51.756] NAME <- NAMES[[kk]] [18:41:51.756] if (name != NAME && is.element(NAME, old_names)) [18:41:51.756] next [18:41:51.756] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.756] } [18:41:51.756] NAMES <- toupper(added) [18:41:51.756] for (kk in seq_along(NAMES)) { [18:41:51.756] name <- added[[kk]] [18:41:51.756] NAME <- NAMES[[kk]] [18:41:51.756] if (name != NAME && is.element(NAME, old_names)) [18:41:51.756] next [18:41:51.756] args[[name]] <- "" [18:41:51.756] } [18:41:51.756] NAMES <- toupper(removed) [18:41:51.756] for (kk in seq_along(NAMES)) { [18:41:51.756] name <- removed[[kk]] [18:41:51.756] NAME <- NAMES[[kk]] [18:41:51.756] if (name != NAME && is.element(NAME, old_names)) [18:41:51.756] next [18:41:51.756] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.756] } [18:41:51.756] if (length(args) > 0) [18:41:51.756] base::do.call(base::Sys.setenv, args = args) [18:41:51.756] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.756] } [18:41:51.756] { [18:41:51.756] if (base::length(...future.futureOptionsAdded) > [18:41:51.756] 0L) { [18:41:51.756] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.756] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.756] base::options(opts) [18:41:51.756] } [18:41:51.756] { [18:41:51.756] { [18:41:51.756] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.756] NULL [18:41:51.756] } [18:41:51.756] options(future.plan = NULL) [18:41:51.756] if (is.na(NA_character_)) [18:41:51.756] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.756] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.756] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.756] .init = FALSE) [18:41:51.756] } [18:41:51.756] } [18:41:51.756] } [18:41:51.756] }) [18:41:51.756] if (TRUE) { [18:41:51.756] base::sink(type = "output", split = FALSE) [18:41:51.756] if (TRUE) { [18:41:51.756] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.756] } [18:41:51.756] else { [18:41:51.756] ...future.result["stdout"] <- base::list(NULL) [18:41:51.756] } [18:41:51.756] base::close(...future.stdout) [18:41:51.756] ...future.stdout <- NULL [18:41:51.756] } [18:41:51.756] ...future.result$conditions <- ...future.conditions [18:41:51.756] ...future.result$finished <- base::Sys.time() [18:41:51.756] ...future.result [18:41:51.756] } [18:41:51.761] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:51.762] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:51.762] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:51.762] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.763] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.763] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.763] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.764] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.764] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.764] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.765] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.765] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:51.765] MultisessionFuture started [18:41:51.766] - Launch lazy future ... done [18:41:51.766] run() for 'MultisessionFuture' ... done [18:41:51.766] Created future: [18:41:51.781] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.781] - Validating connection of MultisessionFuture [18:41:51.781] - received message: FutureResult [18:41:51.782] - Received FutureResult [18:41:51.782] - Erased future from FutureRegistry [18:41:51.782] result() for ClusterFuture ... [18:41:51.782] - result already collected: FutureResult [18:41:51.782] result() for ClusterFuture ... done [18:41:51.782] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.766] MultisessionFuture: [18:41:51.766] Label: 'future_sapply-2' [18:41:51.766] Expression: [18:41:51.766] { [18:41:51.766] do.call(function(...) { [18:41:51.766] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.766] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.766] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.766] on.exit(options(oopts), add = TRUE) [18:41:51.766] } [18:41:51.766] { [18:41:51.766] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.766] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.766] ...future.FUN(...future.X_jj, ...) [18:41:51.766] }) [18:41:51.766] } [18:41:51.766] }, args = future.call.arguments) [18:41:51.766] } [18:41:51.766] Lazy evaluation: FALSE [18:41:51.766] Asynchronous evaluation: TRUE [18:41:51.766] Local evaluation: TRUE [18:41:51.766] Environment: R_GlobalEnv [18:41:51.766] Capture standard output: TRUE [18:41:51.766] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.766] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.766] Packages: [18:41:51.766] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.766] Resolved: TRUE [18:41:51.766] Value: [18:41:51.766] Conditions captured: [18:41:51.766] Early signaling: FALSE [18:41:51.766] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.766] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.783] Chunk #2 of 2 ... DONE [18:41:51.783] Launching 2 futures (chunks) ... DONE [18:41:51.783] Resolving 2 futures (chunks) ... [18:41:51.783] resolve() on list ... [18:41:51.784] recursive: 0 [18:41:51.784] length: 2 [18:41:51.784] [18:41:51.784] Future #1 [18:41:51.784] result() for ClusterFuture ... [18:41:51.784] - result already collected: FutureResult [18:41:51.785] result() for ClusterFuture ... done [18:41:51.785] result() for ClusterFuture ... [18:41:51.785] - result already collected: FutureResult [18:41:51.785] result() for ClusterFuture ... done [18:41:51.785] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:51.786] - nx: 2 [18:41:51.786] - relay: TRUE [18:41:51.786] - stdout: TRUE [18:41:51.786] - signal: TRUE [18:41:51.786] - resignal: FALSE [18:41:51.786] - force: TRUE [18:41:51.786] - relayed: [n=2] FALSE, FALSE [18:41:51.787] - queued futures: [n=2] FALSE, FALSE [18:41:51.787] - until=1 [18:41:51.787] - relaying element #1 [18:41:51.787] result() for ClusterFuture ... [18:41:51.787] - result already collected: FutureResult [18:41:51.787] result() for ClusterFuture ... done [18:41:51.788] result() for ClusterFuture ... [18:41:51.788] - result already collected: FutureResult [18:41:51.788] result() for ClusterFuture ... done [18:41:51.788] result() for ClusterFuture ... [18:41:51.788] - result already collected: FutureResult [18:41:51.788] result() for ClusterFuture ... done [18:41:51.789] result() for ClusterFuture ... [18:41:51.789] - result already collected: FutureResult [18:41:51.789] result() for ClusterFuture ... done [18:41:51.789] - relayed: [n=2] TRUE, FALSE [18:41:51.789] - queued futures: [n=2] TRUE, FALSE [18:41:51.789] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.790] length: 1 (resolved future 1) [18:41:51.790] Future #2 [18:41:51.790] result() for ClusterFuture ... [18:41:51.790] - result already collected: FutureResult [18:41:51.793] result() for ClusterFuture ... done [18:41:51.794] result() for ClusterFuture ... [18:41:51.794] - result already collected: FutureResult [18:41:51.794] result() for ClusterFuture ... done [18:41:51.794] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.794] - nx: 2 [18:41:51.794] - relay: TRUE [18:41:51.795] - stdout: TRUE [18:41:51.795] - signal: TRUE [18:41:51.795] - resignal: FALSE [18:41:51.795] - force: TRUE [18:41:51.795] - relayed: [n=2] TRUE, FALSE [18:41:51.795] - queued futures: [n=2] TRUE, FALSE [18:41:51.796] - until=2 [18:41:51.796] - relaying element #2 [18:41:51.796] result() for ClusterFuture ... [18:41:51.796] - result already collected: FutureResult [18:41:51.796] result() for ClusterFuture ... done [18:41:51.796] result() for ClusterFuture ... [18:41:51.796] - result already collected: FutureResult [18:41:51.797] result() for ClusterFuture ... done [18:41:51.797] result() for ClusterFuture ... [18:41:51.797] - result already collected: FutureResult [18:41:51.797] result() for ClusterFuture ... done [18:41:51.797] result() for ClusterFuture ... [18:41:51.797] - result already collected: FutureResult [18:41:51.798] result() for ClusterFuture ... done [18:41:51.798] - relayed: [n=2] TRUE, TRUE [18:41:51.798] - queued futures: [n=2] TRUE, TRUE [18:41:51.798] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.798] length: 0 (resolved future 2) [18:41:51.798] Relaying remaining futures [18:41:51.799] signalConditionsASAP(NULL, pos=0) ... [18:41:51.799] - nx: 2 [18:41:51.799] - relay: TRUE [18:41:51.799] - stdout: TRUE [18:41:51.799] - signal: TRUE [18:41:51.799] - resignal: FALSE [18:41:51.799] - force: TRUE [18:41:51.800] - relayed: [n=2] TRUE, TRUE [18:41:51.800] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.800] - relayed: [n=2] TRUE, TRUE [18:41:51.800] - queued futures: [n=2] TRUE, TRUE [18:41:51.800] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.800] resolve() on list ... DONE [18:41:51.801] result() for ClusterFuture ... [18:41:51.801] - result already collected: FutureResult [18:41:51.801] result() for ClusterFuture ... done [18:41:51.801] result() for ClusterFuture ... [18:41:51.801] - result already collected: FutureResult [18:41:51.801] result() for ClusterFuture ... done [18:41:51.802] result() for ClusterFuture ... [18:41:51.802] - result already collected: FutureResult [18:41:51.802] result() for ClusterFuture ... done [18:41:51.802] result() for ClusterFuture ... [18:41:51.802] - result already collected: FutureResult [18:41:51.802] result() for ClusterFuture ... done [18:41:51.803] - Number of value chunks collected: 2 [18:41:51.803] Resolving 2 futures (chunks) ... DONE [18:41:51.803] Reducing values from 2 chunks ... [18:41:51.803] - Number of values collected after concatenation: 6 [18:41:51.803] - Number of values expected: 6 [18:41:51.803] Reducing values from 2 chunks ... DONE [18:41:51.804] future_lapply() ... DONE List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y1:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... List of 2 $ y0:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... $ y2:List of 6 ..$ a1: num [1:3, 1:5] 2 2 2 4 4 4 6 6 6 8 ... ..$ a2: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b1: num [1:3, 1:5] 4 4 4 8 8 8 12 12 12 16 ... ..$ b2: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c1: num [1:3, 1:5] 6 6 6 12 12 12 18 18 18 24 ... ..$ c2: num [1:3, 1:5] 8 8 8 16 16 16 24 24 24 32 ... [18:41:51.817] future_lapply() ... [18:41:51.820] Number of chunks: 2 [18:41:51.820] getGlobalsAndPackagesXApply() ... [18:41:51.820] - future.globals: TRUE [18:41:51.820] getGlobalsAndPackages() ... [18:41:51.820] Searching for globals... [18:41:51.822] - globals found: [1] 'FUN' [18:41:51.822] Searching for globals ... DONE [18:41:51.822] Resolving globals: FALSE [18:41:51.822] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:51.823] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:51.823] - globals: [1] 'FUN' [18:41:51.823] [18:41:51.823] getGlobalsAndPackages() ... DONE [18:41:51.824] - globals found/used: [n=1] 'FUN' [18:41:51.824] - needed namespaces: [n=0] [18:41:51.824] Finding globals ... DONE [18:41:51.824] - use_args: TRUE [18:41:51.824] - Getting '...' globals ... [18:41:51.825] resolve() on list ... [18:41:51.825] recursive: 0 [18:41:51.825] length: 1 [18:41:51.825] elements: '...' [18:41:51.825] length: 0 (resolved future 1) [18:41:51.826] resolve() on list ... DONE [18:41:51.826] - '...' content: [n=0] [18:41:51.826] List of 1 [18:41:51.826] $ ...: list() [18:41:51.826] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.826] - attr(*, "where")=List of 1 [18:41:51.826] ..$ ...: [18:41:51.826] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.826] - attr(*, "resolved")= logi TRUE [18:41:51.826] - attr(*, "total_size")= num NA [18:41:51.829] - Getting '...' globals ... DONE [18:41:51.829] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:51.829] List of 2 [18:41:51.829] $ ...future.FUN:function (x) [18:41:51.829] $ ... : list() [18:41:51.829] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.829] - attr(*, "where")=List of 2 [18:41:51.829] ..$ ...future.FUN: [18:41:51.829] ..$ ... : [18:41:51.829] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.829] - attr(*, "resolved")= logi FALSE [18:41:51.829] - attr(*, "total_size")= int 4942 [18:41:51.833] Packages to be attached in all futures: [n=0] [18:41:51.833] getGlobalsAndPackagesXApply() ... DONE [18:41:51.833] Number of futures (= number of chunks): 2 [18:41:51.833] Launching 2 futures (chunks) ... [18:41:51.834] Chunk #1 of 2 ... [18:41:51.834] - Finding globals in 'X' for chunk #1 ... [18:41:51.834] getGlobalsAndPackages() ... [18:41:51.834] Searching for globals... [18:41:51.835] [18:41:51.835] Searching for globals ... DONE [18:41:51.835] - globals: [0] [18:41:51.835] getGlobalsAndPackages() ... DONE [18:41:51.835] + additional globals found: [n=0] [18:41:51.835] + additional namespaces needed: [n=0] [18:41:51.836] - Finding globals in 'X' for chunk #1 ... DONE [18:41:51.836] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.836] - seeds: [18:41:51.836] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.836] getGlobalsAndPackages() ... [18:41:51.836] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.837] Resolving globals: FALSE [18:41:51.837] Tweak future expression to call with '...' arguments ... [18:41:51.837] { [18:41:51.837] do.call(function(...) { [18:41:51.837] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.837] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.837] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.837] on.exit(options(oopts), add = TRUE) [18:41:51.837] } [18:41:51.837] { [18:41:51.837] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.837] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.837] ...future.FUN(...future.X_jj, ...) [18:41:51.837] }) [18:41:51.837] } [18:41:51.837] }, args = future.call.arguments) [18:41:51.837] } [18:41:51.837] Tweak future expression to call with '...' arguments ... DONE [18:41:51.838] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.838] [18:41:51.838] getGlobalsAndPackages() ... DONE [18:41:51.839] run() for 'Future' ... [18:41:51.839] - state: 'created' [18:41:51.839] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.855] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.855] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.855] - Field: 'node' [18:41:51.855] - Field: 'label' [18:41:51.855] - Field: 'local' [18:41:51.856] - Field: 'owner' [18:41:51.856] - Field: 'envir' [18:41:51.856] - Field: 'workers' [18:41:51.856] - Field: 'packages' [18:41:51.856] - Field: 'gc' [18:41:51.857] - Field: 'conditions' [18:41:51.857] - Field: 'persistent' [18:41:51.857] - Field: 'expr' [18:41:51.857] - Field: 'uuid' [18:41:51.857] - Field: 'seed' [18:41:51.857] - Field: 'version' [18:41:51.858] - Field: 'result' [18:41:51.858] - Field: 'asynchronous' [18:41:51.858] - Field: 'calls' [18:41:51.858] - Field: 'globals' [18:41:51.858] - Field: 'stdout' [18:41:51.858] - Field: 'earlySignal' [18:41:51.859] - Field: 'lazy' [18:41:51.859] - Field: 'state' [18:41:51.859] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.859] - Launch lazy future ... [18:41:51.860] Packages needed by the future expression (n = 0): [18:41:51.860] Packages needed by future strategies (n = 0): [18:41:51.860] { [18:41:51.860] { [18:41:51.860] { [18:41:51.860] ...future.startTime <- base::Sys.time() [18:41:51.860] { [18:41:51.860] { [18:41:51.860] { [18:41:51.860] { [18:41:51.860] base::local({ [18:41:51.860] has_future <- base::requireNamespace("future", [18:41:51.860] quietly = TRUE) [18:41:51.860] if (has_future) { [18:41:51.860] ns <- base::getNamespace("future") [18:41:51.860] version <- ns[[".package"]][["version"]] [18:41:51.860] if (is.null(version)) [18:41:51.860] version <- utils::packageVersion("future") [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] version <- NULL [18:41:51.860] } [18:41:51.860] if (!has_future || version < "1.8.0") { [18:41:51.860] info <- base::c(r_version = base::gsub("R version ", [18:41:51.860] "", base::R.version$version.string), [18:41:51.860] platform = base::sprintf("%s (%s-bit)", [18:41:51.860] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.860] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.860] "release", "version")], collapse = " "), [18:41:51.860] hostname = base::Sys.info()[["nodename"]]) [18:41:51.860] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.860] info) [18:41:51.860] info <- base::paste(info, collapse = "; ") [18:41:51.860] if (!has_future) { [18:41:51.860] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.860] info) [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.860] info, version) [18:41:51.860] } [18:41:51.860] base::stop(msg) [18:41:51.860] } [18:41:51.860] }) [18:41:51.860] } [18:41:51.860] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.860] base::options(mc.cores = 1L) [18:41:51.860] } [18:41:51.860] ...future.strategy.old <- future::plan("list") [18:41:51.860] options(future.plan = NULL) [18:41:51.860] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.860] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.860] } [18:41:51.860] ...future.workdir <- getwd() [18:41:51.860] } [18:41:51.860] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.860] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.860] } [18:41:51.860] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.860] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.860] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.860] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.860] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.860] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.860] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.860] base::names(...future.oldOptions)) [18:41:51.860] } [18:41:51.860] if (FALSE) { [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] if (TRUE) { [18:41:51.860] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.860] open = "w") [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.860] windows = "NUL", "/dev/null"), open = "w") [18:41:51.860] } [18:41:51.860] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.860] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.860] base::sink(type = "output", split = FALSE) [18:41:51.860] base::close(...future.stdout) [18:41:51.860] }, add = TRUE) [18:41:51.860] } [18:41:51.860] ...future.frame <- base::sys.nframe() [18:41:51.860] ...future.conditions <- base::list() [18:41:51.860] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.860] if (FALSE) { [18:41:51.860] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.860] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.860] } [18:41:51.860] ...future.result <- base::tryCatch({ [18:41:51.860] base::withCallingHandlers({ [18:41:51.860] ...future.value <- base::withVisible(base::local({ [18:41:51.860] ...future.makeSendCondition <- base::local({ [18:41:51.860] sendCondition <- NULL [18:41:51.860] function(frame = 1L) { [18:41:51.860] if (is.function(sendCondition)) [18:41:51.860] return(sendCondition) [18:41:51.860] ns <- getNamespace("parallel") [18:41:51.860] if (exists("sendData", mode = "function", [18:41:51.860] envir = ns)) { [18:41:51.860] parallel_sendData <- get("sendData", mode = "function", [18:41:51.860] envir = ns) [18:41:51.860] envir <- sys.frame(frame) [18:41:51.860] master <- NULL [18:41:51.860] while (!identical(envir, .GlobalEnv) && [18:41:51.860] !identical(envir, emptyenv())) { [18:41:51.860] if (exists("master", mode = "list", envir = envir, [18:41:51.860] inherits = FALSE)) { [18:41:51.860] master <- get("master", mode = "list", [18:41:51.860] envir = envir, inherits = FALSE) [18:41:51.860] if (inherits(master, c("SOCKnode", [18:41:51.860] "SOCK0node"))) { [18:41:51.860] sendCondition <<- function(cond) { [18:41:51.860] data <- list(type = "VALUE", value = cond, [18:41:51.860] success = TRUE) [18:41:51.860] parallel_sendData(master, data) [18:41:51.860] } [18:41:51.860] return(sendCondition) [18:41:51.860] } [18:41:51.860] } [18:41:51.860] frame <- frame + 1L [18:41:51.860] envir <- sys.frame(frame) [18:41:51.860] } [18:41:51.860] } [18:41:51.860] sendCondition <<- function(cond) NULL [18:41:51.860] } [18:41:51.860] }) [18:41:51.860] withCallingHandlers({ [18:41:51.860] { [18:41:51.860] do.call(function(...) { [18:41:51.860] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.860] if (!identical(...future.globals.maxSize.org, [18:41:51.860] ...future.globals.maxSize)) { [18:41:51.860] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.860] on.exit(options(oopts), add = TRUE) [18:41:51.860] } [18:41:51.860] { [18:41:51.860] lapply(seq_along(...future.elements_ii), [18:41:51.860] FUN = function(jj) { [18:41:51.860] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.860] ...future.FUN(...future.X_jj, ...) [18:41:51.860] }) [18:41:51.860] } [18:41:51.860] }, args = future.call.arguments) [18:41:51.860] } [18:41:51.860] }, immediateCondition = function(cond) { [18:41:51.860] sendCondition <- ...future.makeSendCondition() [18:41:51.860] sendCondition(cond) [18:41:51.860] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.860] { [18:41:51.860] inherits <- base::inherits [18:41:51.860] invokeRestart <- base::invokeRestart [18:41:51.860] is.null <- base::is.null [18:41:51.860] muffled <- FALSE [18:41:51.860] if (inherits(cond, "message")) { [18:41:51.860] muffled <- grepl(pattern, "muffleMessage") [18:41:51.860] if (muffled) [18:41:51.860] invokeRestart("muffleMessage") [18:41:51.860] } [18:41:51.860] else if (inherits(cond, "warning")) { [18:41:51.860] muffled <- grepl(pattern, "muffleWarning") [18:41:51.860] if (muffled) [18:41:51.860] invokeRestart("muffleWarning") [18:41:51.860] } [18:41:51.860] else if (inherits(cond, "condition")) { [18:41:51.860] if (!is.null(pattern)) { [18:41:51.860] computeRestarts <- base::computeRestarts [18:41:51.860] grepl <- base::grepl [18:41:51.860] restarts <- computeRestarts(cond) [18:41:51.860] for (restart in restarts) { [18:41:51.860] name <- restart$name [18:41:51.860] if (is.null(name)) [18:41:51.860] next [18:41:51.860] if (!grepl(pattern, name)) [18:41:51.860] next [18:41:51.860] invokeRestart(restart) [18:41:51.860] muffled <- TRUE [18:41:51.860] break [18:41:51.860] } [18:41:51.860] } [18:41:51.860] } [18:41:51.860] invisible(muffled) [18:41:51.860] } [18:41:51.860] muffleCondition(cond) [18:41:51.860] }) [18:41:51.860] })) [18:41:51.860] future::FutureResult(value = ...future.value$value, [18:41:51.860] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.860] ...future.rng), globalenv = if (FALSE) [18:41:51.860] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.860] ...future.globalenv.names)) [18:41:51.860] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.860] }, condition = base::local({ [18:41:51.860] c <- base::c [18:41:51.860] inherits <- base::inherits [18:41:51.860] invokeRestart <- base::invokeRestart [18:41:51.860] length <- base::length [18:41:51.860] list <- base::list [18:41:51.860] seq.int <- base::seq.int [18:41:51.860] signalCondition <- base::signalCondition [18:41:51.860] sys.calls <- base::sys.calls [18:41:51.860] `[[` <- base::`[[` [18:41:51.860] `+` <- base::`+` [18:41:51.860] `<<-` <- base::`<<-` [18:41:51.860] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.860] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.860] 3L)] [18:41:51.860] } [18:41:51.860] function(cond) { [18:41:51.860] is_error <- inherits(cond, "error") [18:41:51.860] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.860] NULL) [18:41:51.860] if (is_error) { [18:41:51.860] sessionInformation <- function() { [18:41:51.860] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.860] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.860] search = base::search(), system = base::Sys.info()) [18:41:51.860] } [18:41:51.860] ...future.conditions[[length(...future.conditions) + [18:41:51.860] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.860] cond$call), session = sessionInformation(), [18:41:51.860] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.860] signalCondition(cond) [18:41:51.860] } [18:41:51.860] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.860] "immediateCondition"))) { [18:41:51.860] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.860] ...future.conditions[[length(...future.conditions) + [18:41:51.860] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.860] if (TRUE && !signal) { [18:41:51.860] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.860] { [18:41:51.860] inherits <- base::inherits [18:41:51.860] invokeRestart <- base::invokeRestart [18:41:51.860] is.null <- base::is.null [18:41:51.860] muffled <- FALSE [18:41:51.860] if (inherits(cond, "message")) { [18:41:51.860] muffled <- grepl(pattern, "muffleMessage") [18:41:51.860] if (muffled) [18:41:51.860] invokeRestart("muffleMessage") [18:41:51.860] } [18:41:51.860] else if (inherits(cond, "warning")) { [18:41:51.860] muffled <- grepl(pattern, "muffleWarning") [18:41:51.860] if (muffled) [18:41:51.860] invokeRestart("muffleWarning") [18:41:51.860] } [18:41:51.860] else if (inherits(cond, "condition")) { [18:41:51.860] if (!is.null(pattern)) { [18:41:51.860] computeRestarts <- base::computeRestarts [18:41:51.860] grepl <- base::grepl [18:41:51.860] restarts <- computeRestarts(cond) [18:41:51.860] for (restart in restarts) { [18:41:51.860] name <- restart$name [18:41:51.860] if (is.null(name)) [18:41:51.860] next [18:41:51.860] if (!grepl(pattern, name)) [18:41:51.860] next [18:41:51.860] invokeRestart(restart) [18:41:51.860] muffled <- TRUE [18:41:51.860] break [18:41:51.860] } [18:41:51.860] } [18:41:51.860] } [18:41:51.860] invisible(muffled) [18:41:51.860] } [18:41:51.860] muffleCondition(cond, pattern = "^muffle") [18:41:51.860] } [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] if (TRUE) { [18:41:51.860] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.860] { [18:41:51.860] inherits <- base::inherits [18:41:51.860] invokeRestart <- base::invokeRestart [18:41:51.860] is.null <- base::is.null [18:41:51.860] muffled <- FALSE [18:41:51.860] if (inherits(cond, "message")) { [18:41:51.860] muffled <- grepl(pattern, "muffleMessage") [18:41:51.860] if (muffled) [18:41:51.860] invokeRestart("muffleMessage") [18:41:51.860] } [18:41:51.860] else if (inherits(cond, "warning")) { [18:41:51.860] muffled <- grepl(pattern, "muffleWarning") [18:41:51.860] if (muffled) [18:41:51.860] invokeRestart("muffleWarning") [18:41:51.860] } [18:41:51.860] else if (inherits(cond, "condition")) { [18:41:51.860] if (!is.null(pattern)) { [18:41:51.860] computeRestarts <- base::computeRestarts [18:41:51.860] grepl <- base::grepl [18:41:51.860] restarts <- computeRestarts(cond) [18:41:51.860] for (restart in restarts) { [18:41:51.860] name <- restart$name [18:41:51.860] if (is.null(name)) [18:41:51.860] next [18:41:51.860] if (!grepl(pattern, name)) [18:41:51.860] next [18:41:51.860] invokeRestart(restart) [18:41:51.860] muffled <- TRUE [18:41:51.860] break [18:41:51.860] } [18:41:51.860] } [18:41:51.860] } [18:41:51.860] invisible(muffled) [18:41:51.860] } [18:41:51.860] muffleCondition(cond, pattern = "^muffle") [18:41:51.860] } [18:41:51.860] } [18:41:51.860] } [18:41:51.860] })) [18:41:51.860] }, error = function(ex) { [18:41:51.860] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.860] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.860] ...future.rng), started = ...future.startTime, [18:41:51.860] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.860] version = "1.8"), class = "FutureResult") [18:41:51.860] }, finally = { [18:41:51.860] if (!identical(...future.workdir, getwd())) [18:41:51.860] setwd(...future.workdir) [18:41:51.860] { [18:41:51.860] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.860] ...future.oldOptions$nwarnings <- NULL [18:41:51.860] } [18:41:51.860] base::options(...future.oldOptions) [18:41:51.860] if (.Platform$OS.type == "windows") { [18:41:51.860] old_names <- names(...future.oldEnvVars) [18:41:51.860] envs <- base::Sys.getenv() [18:41:51.860] names <- names(envs) [18:41:51.860] common <- intersect(names, old_names) [18:41:51.860] added <- setdiff(names, old_names) [18:41:51.860] removed <- setdiff(old_names, names) [18:41:51.860] changed <- common[...future.oldEnvVars[common] != [18:41:51.860] envs[common]] [18:41:51.860] NAMES <- toupper(changed) [18:41:51.860] args <- list() [18:41:51.860] for (kk in seq_along(NAMES)) { [18:41:51.860] name <- changed[[kk]] [18:41:51.860] NAME <- NAMES[[kk]] [18:41:51.860] if (name != NAME && is.element(NAME, old_names)) [18:41:51.860] next [18:41:51.860] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.860] } [18:41:51.860] NAMES <- toupper(added) [18:41:51.860] for (kk in seq_along(NAMES)) { [18:41:51.860] name <- added[[kk]] [18:41:51.860] NAME <- NAMES[[kk]] [18:41:51.860] if (name != NAME && is.element(NAME, old_names)) [18:41:51.860] next [18:41:51.860] args[[name]] <- "" [18:41:51.860] } [18:41:51.860] NAMES <- toupper(removed) [18:41:51.860] for (kk in seq_along(NAMES)) { [18:41:51.860] name <- removed[[kk]] [18:41:51.860] NAME <- NAMES[[kk]] [18:41:51.860] if (name != NAME && is.element(NAME, old_names)) [18:41:51.860] next [18:41:51.860] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.860] } [18:41:51.860] if (length(args) > 0) [18:41:51.860] base::do.call(base::Sys.setenv, args = args) [18:41:51.860] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.860] } [18:41:51.860] { [18:41:51.860] if (base::length(...future.futureOptionsAdded) > [18:41:51.860] 0L) { [18:41:51.860] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.860] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.860] base::options(opts) [18:41:51.860] } [18:41:51.860] { [18:41:51.860] { [18:41:51.860] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.860] NULL [18:41:51.860] } [18:41:51.860] options(future.plan = NULL) [18:41:51.860] if (is.na(NA_character_)) [18:41:51.860] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.860] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.860] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.860] .init = FALSE) [18:41:51.860] } [18:41:51.860] } [18:41:51.860] } [18:41:51.860] }) [18:41:51.860] if (TRUE) { [18:41:51.860] base::sink(type = "output", split = FALSE) [18:41:51.860] if (TRUE) { [18:41:51.860] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.860] } [18:41:51.860] else { [18:41:51.860] ...future.result["stdout"] <- base::list(NULL) [18:41:51.860] } [18:41:51.860] base::close(...future.stdout) [18:41:51.860] ...future.stdout <- NULL [18:41:51.860] } [18:41:51.860] ...future.result$conditions <- ...future.conditions [18:41:51.860] ...future.result$finished <- base::Sys.time() [18:41:51.860] ...future.result [18:41:51.860] } [18:41:51.866] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:51.866] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:51.866] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:51.867] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.867] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.867] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.868] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.868] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.868] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.868] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.869] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.869] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:51.870] MultisessionFuture started [18:41:51.870] - Launch lazy future ... done [18:41:51.870] run() for 'MultisessionFuture' ... done [18:41:51.870] Created future: [18:41:51.886] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.886] - Validating connection of MultisessionFuture [18:41:51.886] - received message: FutureResult [18:41:51.887] - Received FutureResult [18:41:51.887] - Erased future from FutureRegistry [18:41:51.887] result() for ClusterFuture ... [18:41:51.887] - result already collected: FutureResult [18:41:51.887] result() for ClusterFuture ... done [18:41:51.887] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.870] MultisessionFuture: [18:41:51.870] Label: 'future_sapply-1' [18:41:51.870] Expression: [18:41:51.870] { [18:41:51.870] do.call(function(...) { [18:41:51.870] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.870] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.870] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.870] on.exit(options(oopts), add = TRUE) [18:41:51.870] } [18:41:51.870] { [18:41:51.870] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.870] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.870] ...future.FUN(...future.X_jj, ...) [18:41:51.870] }) [18:41:51.870] } [18:41:51.870] }, args = future.call.arguments) [18:41:51.870] } [18:41:51.870] Lazy evaluation: FALSE [18:41:51.870] Asynchronous evaluation: TRUE [18:41:51.870] Local evaluation: TRUE [18:41:51.870] Environment: R_GlobalEnv [18:41:51.870] Capture standard output: TRUE [18:41:51.870] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.870] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.870] Packages: [18:41:51.870] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.870] Resolved: TRUE [18:41:51.870] Value: [18:41:51.870] Conditions captured: [18:41:51.870] Early signaling: FALSE [18:41:51.870] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.870] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.888] Chunk #1 of 2 ... DONE [18:41:51.888] Chunk #2 of 2 ... [18:41:51.888] - Finding globals in 'X' for chunk #2 ... [18:41:51.888] getGlobalsAndPackages() ... [18:41:51.889] Searching for globals... [18:41:51.889] [18:41:51.889] Searching for globals ... DONE [18:41:51.889] - globals: [0] [18:41:51.889] getGlobalsAndPackages() ... DONE [18:41:51.890] + additional globals found: [n=0] [18:41:51.890] + additional namespaces needed: [n=0] [18:41:51.890] - Finding globals in 'X' for chunk #2 ... DONE [18:41:51.890] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:51.890] - seeds: [18:41:51.890] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.891] getGlobalsAndPackages() ... [18:41:51.891] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.891] Resolving globals: FALSE [18:41:51.891] Tweak future expression to call with '...' arguments ... [18:41:51.891] { [18:41:51.891] do.call(function(...) { [18:41:51.891] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.891] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.891] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.891] on.exit(options(oopts), add = TRUE) [18:41:51.891] } [18:41:51.891] { [18:41:51.891] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.891] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.891] ...future.FUN(...future.X_jj, ...) [18:41:51.891] }) [18:41:51.891] } [18:41:51.891] }, args = future.call.arguments) [18:41:51.891] } [18:41:51.892] Tweak future expression to call with '...' arguments ... DONE [18:41:51.892] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:51.892] [18:41:51.893] getGlobalsAndPackages() ... DONE [18:41:51.893] run() for 'Future' ... [18:41:51.893] - state: 'created' [18:41:51.893] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:51.909] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.909] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:51.909] - Field: 'node' [18:41:51.909] - Field: 'label' [18:41:51.910] - Field: 'local' [18:41:51.910] - Field: 'owner' [18:41:51.910] - Field: 'envir' [18:41:51.910] - Field: 'workers' [18:41:51.910] - Field: 'packages' [18:41:51.910] - Field: 'gc' [18:41:51.911] - Field: 'conditions' [18:41:51.911] - Field: 'persistent' [18:41:51.911] - Field: 'expr' [18:41:51.911] - Field: 'uuid' [18:41:51.911] - Field: 'seed' [18:41:51.912] - Field: 'version' [18:41:51.912] - Field: 'result' [18:41:51.912] - Field: 'asynchronous' [18:41:51.912] - Field: 'calls' [18:41:51.912] - Field: 'globals' [18:41:51.912] - Field: 'stdout' [18:41:51.913] - Field: 'earlySignal' [18:41:51.913] - Field: 'lazy' [18:41:51.913] - Field: 'state' [18:41:51.913] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:51.913] - Launch lazy future ... [18:41:51.914] Packages needed by the future expression (n = 0): [18:41:51.914] Packages needed by future strategies (n = 0): [18:41:51.914] { [18:41:51.914] { [18:41:51.914] { [18:41:51.914] ...future.startTime <- base::Sys.time() [18:41:51.914] { [18:41:51.914] { [18:41:51.914] { [18:41:51.914] { [18:41:51.914] base::local({ [18:41:51.914] has_future <- base::requireNamespace("future", [18:41:51.914] quietly = TRUE) [18:41:51.914] if (has_future) { [18:41:51.914] ns <- base::getNamespace("future") [18:41:51.914] version <- ns[[".package"]][["version"]] [18:41:51.914] if (is.null(version)) [18:41:51.914] version <- utils::packageVersion("future") [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] version <- NULL [18:41:51.914] } [18:41:51.914] if (!has_future || version < "1.8.0") { [18:41:51.914] info <- base::c(r_version = base::gsub("R version ", [18:41:51.914] "", base::R.version$version.string), [18:41:51.914] platform = base::sprintf("%s (%s-bit)", [18:41:51.914] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:51.914] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:51.914] "release", "version")], collapse = " "), [18:41:51.914] hostname = base::Sys.info()[["nodename"]]) [18:41:51.914] info <- base::sprintf("%s: %s", base::names(info), [18:41:51.914] info) [18:41:51.914] info <- base::paste(info, collapse = "; ") [18:41:51.914] if (!has_future) { [18:41:51.914] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:51.914] info) [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:51.914] info, version) [18:41:51.914] } [18:41:51.914] base::stop(msg) [18:41:51.914] } [18:41:51.914] }) [18:41:51.914] } [18:41:51.914] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:51.914] base::options(mc.cores = 1L) [18:41:51.914] } [18:41:51.914] ...future.strategy.old <- future::plan("list") [18:41:51.914] options(future.plan = NULL) [18:41:51.914] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.914] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:51.914] } [18:41:51.914] ...future.workdir <- getwd() [18:41:51.914] } [18:41:51.914] ...future.oldOptions <- base::as.list(base::.Options) [18:41:51.914] ...future.oldEnvVars <- base::Sys.getenv() [18:41:51.914] } [18:41:51.914] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:51.914] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:51.914] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:51.914] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:51.914] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:51.914] future.stdout.windows.reencode = NULL, width = 80L) [18:41:51.914] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:51.914] base::names(...future.oldOptions)) [18:41:51.914] } [18:41:51.914] if (FALSE) { [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] if (TRUE) { [18:41:51.914] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:51.914] open = "w") [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:51.914] windows = "NUL", "/dev/null"), open = "w") [18:41:51.914] } [18:41:51.914] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:51.914] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:51.914] base::sink(type = "output", split = FALSE) [18:41:51.914] base::close(...future.stdout) [18:41:51.914] }, add = TRUE) [18:41:51.914] } [18:41:51.914] ...future.frame <- base::sys.nframe() [18:41:51.914] ...future.conditions <- base::list() [18:41:51.914] ...future.rng <- base::globalenv()$.Random.seed [18:41:51.914] if (FALSE) { [18:41:51.914] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:51.914] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:51.914] } [18:41:51.914] ...future.result <- base::tryCatch({ [18:41:51.914] base::withCallingHandlers({ [18:41:51.914] ...future.value <- base::withVisible(base::local({ [18:41:51.914] ...future.makeSendCondition <- base::local({ [18:41:51.914] sendCondition <- NULL [18:41:51.914] function(frame = 1L) { [18:41:51.914] if (is.function(sendCondition)) [18:41:51.914] return(sendCondition) [18:41:51.914] ns <- getNamespace("parallel") [18:41:51.914] if (exists("sendData", mode = "function", [18:41:51.914] envir = ns)) { [18:41:51.914] parallel_sendData <- get("sendData", mode = "function", [18:41:51.914] envir = ns) [18:41:51.914] envir <- sys.frame(frame) [18:41:51.914] master <- NULL [18:41:51.914] while (!identical(envir, .GlobalEnv) && [18:41:51.914] !identical(envir, emptyenv())) { [18:41:51.914] if (exists("master", mode = "list", envir = envir, [18:41:51.914] inherits = FALSE)) { [18:41:51.914] master <- get("master", mode = "list", [18:41:51.914] envir = envir, inherits = FALSE) [18:41:51.914] if (inherits(master, c("SOCKnode", [18:41:51.914] "SOCK0node"))) { [18:41:51.914] sendCondition <<- function(cond) { [18:41:51.914] data <- list(type = "VALUE", value = cond, [18:41:51.914] success = TRUE) [18:41:51.914] parallel_sendData(master, data) [18:41:51.914] } [18:41:51.914] return(sendCondition) [18:41:51.914] } [18:41:51.914] } [18:41:51.914] frame <- frame + 1L [18:41:51.914] envir <- sys.frame(frame) [18:41:51.914] } [18:41:51.914] } [18:41:51.914] sendCondition <<- function(cond) NULL [18:41:51.914] } [18:41:51.914] }) [18:41:51.914] withCallingHandlers({ [18:41:51.914] { [18:41:51.914] do.call(function(...) { [18:41:51.914] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.914] if (!identical(...future.globals.maxSize.org, [18:41:51.914] ...future.globals.maxSize)) { [18:41:51.914] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.914] on.exit(options(oopts), add = TRUE) [18:41:51.914] } [18:41:51.914] { [18:41:51.914] lapply(seq_along(...future.elements_ii), [18:41:51.914] FUN = function(jj) { [18:41:51.914] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.914] ...future.FUN(...future.X_jj, ...) [18:41:51.914] }) [18:41:51.914] } [18:41:51.914] }, args = future.call.arguments) [18:41:51.914] } [18:41:51.914] }, immediateCondition = function(cond) { [18:41:51.914] sendCondition <- ...future.makeSendCondition() [18:41:51.914] sendCondition(cond) [18:41:51.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.914] { [18:41:51.914] inherits <- base::inherits [18:41:51.914] invokeRestart <- base::invokeRestart [18:41:51.914] is.null <- base::is.null [18:41:51.914] muffled <- FALSE [18:41:51.914] if (inherits(cond, "message")) { [18:41:51.914] muffled <- grepl(pattern, "muffleMessage") [18:41:51.914] if (muffled) [18:41:51.914] invokeRestart("muffleMessage") [18:41:51.914] } [18:41:51.914] else if (inherits(cond, "warning")) { [18:41:51.914] muffled <- grepl(pattern, "muffleWarning") [18:41:51.914] if (muffled) [18:41:51.914] invokeRestart("muffleWarning") [18:41:51.914] } [18:41:51.914] else if (inherits(cond, "condition")) { [18:41:51.914] if (!is.null(pattern)) { [18:41:51.914] computeRestarts <- base::computeRestarts [18:41:51.914] grepl <- base::grepl [18:41:51.914] restarts <- computeRestarts(cond) [18:41:51.914] for (restart in restarts) { [18:41:51.914] name <- restart$name [18:41:51.914] if (is.null(name)) [18:41:51.914] next [18:41:51.914] if (!grepl(pattern, name)) [18:41:51.914] next [18:41:51.914] invokeRestart(restart) [18:41:51.914] muffled <- TRUE [18:41:51.914] break [18:41:51.914] } [18:41:51.914] } [18:41:51.914] } [18:41:51.914] invisible(muffled) [18:41:51.914] } [18:41:51.914] muffleCondition(cond) [18:41:51.914] }) [18:41:51.914] })) [18:41:51.914] future::FutureResult(value = ...future.value$value, [18:41:51.914] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.914] ...future.rng), globalenv = if (FALSE) [18:41:51.914] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:51.914] ...future.globalenv.names)) [18:41:51.914] else NULL, started = ...future.startTime, version = "1.8") [18:41:51.914] }, condition = base::local({ [18:41:51.914] c <- base::c [18:41:51.914] inherits <- base::inherits [18:41:51.914] invokeRestart <- base::invokeRestart [18:41:51.914] length <- base::length [18:41:51.914] list <- base::list [18:41:51.914] seq.int <- base::seq.int [18:41:51.914] signalCondition <- base::signalCondition [18:41:51.914] sys.calls <- base::sys.calls [18:41:51.914] `[[` <- base::`[[` [18:41:51.914] `+` <- base::`+` [18:41:51.914] `<<-` <- base::`<<-` [18:41:51.914] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:51.914] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:51.914] 3L)] [18:41:51.914] } [18:41:51.914] function(cond) { [18:41:51.914] is_error <- inherits(cond, "error") [18:41:51.914] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:51.914] NULL) [18:41:51.914] if (is_error) { [18:41:51.914] sessionInformation <- function() { [18:41:51.914] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:51.914] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:51.914] search = base::search(), system = base::Sys.info()) [18:41:51.914] } [18:41:51.914] ...future.conditions[[length(...future.conditions) + [18:41:51.914] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:51.914] cond$call), session = sessionInformation(), [18:41:51.914] timestamp = base::Sys.time(), signaled = 0L) [18:41:51.914] signalCondition(cond) [18:41:51.914] } [18:41:51.914] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:51.914] "immediateCondition"))) { [18:41:51.914] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:51.914] ...future.conditions[[length(...future.conditions) + [18:41:51.914] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:51.914] if (TRUE && !signal) { [18:41:51.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.914] { [18:41:51.914] inherits <- base::inherits [18:41:51.914] invokeRestart <- base::invokeRestart [18:41:51.914] is.null <- base::is.null [18:41:51.914] muffled <- FALSE [18:41:51.914] if (inherits(cond, "message")) { [18:41:51.914] muffled <- grepl(pattern, "muffleMessage") [18:41:51.914] if (muffled) [18:41:51.914] invokeRestart("muffleMessage") [18:41:51.914] } [18:41:51.914] else if (inherits(cond, "warning")) { [18:41:51.914] muffled <- grepl(pattern, "muffleWarning") [18:41:51.914] if (muffled) [18:41:51.914] invokeRestart("muffleWarning") [18:41:51.914] } [18:41:51.914] else if (inherits(cond, "condition")) { [18:41:51.914] if (!is.null(pattern)) { [18:41:51.914] computeRestarts <- base::computeRestarts [18:41:51.914] grepl <- base::grepl [18:41:51.914] restarts <- computeRestarts(cond) [18:41:51.914] for (restart in restarts) { [18:41:51.914] name <- restart$name [18:41:51.914] if (is.null(name)) [18:41:51.914] next [18:41:51.914] if (!grepl(pattern, name)) [18:41:51.914] next [18:41:51.914] invokeRestart(restart) [18:41:51.914] muffled <- TRUE [18:41:51.914] break [18:41:51.914] } [18:41:51.914] } [18:41:51.914] } [18:41:51.914] invisible(muffled) [18:41:51.914] } [18:41:51.914] muffleCondition(cond, pattern = "^muffle") [18:41:51.914] } [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] if (TRUE) { [18:41:51.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:51.914] { [18:41:51.914] inherits <- base::inherits [18:41:51.914] invokeRestart <- base::invokeRestart [18:41:51.914] is.null <- base::is.null [18:41:51.914] muffled <- FALSE [18:41:51.914] if (inherits(cond, "message")) { [18:41:51.914] muffled <- grepl(pattern, "muffleMessage") [18:41:51.914] if (muffled) [18:41:51.914] invokeRestart("muffleMessage") [18:41:51.914] } [18:41:51.914] else if (inherits(cond, "warning")) { [18:41:51.914] muffled <- grepl(pattern, "muffleWarning") [18:41:51.914] if (muffled) [18:41:51.914] invokeRestart("muffleWarning") [18:41:51.914] } [18:41:51.914] else if (inherits(cond, "condition")) { [18:41:51.914] if (!is.null(pattern)) { [18:41:51.914] computeRestarts <- base::computeRestarts [18:41:51.914] grepl <- base::grepl [18:41:51.914] restarts <- computeRestarts(cond) [18:41:51.914] for (restart in restarts) { [18:41:51.914] name <- restart$name [18:41:51.914] if (is.null(name)) [18:41:51.914] next [18:41:51.914] if (!grepl(pattern, name)) [18:41:51.914] next [18:41:51.914] invokeRestart(restart) [18:41:51.914] muffled <- TRUE [18:41:51.914] break [18:41:51.914] } [18:41:51.914] } [18:41:51.914] } [18:41:51.914] invisible(muffled) [18:41:51.914] } [18:41:51.914] muffleCondition(cond, pattern = "^muffle") [18:41:51.914] } [18:41:51.914] } [18:41:51.914] } [18:41:51.914] })) [18:41:51.914] }, error = function(ex) { [18:41:51.914] base::structure(base::list(value = NULL, visible = NULL, [18:41:51.914] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:51.914] ...future.rng), started = ...future.startTime, [18:41:51.914] finished = Sys.time(), session_uuid = NA_character_, [18:41:51.914] version = "1.8"), class = "FutureResult") [18:41:51.914] }, finally = { [18:41:51.914] if (!identical(...future.workdir, getwd())) [18:41:51.914] setwd(...future.workdir) [18:41:51.914] { [18:41:51.914] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:51.914] ...future.oldOptions$nwarnings <- NULL [18:41:51.914] } [18:41:51.914] base::options(...future.oldOptions) [18:41:51.914] if (.Platform$OS.type == "windows") { [18:41:51.914] old_names <- names(...future.oldEnvVars) [18:41:51.914] envs <- base::Sys.getenv() [18:41:51.914] names <- names(envs) [18:41:51.914] common <- intersect(names, old_names) [18:41:51.914] added <- setdiff(names, old_names) [18:41:51.914] removed <- setdiff(old_names, names) [18:41:51.914] changed <- common[...future.oldEnvVars[common] != [18:41:51.914] envs[common]] [18:41:51.914] NAMES <- toupper(changed) [18:41:51.914] args <- list() [18:41:51.914] for (kk in seq_along(NAMES)) { [18:41:51.914] name <- changed[[kk]] [18:41:51.914] NAME <- NAMES[[kk]] [18:41:51.914] if (name != NAME && is.element(NAME, old_names)) [18:41:51.914] next [18:41:51.914] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.914] } [18:41:51.914] NAMES <- toupper(added) [18:41:51.914] for (kk in seq_along(NAMES)) { [18:41:51.914] name <- added[[kk]] [18:41:51.914] NAME <- NAMES[[kk]] [18:41:51.914] if (name != NAME && is.element(NAME, old_names)) [18:41:51.914] next [18:41:51.914] args[[name]] <- "" [18:41:51.914] } [18:41:51.914] NAMES <- toupper(removed) [18:41:51.914] for (kk in seq_along(NAMES)) { [18:41:51.914] name <- removed[[kk]] [18:41:51.914] NAME <- NAMES[[kk]] [18:41:51.914] if (name != NAME && is.element(NAME, old_names)) [18:41:51.914] next [18:41:51.914] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:51.914] } [18:41:51.914] if (length(args) > 0) [18:41:51.914] base::do.call(base::Sys.setenv, args = args) [18:41:51.914] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:51.914] } [18:41:51.914] { [18:41:51.914] if (base::length(...future.futureOptionsAdded) > [18:41:51.914] 0L) { [18:41:51.914] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:51.914] base::names(opts) <- ...future.futureOptionsAdded [18:41:51.914] base::options(opts) [18:41:51.914] } [18:41:51.914] { [18:41:51.914] { [18:41:51.914] base::options(mc.cores = ...future.mc.cores.old) [18:41:51.914] NULL [18:41:51.914] } [18:41:51.914] options(future.plan = NULL) [18:41:51.914] if (is.na(NA_character_)) [18:41:51.914] Sys.unsetenv("R_FUTURE_PLAN") [18:41:51.914] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:51.914] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:51.914] .init = FALSE) [18:41:51.914] } [18:41:51.914] } [18:41:51.914] } [18:41:51.914] }) [18:41:51.914] if (TRUE) { [18:41:51.914] base::sink(type = "output", split = FALSE) [18:41:51.914] if (TRUE) { [18:41:51.914] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:51.914] } [18:41:51.914] else { [18:41:51.914] ...future.result["stdout"] <- base::list(NULL) [18:41:51.914] } [18:41:51.914] base::close(...future.stdout) [18:41:51.914] ...future.stdout <- NULL [18:41:51.914] } [18:41:51.914] ...future.result$conditions <- ...future.conditions [18:41:51.914] ...future.result$finished <- base::Sys.time() [18:41:51.914] ...future.result [18:41:51.914] } [18:41:51.920] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:51.920] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:51.920] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:51.921] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:51.921] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:51.921] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:51.922] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:51.922] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:51.922] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:51.922] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:51.923] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:51.923] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:51.924] MultisessionFuture started [18:41:51.924] - Launch lazy future ... done [18:41:51.924] run() for 'MultisessionFuture' ... done [18:41:51.924] Created future: [18:41:51.938] receiveMessageFromWorker() for ClusterFuture ... [18:41:51.939] - Validating connection of MultisessionFuture [18:41:51.939] - received message: FutureResult [18:41:51.940] - Received FutureResult [18:41:51.940] - Erased future from FutureRegistry [18:41:51.940] result() for ClusterFuture ... [18:41:51.941] - result already collected: FutureResult [18:41:51.941] result() for ClusterFuture ... done [18:41:51.941] receiveMessageFromWorker() for ClusterFuture ... done [18:41:51.924] MultisessionFuture: [18:41:51.924] Label: 'future_sapply-2' [18:41:51.924] Expression: [18:41:51.924] { [18:41:51.924] do.call(function(...) { [18:41:51.924] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:51.924] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:51.924] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:51.924] on.exit(options(oopts), add = TRUE) [18:41:51.924] } [18:41:51.924] { [18:41:51.924] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:51.924] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:51.924] ...future.FUN(...future.X_jj, ...) [18:41:51.924] }) [18:41:51.924] } [18:41:51.924] }, args = future.call.arguments) [18:41:51.924] } [18:41:51.924] Lazy evaluation: FALSE [18:41:51.924] Asynchronous evaluation: TRUE [18:41:51.924] Local evaluation: TRUE [18:41:51.924] Environment: R_GlobalEnv [18:41:51.924] Capture standard output: TRUE [18:41:51.924] Capture condition classes: 'condition' (excluding 'nothing') [18:41:51.924] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:51.924] Packages: [18:41:51.924] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:51.924] Resolved: TRUE [18:41:51.924] Value: [18:41:51.924] Conditions captured: [18:41:51.924] Early signaling: FALSE [18:41:51.924] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:51.924] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:51.942] Chunk #2 of 2 ... DONE [18:41:51.942] Launching 2 futures (chunks) ... DONE [18:41:51.943] Resolving 2 futures (chunks) ... [18:41:51.943] resolve() on list ... [18:41:51.943] recursive: 0 [18:41:51.944] length: 2 [18:41:51.944] [18:41:51.944] Future #1 [18:41:51.944] result() for ClusterFuture ... [18:41:51.945] - result already collected: FutureResult [18:41:51.945] result() for ClusterFuture ... done [18:41:51.945] result() for ClusterFuture ... [18:41:51.946] - result already collected: FutureResult [18:41:51.946] result() for ClusterFuture ... done [18:41:51.946] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:51.947] - nx: 2 [18:41:51.947] - relay: TRUE [18:41:51.947] - stdout: TRUE [18:41:51.947] - signal: TRUE [18:41:51.948] - resignal: FALSE [18:41:51.948] - force: TRUE [18:41:51.948] - relayed: [n=2] FALSE, FALSE [18:41:51.949] - queued futures: [n=2] FALSE, FALSE [18:41:51.949] - until=1 [18:41:51.949] - relaying element #1 [18:41:51.949] result() for ClusterFuture ... [18:41:51.950] - result already collected: FutureResult [18:41:51.950] result() for ClusterFuture ... done [18:41:51.950] result() for ClusterFuture ... [18:41:51.951] - result already collected: FutureResult [18:41:51.951] result() for ClusterFuture ... done [18:41:51.951] result() for ClusterFuture ... [18:41:51.952] - result already collected: FutureResult [18:41:51.952] result() for ClusterFuture ... done [18:41:51.952] result() for ClusterFuture ... [18:41:51.952] - result already collected: FutureResult [18:41:51.953] result() for ClusterFuture ... done [18:41:51.953] - relayed: [n=2] TRUE, FALSE [18:41:51.953] - queued futures: [n=2] TRUE, FALSE [18:41:51.954] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:51.954] length: 1 (resolved future 1) [18:41:51.954] Future #2 [18:41:51.955] result() for ClusterFuture ... [18:41:51.955] - result already collected: FutureResult [18:41:51.955] result() for ClusterFuture ... done [18:41:51.955] result() for ClusterFuture ... [18:41:51.956] - result already collected: FutureResult [18:41:51.956] result() for ClusterFuture ... done [18:41:51.956] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:51.957] - nx: 2 [18:41:51.957] - relay: TRUE [18:41:51.957] - stdout: TRUE [18:41:51.958] - signal: TRUE [18:41:51.958] - resignal: FALSE [18:41:51.958] - force: TRUE [18:41:51.958] - relayed: [n=2] TRUE, FALSE [18:41:51.959] - queued futures: [n=2] TRUE, FALSE [18:41:51.959] - until=2 [18:41:51.964] - relaying element #2 [18:41:51.965] result() for ClusterFuture ... [18:41:51.965] - result already collected: FutureResult [18:41:51.965] result() for ClusterFuture ... done [18:41:51.966] result() for ClusterFuture ... [18:41:51.966] - result already collected: FutureResult [18:41:51.966] result() for ClusterFuture ... done [18:41:51.967] result() for ClusterFuture ... [18:41:51.967] - result already collected: FutureResult [18:41:51.967] result() for ClusterFuture ... done [18:41:51.967] result() for ClusterFuture ... [18:41:51.968] - result already collected: FutureResult [18:41:51.968] result() for ClusterFuture ... done [18:41:51.968] - relayed: [n=2] TRUE, TRUE [18:41:51.969] - queued futures: [n=2] TRUE, TRUE [18:41:51.969] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:51.969] length: 0 (resolved future 2) [18:41:51.970] Relaying remaining futures [18:41:51.970] signalConditionsASAP(NULL, pos=0) ... [18:41:51.970] - nx: 2 [18:41:51.970] - relay: TRUE [18:41:51.971] - stdout: TRUE [18:41:51.971] - signal: TRUE [18:41:51.971] - resignal: FALSE [18:41:51.971] - force: TRUE [18:41:51.972] - relayed: [n=2] TRUE, TRUE [18:41:51.972] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:51.972] - relayed: [n=2] TRUE, TRUE [18:41:51.973] - queued futures: [n=2] TRUE, TRUE [18:41:51.973] signalConditionsASAP(NULL, pos=0) ... done [18:41:51.973] resolve() on list ... DONE [18:41:51.974] result() for ClusterFuture ... [18:41:51.974] - result already collected: FutureResult [18:41:51.974] result() for ClusterFuture ... done [18:41:51.974] result() for ClusterFuture ... [18:41:51.975] - result already collected: FutureResult [18:41:51.975] result() for ClusterFuture ... done [18:41:51.975] result() for ClusterFuture ... [18:41:51.976] - result already collected: FutureResult [18:41:51.976] result() for ClusterFuture ... done [18:41:51.976] result() for ClusterFuture ... [18:41:51.977] - result already collected: FutureResult [18:41:51.977] result() for ClusterFuture ... done [18:41:51.977] - Number of value chunks collected: 2 [18:41:51.977] Resolving 2 futures (chunks) ... DONE [18:41:51.978] Reducing values from 2 chunks ... [18:41:51.978] - Number of values collected after concatenation: 6 [18:41:51.978] - Number of values expected: 6 [18:41:51.979] Reducing values from 2 chunks ... DONE [18:41:51.979] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:51.983] future_lapply() ... [18:41:51.988] Number of chunks: 2 [18:41:51.988] getGlobalsAndPackagesXApply() ... [18:41:51.989] - future.globals: TRUE [18:41:51.989] getGlobalsAndPackages() ... [18:41:51.989] Searching for globals... [18:41:51.992] - globals found: [2] 'FUN', 'UseMethod' [18:41:51.992] Searching for globals ... DONE [18:41:51.992] Resolving globals: FALSE [18:41:51.993] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:51.994] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:51.994] - globals: [1] 'FUN' [18:41:51.994] [18:41:51.995] getGlobalsAndPackages() ... DONE [18:41:51.995] - globals found/used: [n=1] 'FUN' [18:41:51.995] - needed namespaces: [n=0] [18:41:51.996] Finding globals ... DONE [18:41:51.996] - use_args: TRUE [18:41:51.996] - Getting '...' globals ... [18:41:51.997] resolve() on list ... [18:41:51.997] recursive: 0 [18:41:51.998] length: 1 [18:41:51.998] elements: '...' [18:41:51.998] length: 0 (resolved future 1) [18:41:51.999] resolve() on list ... DONE [18:41:51.999] - '...' content: [n=0] [18:41:51.999] List of 1 [18:41:51.999] $ ...: list() [18:41:51.999] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:51.999] - attr(*, "where")=List of 1 [18:41:51.999] ..$ ...: [18:41:51.999] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:51.999] - attr(*, "resolved")= logi TRUE [18:41:51.999] - attr(*, "total_size")= num NA [18:41:52.004] - Getting '...' globals ... DONE [18:41:52.005] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:52.005] List of 2 [18:41:52.005] $ ...future.FUN:function (x, ...) [18:41:52.005] $ ... : list() [18:41:52.005] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.005] - attr(*, "where")=List of 2 [18:41:52.005] ..$ ...future.FUN: [18:41:52.005] ..$ ... : [18:41:52.005] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.005] - attr(*, "resolved")= logi FALSE [18:41:52.005] - attr(*, "total_size")= int 5182 [18:41:52.011] Packages to be attached in all futures: [n=0] [18:41:52.012] getGlobalsAndPackagesXApply() ... DONE [18:41:52.012] Number of futures (= number of chunks): 2 [18:41:52.013] Launching 2 futures (chunks) ... [18:41:52.013] Chunk #1 of 2 ... [18:41:52.013] - Finding globals in 'X' for chunk #1 ... [18:41:52.013] getGlobalsAndPackages() ... [18:41:52.014] Searching for globals... [18:41:52.014] [18:41:52.015] Searching for globals ... DONE [18:41:52.015] - globals: [0] [18:41:52.015] getGlobalsAndPackages() ... DONE [18:41:52.015] + additional globals found: [n=0] [18:41:52.016] + additional namespaces needed: [n=0] [18:41:52.016] - Finding globals in 'X' for chunk #1 ... DONE [18:41:52.016] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.017] - seeds: [18:41:52.017] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.017] getGlobalsAndPackages() ... [18:41:52.018] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.018] Resolving globals: FALSE [18:41:52.018] Tweak future expression to call with '...' arguments ... [18:41:52.019] { [18:41:52.019] do.call(function(...) { [18:41:52.019] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.019] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.019] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.019] on.exit(options(oopts), add = TRUE) [18:41:52.019] } [18:41:52.019] { [18:41:52.019] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.019] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.019] ...future.FUN(...future.X_jj, ...) [18:41:52.019] }) [18:41:52.019] } [18:41:52.019] }, args = future.call.arguments) [18:41:52.019] } [18:41:52.019] Tweak future expression to call with '...' arguments ... DONE [18:41:52.020] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.021] [18:41:52.021] getGlobalsAndPackages() ... DONE [18:41:52.022] run() for 'Future' ... [18:41:52.022] - state: 'created' [18:41:52.022] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.053] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.053] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.054] - Field: 'node' [18:41:52.054] - Field: 'label' [18:41:52.054] - Field: 'local' [18:41:52.055] - Field: 'owner' [18:41:52.055] - Field: 'envir' [18:41:52.055] - Field: 'workers' [18:41:52.056] - Field: 'packages' [18:41:52.056] - Field: 'gc' [18:41:52.056] - Field: 'conditions' [18:41:52.057] - Field: 'persistent' [18:41:52.057] - Field: 'expr' [18:41:52.057] - Field: 'uuid' [18:41:52.058] - Field: 'seed' [18:41:52.058] - Field: 'version' [18:41:52.058] - Field: 'result' [18:41:52.059] - Field: 'asynchronous' [18:41:52.059] - Field: 'calls' [18:41:52.059] - Field: 'globals' [18:41:52.060] - Field: 'stdout' [18:41:52.060] - Field: 'earlySignal' [18:41:52.060] - Field: 'lazy' [18:41:52.061] - Field: 'state' [18:41:52.061] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.061] - Launch lazy future ... [18:41:52.062] Packages needed by the future expression (n = 0): [18:41:52.062] Packages needed by future strategies (n = 0): [18:41:52.063] { [18:41:52.063] { [18:41:52.063] { [18:41:52.063] ...future.startTime <- base::Sys.time() [18:41:52.063] { [18:41:52.063] { [18:41:52.063] { [18:41:52.063] { [18:41:52.063] base::local({ [18:41:52.063] has_future <- base::requireNamespace("future", [18:41:52.063] quietly = TRUE) [18:41:52.063] if (has_future) { [18:41:52.063] ns <- base::getNamespace("future") [18:41:52.063] version <- ns[[".package"]][["version"]] [18:41:52.063] if (is.null(version)) [18:41:52.063] version <- utils::packageVersion("future") [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] version <- NULL [18:41:52.063] } [18:41:52.063] if (!has_future || version < "1.8.0") { [18:41:52.063] info <- base::c(r_version = base::gsub("R version ", [18:41:52.063] "", base::R.version$version.string), [18:41:52.063] platform = base::sprintf("%s (%s-bit)", [18:41:52.063] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.063] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.063] "release", "version")], collapse = " "), [18:41:52.063] hostname = base::Sys.info()[["nodename"]]) [18:41:52.063] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.063] info) [18:41:52.063] info <- base::paste(info, collapse = "; ") [18:41:52.063] if (!has_future) { [18:41:52.063] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.063] info) [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.063] info, version) [18:41:52.063] } [18:41:52.063] base::stop(msg) [18:41:52.063] } [18:41:52.063] }) [18:41:52.063] } [18:41:52.063] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.063] base::options(mc.cores = 1L) [18:41:52.063] } [18:41:52.063] ...future.strategy.old <- future::plan("list") [18:41:52.063] options(future.plan = NULL) [18:41:52.063] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.063] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.063] } [18:41:52.063] ...future.workdir <- getwd() [18:41:52.063] } [18:41:52.063] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.063] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.063] } [18:41:52.063] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.063] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.063] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.063] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.063] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.063] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.063] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.063] base::names(...future.oldOptions)) [18:41:52.063] } [18:41:52.063] if (FALSE) { [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] if (TRUE) { [18:41:52.063] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.063] open = "w") [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.063] windows = "NUL", "/dev/null"), open = "w") [18:41:52.063] } [18:41:52.063] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.063] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.063] base::sink(type = "output", split = FALSE) [18:41:52.063] base::close(...future.stdout) [18:41:52.063] }, add = TRUE) [18:41:52.063] } [18:41:52.063] ...future.frame <- base::sys.nframe() [18:41:52.063] ...future.conditions <- base::list() [18:41:52.063] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.063] if (FALSE) { [18:41:52.063] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.063] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.063] } [18:41:52.063] ...future.result <- base::tryCatch({ [18:41:52.063] base::withCallingHandlers({ [18:41:52.063] ...future.value <- base::withVisible(base::local({ [18:41:52.063] ...future.makeSendCondition <- base::local({ [18:41:52.063] sendCondition <- NULL [18:41:52.063] function(frame = 1L) { [18:41:52.063] if (is.function(sendCondition)) [18:41:52.063] return(sendCondition) [18:41:52.063] ns <- getNamespace("parallel") [18:41:52.063] if (exists("sendData", mode = "function", [18:41:52.063] envir = ns)) { [18:41:52.063] parallel_sendData <- get("sendData", mode = "function", [18:41:52.063] envir = ns) [18:41:52.063] envir <- sys.frame(frame) [18:41:52.063] master <- NULL [18:41:52.063] while (!identical(envir, .GlobalEnv) && [18:41:52.063] !identical(envir, emptyenv())) { [18:41:52.063] if (exists("master", mode = "list", envir = envir, [18:41:52.063] inherits = FALSE)) { [18:41:52.063] master <- get("master", mode = "list", [18:41:52.063] envir = envir, inherits = FALSE) [18:41:52.063] if (inherits(master, c("SOCKnode", [18:41:52.063] "SOCK0node"))) { [18:41:52.063] sendCondition <<- function(cond) { [18:41:52.063] data <- list(type = "VALUE", value = cond, [18:41:52.063] success = TRUE) [18:41:52.063] parallel_sendData(master, data) [18:41:52.063] } [18:41:52.063] return(sendCondition) [18:41:52.063] } [18:41:52.063] } [18:41:52.063] frame <- frame + 1L [18:41:52.063] envir <- sys.frame(frame) [18:41:52.063] } [18:41:52.063] } [18:41:52.063] sendCondition <<- function(cond) NULL [18:41:52.063] } [18:41:52.063] }) [18:41:52.063] withCallingHandlers({ [18:41:52.063] { [18:41:52.063] do.call(function(...) { [18:41:52.063] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.063] if (!identical(...future.globals.maxSize.org, [18:41:52.063] ...future.globals.maxSize)) { [18:41:52.063] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.063] on.exit(options(oopts), add = TRUE) [18:41:52.063] } [18:41:52.063] { [18:41:52.063] lapply(seq_along(...future.elements_ii), [18:41:52.063] FUN = function(jj) { [18:41:52.063] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.063] ...future.FUN(...future.X_jj, ...) [18:41:52.063] }) [18:41:52.063] } [18:41:52.063] }, args = future.call.arguments) [18:41:52.063] } [18:41:52.063] }, immediateCondition = function(cond) { [18:41:52.063] sendCondition <- ...future.makeSendCondition() [18:41:52.063] sendCondition(cond) [18:41:52.063] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.063] { [18:41:52.063] inherits <- base::inherits [18:41:52.063] invokeRestart <- base::invokeRestart [18:41:52.063] is.null <- base::is.null [18:41:52.063] muffled <- FALSE [18:41:52.063] if (inherits(cond, "message")) { [18:41:52.063] muffled <- grepl(pattern, "muffleMessage") [18:41:52.063] if (muffled) [18:41:52.063] invokeRestart("muffleMessage") [18:41:52.063] } [18:41:52.063] else if (inherits(cond, "warning")) { [18:41:52.063] muffled <- grepl(pattern, "muffleWarning") [18:41:52.063] if (muffled) [18:41:52.063] invokeRestart("muffleWarning") [18:41:52.063] } [18:41:52.063] else if (inherits(cond, "condition")) { [18:41:52.063] if (!is.null(pattern)) { [18:41:52.063] computeRestarts <- base::computeRestarts [18:41:52.063] grepl <- base::grepl [18:41:52.063] restarts <- computeRestarts(cond) [18:41:52.063] for (restart in restarts) { [18:41:52.063] name <- restart$name [18:41:52.063] if (is.null(name)) [18:41:52.063] next [18:41:52.063] if (!grepl(pattern, name)) [18:41:52.063] next [18:41:52.063] invokeRestart(restart) [18:41:52.063] muffled <- TRUE [18:41:52.063] break [18:41:52.063] } [18:41:52.063] } [18:41:52.063] } [18:41:52.063] invisible(muffled) [18:41:52.063] } [18:41:52.063] muffleCondition(cond) [18:41:52.063] }) [18:41:52.063] })) [18:41:52.063] future::FutureResult(value = ...future.value$value, [18:41:52.063] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.063] ...future.rng), globalenv = if (FALSE) [18:41:52.063] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.063] ...future.globalenv.names)) [18:41:52.063] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.063] }, condition = base::local({ [18:41:52.063] c <- base::c [18:41:52.063] inherits <- base::inherits [18:41:52.063] invokeRestart <- base::invokeRestart [18:41:52.063] length <- base::length [18:41:52.063] list <- base::list [18:41:52.063] seq.int <- base::seq.int [18:41:52.063] signalCondition <- base::signalCondition [18:41:52.063] sys.calls <- base::sys.calls [18:41:52.063] `[[` <- base::`[[` [18:41:52.063] `+` <- base::`+` [18:41:52.063] `<<-` <- base::`<<-` [18:41:52.063] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.063] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.063] 3L)] [18:41:52.063] } [18:41:52.063] function(cond) { [18:41:52.063] is_error <- inherits(cond, "error") [18:41:52.063] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.063] NULL) [18:41:52.063] if (is_error) { [18:41:52.063] sessionInformation <- function() { [18:41:52.063] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.063] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.063] search = base::search(), system = base::Sys.info()) [18:41:52.063] } [18:41:52.063] ...future.conditions[[length(...future.conditions) + [18:41:52.063] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.063] cond$call), session = sessionInformation(), [18:41:52.063] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.063] signalCondition(cond) [18:41:52.063] } [18:41:52.063] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.063] "immediateCondition"))) { [18:41:52.063] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.063] ...future.conditions[[length(...future.conditions) + [18:41:52.063] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.063] if (TRUE && !signal) { [18:41:52.063] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.063] { [18:41:52.063] inherits <- base::inherits [18:41:52.063] invokeRestart <- base::invokeRestart [18:41:52.063] is.null <- base::is.null [18:41:52.063] muffled <- FALSE [18:41:52.063] if (inherits(cond, "message")) { [18:41:52.063] muffled <- grepl(pattern, "muffleMessage") [18:41:52.063] if (muffled) [18:41:52.063] invokeRestart("muffleMessage") [18:41:52.063] } [18:41:52.063] else if (inherits(cond, "warning")) { [18:41:52.063] muffled <- grepl(pattern, "muffleWarning") [18:41:52.063] if (muffled) [18:41:52.063] invokeRestart("muffleWarning") [18:41:52.063] } [18:41:52.063] else if (inherits(cond, "condition")) { [18:41:52.063] if (!is.null(pattern)) { [18:41:52.063] computeRestarts <- base::computeRestarts [18:41:52.063] grepl <- base::grepl [18:41:52.063] restarts <- computeRestarts(cond) [18:41:52.063] for (restart in restarts) { [18:41:52.063] name <- restart$name [18:41:52.063] if (is.null(name)) [18:41:52.063] next [18:41:52.063] if (!grepl(pattern, name)) [18:41:52.063] next [18:41:52.063] invokeRestart(restart) [18:41:52.063] muffled <- TRUE [18:41:52.063] break [18:41:52.063] } [18:41:52.063] } [18:41:52.063] } [18:41:52.063] invisible(muffled) [18:41:52.063] } [18:41:52.063] muffleCondition(cond, pattern = "^muffle") [18:41:52.063] } [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] if (TRUE) { [18:41:52.063] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.063] { [18:41:52.063] inherits <- base::inherits [18:41:52.063] invokeRestart <- base::invokeRestart [18:41:52.063] is.null <- base::is.null [18:41:52.063] muffled <- FALSE [18:41:52.063] if (inherits(cond, "message")) { [18:41:52.063] muffled <- grepl(pattern, "muffleMessage") [18:41:52.063] if (muffled) [18:41:52.063] invokeRestart("muffleMessage") [18:41:52.063] } [18:41:52.063] else if (inherits(cond, "warning")) { [18:41:52.063] muffled <- grepl(pattern, "muffleWarning") [18:41:52.063] if (muffled) [18:41:52.063] invokeRestart("muffleWarning") [18:41:52.063] } [18:41:52.063] else if (inherits(cond, "condition")) { [18:41:52.063] if (!is.null(pattern)) { [18:41:52.063] computeRestarts <- base::computeRestarts [18:41:52.063] grepl <- base::grepl [18:41:52.063] restarts <- computeRestarts(cond) [18:41:52.063] for (restart in restarts) { [18:41:52.063] name <- restart$name [18:41:52.063] if (is.null(name)) [18:41:52.063] next [18:41:52.063] if (!grepl(pattern, name)) [18:41:52.063] next [18:41:52.063] invokeRestart(restart) [18:41:52.063] muffled <- TRUE [18:41:52.063] break [18:41:52.063] } [18:41:52.063] } [18:41:52.063] } [18:41:52.063] invisible(muffled) [18:41:52.063] } [18:41:52.063] muffleCondition(cond, pattern = "^muffle") [18:41:52.063] } [18:41:52.063] } [18:41:52.063] } [18:41:52.063] })) [18:41:52.063] }, error = function(ex) { [18:41:52.063] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.063] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.063] ...future.rng), started = ...future.startTime, [18:41:52.063] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.063] version = "1.8"), class = "FutureResult") [18:41:52.063] }, finally = { [18:41:52.063] if (!identical(...future.workdir, getwd())) [18:41:52.063] setwd(...future.workdir) [18:41:52.063] { [18:41:52.063] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.063] ...future.oldOptions$nwarnings <- NULL [18:41:52.063] } [18:41:52.063] base::options(...future.oldOptions) [18:41:52.063] if (.Platform$OS.type == "windows") { [18:41:52.063] old_names <- names(...future.oldEnvVars) [18:41:52.063] envs <- base::Sys.getenv() [18:41:52.063] names <- names(envs) [18:41:52.063] common <- intersect(names, old_names) [18:41:52.063] added <- setdiff(names, old_names) [18:41:52.063] removed <- setdiff(old_names, names) [18:41:52.063] changed <- common[...future.oldEnvVars[common] != [18:41:52.063] envs[common]] [18:41:52.063] NAMES <- toupper(changed) [18:41:52.063] args <- list() [18:41:52.063] for (kk in seq_along(NAMES)) { [18:41:52.063] name <- changed[[kk]] [18:41:52.063] NAME <- NAMES[[kk]] [18:41:52.063] if (name != NAME && is.element(NAME, old_names)) [18:41:52.063] next [18:41:52.063] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.063] } [18:41:52.063] NAMES <- toupper(added) [18:41:52.063] for (kk in seq_along(NAMES)) { [18:41:52.063] name <- added[[kk]] [18:41:52.063] NAME <- NAMES[[kk]] [18:41:52.063] if (name != NAME && is.element(NAME, old_names)) [18:41:52.063] next [18:41:52.063] args[[name]] <- "" [18:41:52.063] } [18:41:52.063] NAMES <- toupper(removed) [18:41:52.063] for (kk in seq_along(NAMES)) { [18:41:52.063] name <- removed[[kk]] [18:41:52.063] NAME <- NAMES[[kk]] [18:41:52.063] if (name != NAME && is.element(NAME, old_names)) [18:41:52.063] next [18:41:52.063] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.063] } [18:41:52.063] if (length(args) > 0) [18:41:52.063] base::do.call(base::Sys.setenv, args = args) [18:41:52.063] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.063] } [18:41:52.063] { [18:41:52.063] if (base::length(...future.futureOptionsAdded) > [18:41:52.063] 0L) { [18:41:52.063] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.063] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.063] base::options(opts) [18:41:52.063] } [18:41:52.063] { [18:41:52.063] { [18:41:52.063] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.063] NULL [18:41:52.063] } [18:41:52.063] options(future.plan = NULL) [18:41:52.063] if (is.na(NA_character_)) [18:41:52.063] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.063] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.063] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.063] .init = FALSE) [18:41:52.063] } [18:41:52.063] } [18:41:52.063] } [18:41:52.063] }) [18:41:52.063] if (TRUE) { [18:41:52.063] base::sink(type = "output", split = FALSE) [18:41:52.063] if (TRUE) { [18:41:52.063] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.063] } [18:41:52.063] else { [18:41:52.063] ...future.result["stdout"] <- base::list(NULL) [18:41:52.063] } [18:41:52.063] base::close(...future.stdout) [18:41:52.063] ...future.stdout <- NULL [18:41:52.063] } [18:41:52.063] ...future.result$conditions <- ...future.conditions [18:41:52.063] ...future.result$finished <- base::Sys.time() [18:41:52.063] ...future.result [18:41:52.063] } [18:41:52.072] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:52.073] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:52.073] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:52.074] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.074] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.075] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.075] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.076] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.076] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.077] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.077] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.077] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:52.079] MultisessionFuture started [18:41:52.079] - Launch lazy future ... done [18:41:52.079] run() for 'MultisessionFuture' ... done [18:41:52.080] Created future: [18:41:52.092] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.093] - Validating connection of MultisessionFuture [18:41:52.093] - received message: FutureResult [18:41:52.093] - Received FutureResult [18:41:52.094] - Erased future from FutureRegistry [18:41:52.094] result() for ClusterFuture ... [18:41:52.094] - result already collected: FutureResult [18:41:52.095] result() for ClusterFuture ... done [18:41:52.095] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.080] MultisessionFuture: [18:41:52.080] Label: 'future_sapply-1' [18:41:52.080] Expression: [18:41:52.080] { [18:41:52.080] do.call(function(...) { [18:41:52.080] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.080] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.080] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.080] on.exit(options(oopts), add = TRUE) [18:41:52.080] } [18:41:52.080] { [18:41:52.080] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.080] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.080] ...future.FUN(...future.X_jj, ...) [18:41:52.080] }) [18:41:52.080] } [18:41:52.080] }, args = future.call.arguments) [18:41:52.080] } [18:41:52.080] Lazy evaluation: FALSE [18:41:52.080] Asynchronous evaluation: TRUE [18:41:52.080] Local evaluation: TRUE [18:41:52.080] Environment: R_GlobalEnv [18:41:52.080] Capture standard output: TRUE [18:41:52.080] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.080] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.080] Packages: [18:41:52.080] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.080] Resolved: TRUE [18:41:52.080] Value: [18:41:52.080] Conditions captured: [18:41:52.080] Early signaling: FALSE [18:41:52.080] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.080] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.096] Chunk #1 of 2 ... DONE [18:41:52.096] Chunk #2 of 2 ... [18:41:52.096] - Finding globals in 'X' for chunk #2 ... [18:41:52.097] getGlobalsAndPackages() ... [18:41:52.097] Searching for globals... [18:41:52.098] [18:41:52.098] Searching for globals ... DONE [18:41:52.098] - globals: [0] [18:41:52.098] getGlobalsAndPackages() ... DONE [18:41:52.099] + additional globals found: [n=0] [18:41:52.099] + additional namespaces needed: [n=0] [18:41:52.099] - Finding globals in 'X' for chunk #2 ... DONE [18:41:52.100] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.100] - seeds: [18:41:52.100] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.100] getGlobalsAndPackages() ... [18:41:52.101] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.101] Resolving globals: FALSE [18:41:52.101] Tweak future expression to call with '...' arguments ... [18:41:52.102] { [18:41:52.102] do.call(function(...) { [18:41:52.102] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.102] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.102] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.102] on.exit(options(oopts), add = TRUE) [18:41:52.102] } [18:41:52.102] { [18:41:52.102] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.102] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.102] ...future.FUN(...future.X_jj, ...) [18:41:52.102] }) [18:41:52.102] } [18:41:52.102] }, args = future.call.arguments) [18:41:52.102] } [18:41:52.103] Tweak future expression to call with '...' arguments ... DONE [18:41:52.103] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.104] [18:41:52.104] getGlobalsAndPackages() ... DONE [18:41:52.105] run() for 'Future' ... [18:41:52.105] - state: 'created' [18:41:52.105] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.133] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.134] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.134] - Field: 'node' [18:41:52.134] - Field: 'label' [18:41:52.135] - Field: 'local' [18:41:52.135] - Field: 'owner' [18:41:52.135] - Field: 'envir' [18:41:52.136] - Field: 'workers' [18:41:52.136] - Field: 'packages' [18:41:52.136] - Field: 'gc' [18:41:52.137] - Field: 'conditions' [18:41:52.137] - Field: 'persistent' [18:41:52.137] - Field: 'expr' [18:41:52.138] - Field: 'uuid' [18:41:52.138] - Field: 'seed' [18:41:52.138] - Field: 'version' [18:41:52.139] - Field: 'result' [18:41:52.139] - Field: 'asynchronous' [18:41:52.139] - Field: 'calls' [18:41:52.140] - Field: 'globals' [18:41:52.140] - Field: 'stdout' [18:41:52.140] - Field: 'earlySignal' [18:41:52.141] - Field: 'lazy' [18:41:52.141] - Field: 'state' [18:41:52.141] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.141] - Launch lazy future ... [18:41:52.142] Packages needed by the future expression (n = 0): [18:41:52.142] Packages needed by future strategies (n = 0): [18:41:52.144] { [18:41:52.144] { [18:41:52.144] { [18:41:52.144] ...future.startTime <- base::Sys.time() [18:41:52.144] { [18:41:52.144] { [18:41:52.144] { [18:41:52.144] { [18:41:52.144] base::local({ [18:41:52.144] has_future <- base::requireNamespace("future", [18:41:52.144] quietly = TRUE) [18:41:52.144] if (has_future) { [18:41:52.144] ns <- base::getNamespace("future") [18:41:52.144] version <- ns[[".package"]][["version"]] [18:41:52.144] if (is.null(version)) [18:41:52.144] version <- utils::packageVersion("future") [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] version <- NULL [18:41:52.144] } [18:41:52.144] if (!has_future || version < "1.8.0") { [18:41:52.144] info <- base::c(r_version = base::gsub("R version ", [18:41:52.144] "", base::R.version$version.string), [18:41:52.144] platform = base::sprintf("%s (%s-bit)", [18:41:52.144] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.144] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.144] "release", "version")], collapse = " "), [18:41:52.144] hostname = base::Sys.info()[["nodename"]]) [18:41:52.144] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.144] info) [18:41:52.144] info <- base::paste(info, collapse = "; ") [18:41:52.144] if (!has_future) { [18:41:52.144] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.144] info) [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.144] info, version) [18:41:52.144] } [18:41:52.144] base::stop(msg) [18:41:52.144] } [18:41:52.144] }) [18:41:52.144] } [18:41:52.144] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.144] base::options(mc.cores = 1L) [18:41:52.144] } [18:41:52.144] ...future.strategy.old <- future::plan("list") [18:41:52.144] options(future.plan = NULL) [18:41:52.144] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.144] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.144] } [18:41:52.144] ...future.workdir <- getwd() [18:41:52.144] } [18:41:52.144] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.144] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.144] } [18:41:52.144] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.144] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.144] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.144] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.144] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.144] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.144] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.144] base::names(...future.oldOptions)) [18:41:52.144] } [18:41:52.144] if (FALSE) { [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] if (TRUE) { [18:41:52.144] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.144] open = "w") [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.144] windows = "NUL", "/dev/null"), open = "w") [18:41:52.144] } [18:41:52.144] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.144] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.144] base::sink(type = "output", split = FALSE) [18:41:52.144] base::close(...future.stdout) [18:41:52.144] }, add = TRUE) [18:41:52.144] } [18:41:52.144] ...future.frame <- base::sys.nframe() [18:41:52.144] ...future.conditions <- base::list() [18:41:52.144] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.144] if (FALSE) { [18:41:52.144] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.144] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.144] } [18:41:52.144] ...future.result <- base::tryCatch({ [18:41:52.144] base::withCallingHandlers({ [18:41:52.144] ...future.value <- base::withVisible(base::local({ [18:41:52.144] ...future.makeSendCondition <- base::local({ [18:41:52.144] sendCondition <- NULL [18:41:52.144] function(frame = 1L) { [18:41:52.144] if (is.function(sendCondition)) [18:41:52.144] return(sendCondition) [18:41:52.144] ns <- getNamespace("parallel") [18:41:52.144] if (exists("sendData", mode = "function", [18:41:52.144] envir = ns)) { [18:41:52.144] parallel_sendData <- get("sendData", mode = "function", [18:41:52.144] envir = ns) [18:41:52.144] envir <- sys.frame(frame) [18:41:52.144] master <- NULL [18:41:52.144] while (!identical(envir, .GlobalEnv) && [18:41:52.144] !identical(envir, emptyenv())) { [18:41:52.144] if (exists("master", mode = "list", envir = envir, [18:41:52.144] inherits = FALSE)) { [18:41:52.144] master <- get("master", mode = "list", [18:41:52.144] envir = envir, inherits = FALSE) [18:41:52.144] if (inherits(master, c("SOCKnode", [18:41:52.144] "SOCK0node"))) { [18:41:52.144] sendCondition <<- function(cond) { [18:41:52.144] data <- list(type = "VALUE", value = cond, [18:41:52.144] success = TRUE) [18:41:52.144] parallel_sendData(master, data) [18:41:52.144] } [18:41:52.144] return(sendCondition) [18:41:52.144] } [18:41:52.144] } [18:41:52.144] frame <- frame + 1L [18:41:52.144] envir <- sys.frame(frame) [18:41:52.144] } [18:41:52.144] } [18:41:52.144] sendCondition <<- function(cond) NULL [18:41:52.144] } [18:41:52.144] }) [18:41:52.144] withCallingHandlers({ [18:41:52.144] { [18:41:52.144] do.call(function(...) { [18:41:52.144] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.144] if (!identical(...future.globals.maxSize.org, [18:41:52.144] ...future.globals.maxSize)) { [18:41:52.144] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.144] on.exit(options(oopts), add = TRUE) [18:41:52.144] } [18:41:52.144] { [18:41:52.144] lapply(seq_along(...future.elements_ii), [18:41:52.144] FUN = function(jj) { [18:41:52.144] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.144] ...future.FUN(...future.X_jj, ...) [18:41:52.144] }) [18:41:52.144] } [18:41:52.144] }, args = future.call.arguments) [18:41:52.144] } [18:41:52.144] }, immediateCondition = function(cond) { [18:41:52.144] sendCondition <- ...future.makeSendCondition() [18:41:52.144] sendCondition(cond) [18:41:52.144] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.144] { [18:41:52.144] inherits <- base::inherits [18:41:52.144] invokeRestart <- base::invokeRestart [18:41:52.144] is.null <- base::is.null [18:41:52.144] muffled <- FALSE [18:41:52.144] if (inherits(cond, "message")) { [18:41:52.144] muffled <- grepl(pattern, "muffleMessage") [18:41:52.144] if (muffled) [18:41:52.144] invokeRestart("muffleMessage") [18:41:52.144] } [18:41:52.144] else if (inherits(cond, "warning")) { [18:41:52.144] muffled <- grepl(pattern, "muffleWarning") [18:41:52.144] if (muffled) [18:41:52.144] invokeRestart("muffleWarning") [18:41:52.144] } [18:41:52.144] else if (inherits(cond, "condition")) { [18:41:52.144] if (!is.null(pattern)) { [18:41:52.144] computeRestarts <- base::computeRestarts [18:41:52.144] grepl <- base::grepl [18:41:52.144] restarts <- computeRestarts(cond) [18:41:52.144] for (restart in restarts) { [18:41:52.144] name <- restart$name [18:41:52.144] if (is.null(name)) [18:41:52.144] next [18:41:52.144] if (!grepl(pattern, name)) [18:41:52.144] next [18:41:52.144] invokeRestart(restart) [18:41:52.144] muffled <- TRUE [18:41:52.144] break [18:41:52.144] } [18:41:52.144] } [18:41:52.144] } [18:41:52.144] invisible(muffled) [18:41:52.144] } [18:41:52.144] muffleCondition(cond) [18:41:52.144] }) [18:41:52.144] })) [18:41:52.144] future::FutureResult(value = ...future.value$value, [18:41:52.144] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.144] ...future.rng), globalenv = if (FALSE) [18:41:52.144] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.144] ...future.globalenv.names)) [18:41:52.144] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.144] }, condition = base::local({ [18:41:52.144] c <- base::c [18:41:52.144] inherits <- base::inherits [18:41:52.144] invokeRestart <- base::invokeRestart [18:41:52.144] length <- base::length [18:41:52.144] list <- base::list [18:41:52.144] seq.int <- base::seq.int [18:41:52.144] signalCondition <- base::signalCondition [18:41:52.144] sys.calls <- base::sys.calls [18:41:52.144] `[[` <- base::`[[` [18:41:52.144] `+` <- base::`+` [18:41:52.144] `<<-` <- base::`<<-` [18:41:52.144] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.144] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.144] 3L)] [18:41:52.144] } [18:41:52.144] function(cond) { [18:41:52.144] is_error <- inherits(cond, "error") [18:41:52.144] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.144] NULL) [18:41:52.144] if (is_error) { [18:41:52.144] sessionInformation <- function() { [18:41:52.144] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.144] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.144] search = base::search(), system = base::Sys.info()) [18:41:52.144] } [18:41:52.144] ...future.conditions[[length(...future.conditions) + [18:41:52.144] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.144] cond$call), session = sessionInformation(), [18:41:52.144] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.144] signalCondition(cond) [18:41:52.144] } [18:41:52.144] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.144] "immediateCondition"))) { [18:41:52.144] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.144] ...future.conditions[[length(...future.conditions) + [18:41:52.144] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.144] if (TRUE && !signal) { [18:41:52.144] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.144] { [18:41:52.144] inherits <- base::inherits [18:41:52.144] invokeRestart <- base::invokeRestart [18:41:52.144] is.null <- base::is.null [18:41:52.144] muffled <- FALSE [18:41:52.144] if (inherits(cond, "message")) { [18:41:52.144] muffled <- grepl(pattern, "muffleMessage") [18:41:52.144] if (muffled) [18:41:52.144] invokeRestart("muffleMessage") [18:41:52.144] } [18:41:52.144] else if (inherits(cond, "warning")) { [18:41:52.144] muffled <- grepl(pattern, "muffleWarning") [18:41:52.144] if (muffled) [18:41:52.144] invokeRestart("muffleWarning") [18:41:52.144] } [18:41:52.144] else if (inherits(cond, "condition")) { [18:41:52.144] if (!is.null(pattern)) { [18:41:52.144] computeRestarts <- base::computeRestarts [18:41:52.144] grepl <- base::grepl [18:41:52.144] restarts <- computeRestarts(cond) [18:41:52.144] for (restart in restarts) { [18:41:52.144] name <- restart$name [18:41:52.144] if (is.null(name)) [18:41:52.144] next [18:41:52.144] if (!grepl(pattern, name)) [18:41:52.144] next [18:41:52.144] invokeRestart(restart) [18:41:52.144] muffled <- TRUE [18:41:52.144] break [18:41:52.144] } [18:41:52.144] } [18:41:52.144] } [18:41:52.144] invisible(muffled) [18:41:52.144] } [18:41:52.144] muffleCondition(cond, pattern = "^muffle") [18:41:52.144] } [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] if (TRUE) { [18:41:52.144] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.144] { [18:41:52.144] inherits <- base::inherits [18:41:52.144] invokeRestart <- base::invokeRestart [18:41:52.144] is.null <- base::is.null [18:41:52.144] muffled <- FALSE [18:41:52.144] if (inherits(cond, "message")) { [18:41:52.144] muffled <- grepl(pattern, "muffleMessage") [18:41:52.144] if (muffled) [18:41:52.144] invokeRestart("muffleMessage") [18:41:52.144] } [18:41:52.144] else if (inherits(cond, "warning")) { [18:41:52.144] muffled <- grepl(pattern, "muffleWarning") [18:41:52.144] if (muffled) [18:41:52.144] invokeRestart("muffleWarning") [18:41:52.144] } [18:41:52.144] else if (inherits(cond, "condition")) { [18:41:52.144] if (!is.null(pattern)) { [18:41:52.144] computeRestarts <- base::computeRestarts [18:41:52.144] grepl <- base::grepl [18:41:52.144] restarts <- computeRestarts(cond) [18:41:52.144] for (restart in restarts) { [18:41:52.144] name <- restart$name [18:41:52.144] if (is.null(name)) [18:41:52.144] next [18:41:52.144] if (!grepl(pattern, name)) [18:41:52.144] next [18:41:52.144] invokeRestart(restart) [18:41:52.144] muffled <- TRUE [18:41:52.144] break [18:41:52.144] } [18:41:52.144] } [18:41:52.144] } [18:41:52.144] invisible(muffled) [18:41:52.144] } [18:41:52.144] muffleCondition(cond, pattern = "^muffle") [18:41:52.144] } [18:41:52.144] } [18:41:52.144] } [18:41:52.144] })) [18:41:52.144] }, error = function(ex) { [18:41:52.144] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.144] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.144] ...future.rng), started = ...future.startTime, [18:41:52.144] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.144] version = "1.8"), class = "FutureResult") [18:41:52.144] }, finally = { [18:41:52.144] if (!identical(...future.workdir, getwd())) [18:41:52.144] setwd(...future.workdir) [18:41:52.144] { [18:41:52.144] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.144] ...future.oldOptions$nwarnings <- NULL [18:41:52.144] } [18:41:52.144] base::options(...future.oldOptions) [18:41:52.144] if (.Platform$OS.type == "windows") { [18:41:52.144] old_names <- names(...future.oldEnvVars) [18:41:52.144] envs <- base::Sys.getenv() [18:41:52.144] names <- names(envs) [18:41:52.144] common <- intersect(names, old_names) [18:41:52.144] added <- setdiff(names, old_names) [18:41:52.144] removed <- setdiff(old_names, names) [18:41:52.144] changed <- common[...future.oldEnvVars[common] != [18:41:52.144] envs[common]] [18:41:52.144] NAMES <- toupper(changed) [18:41:52.144] args <- list() [18:41:52.144] for (kk in seq_along(NAMES)) { [18:41:52.144] name <- changed[[kk]] [18:41:52.144] NAME <- NAMES[[kk]] [18:41:52.144] if (name != NAME && is.element(NAME, old_names)) [18:41:52.144] next [18:41:52.144] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.144] } [18:41:52.144] NAMES <- toupper(added) [18:41:52.144] for (kk in seq_along(NAMES)) { [18:41:52.144] name <- added[[kk]] [18:41:52.144] NAME <- NAMES[[kk]] [18:41:52.144] if (name != NAME && is.element(NAME, old_names)) [18:41:52.144] next [18:41:52.144] args[[name]] <- "" [18:41:52.144] } [18:41:52.144] NAMES <- toupper(removed) [18:41:52.144] for (kk in seq_along(NAMES)) { [18:41:52.144] name <- removed[[kk]] [18:41:52.144] NAME <- NAMES[[kk]] [18:41:52.144] if (name != NAME && is.element(NAME, old_names)) [18:41:52.144] next [18:41:52.144] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.144] } [18:41:52.144] if (length(args) > 0) [18:41:52.144] base::do.call(base::Sys.setenv, args = args) [18:41:52.144] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.144] } [18:41:52.144] { [18:41:52.144] if (base::length(...future.futureOptionsAdded) > [18:41:52.144] 0L) { [18:41:52.144] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.144] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.144] base::options(opts) [18:41:52.144] } [18:41:52.144] { [18:41:52.144] { [18:41:52.144] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.144] NULL [18:41:52.144] } [18:41:52.144] options(future.plan = NULL) [18:41:52.144] if (is.na(NA_character_)) [18:41:52.144] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.144] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.144] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.144] .init = FALSE) [18:41:52.144] } [18:41:52.144] } [18:41:52.144] } [18:41:52.144] }) [18:41:52.144] if (TRUE) { [18:41:52.144] base::sink(type = "output", split = FALSE) [18:41:52.144] if (TRUE) { [18:41:52.144] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.144] } [18:41:52.144] else { [18:41:52.144] ...future.result["stdout"] <- base::list(NULL) [18:41:52.144] } [18:41:52.144] base::close(...future.stdout) [18:41:52.144] ...future.stdout <- NULL [18:41:52.144] } [18:41:52.144] ...future.result$conditions <- ...future.conditions [18:41:52.144] ...future.result$finished <- base::Sys.time() [18:41:52.144] ...future.result [18:41:52.144] } [18:41:52.153] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:52.153] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:52.154] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:52.154] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.155] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.155] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.156] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.156] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.156] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.157] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.157] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.158] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:52.159] MultisessionFuture started [18:41:52.159] - Launch lazy future ... done [18:41:52.160] run() for 'MultisessionFuture' ... done [18:41:52.160] Created future: [18:41:52.174] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.174] - Validating connection of MultisessionFuture [18:41:52.175] - received message: FutureResult [18:41:52.175] - Received FutureResult [18:41:52.175] - Erased future from FutureRegistry [18:41:52.176] result() for ClusterFuture ... [18:41:52.176] - result already collected: FutureResult [18:41:52.176] result() for ClusterFuture ... done [18:41:52.176] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.160] MultisessionFuture: [18:41:52.160] Label: 'future_sapply-2' [18:41:52.160] Expression: [18:41:52.160] { [18:41:52.160] do.call(function(...) { [18:41:52.160] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.160] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.160] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.160] on.exit(options(oopts), add = TRUE) [18:41:52.160] } [18:41:52.160] { [18:41:52.160] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.160] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.160] ...future.FUN(...future.X_jj, ...) [18:41:52.160] }) [18:41:52.160] } [18:41:52.160] }, args = future.call.arguments) [18:41:52.160] } [18:41:52.160] Lazy evaluation: FALSE [18:41:52.160] Asynchronous evaluation: TRUE [18:41:52.160] Local evaluation: TRUE [18:41:52.160] Environment: R_GlobalEnv [18:41:52.160] Capture standard output: TRUE [18:41:52.160] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.160] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.160] Packages: [18:41:52.160] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.160] Resolved: TRUE [18:41:52.160] Value: [18:41:52.160] Conditions captured: [18:41:52.160] Early signaling: FALSE [18:41:52.160] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.160] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.177] Chunk #2 of 2 ... DONE [18:41:52.178] Launching 2 futures (chunks) ... DONE [18:41:52.178] Resolving 2 futures (chunks) ... [18:41:52.178] resolve() on list ... [18:41:52.178] recursive: 0 [18:41:52.179] length: 2 [18:41:52.179] [18:41:52.179] Future #1 [18:41:52.180] result() for ClusterFuture ... [18:41:52.180] - result already collected: FutureResult [18:41:52.180] result() for ClusterFuture ... done [18:41:52.180] result() for ClusterFuture ... [18:41:52.181] - result already collected: FutureResult [18:41:52.181] result() for ClusterFuture ... done [18:41:52.181] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:52.182] - nx: 2 [18:41:52.182] - relay: TRUE [18:41:52.182] - stdout: TRUE [18:41:52.183] - signal: TRUE [18:41:52.183] - resignal: FALSE [18:41:52.183] - force: TRUE [18:41:52.183] - relayed: [n=2] FALSE, FALSE [18:41:52.184] - queued futures: [n=2] FALSE, FALSE [18:41:52.184] - until=1 [18:41:52.184] - relaying element #1 [18:41:52.185] result() for ClusterFuture ... [18:41:52.185] - result already collected: FutureResult [18:41:52.185] result() for ClusterFuture ... done [18:41:52.185] result() for ClusterFuture ... [18:41:52.186] - result already collected: FutureResult [18:41:52.186] result() for ClusterFuture ... done [18:41:52.186] result() for ClusterFuture ... [18:41:52.187] - result already collected: FutureResult [18:41:52.187] result() for ClusterFuture ... done [18:41:52.187] result() for ClusterFuture ... [18:41:52.188] - result already collected: FutureResult [18:41:52.188] result() for ClusterFuture ... done [18:41:52.188] - relayed: [n=2] TRUE, FALSE [18:41:52.188] - queued futures: [n=2] TRUE, FALSE [18:41:52.189] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:52.189] length: 1 (resolved future 1) [18:41:52.189] Future #2 [18:41:52.190] result() for ClusterFuture ... [18:41:52.190] - result already collected: FutureResult [18:41:52.190] result() for ClusterFuture ... done [18:41:52.191] result() for ClusterFuture ... [18:41:52.191] - result already collected: FutureResult [18:41:52.191] result() for ClusterFuture ... done [18:41:52.191] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:52.192] - nx: 2 [18:41:52.192] - relay: TRUE [18:41:52.192] - stdout: TRUE [18:41:52.193] - signal: TRUE [18:41:52.193] - resignal: FALSE [18:41:52.193] - force: TRUE [18:41:52.193] - relayed: [n=2] TRUE, FALSE [18:41:52.194] - queued futures: [n=2] TRUE, FALSE [18:41:52.194] - until=2 [18:41:52.194] - relaying element #2 [18:41:52.195] result() for ClusterFuture ... [18:41:52.195] - result already collected: FutureResult [18:41:52.195] result() for ClusterFuture ... done [18:41:52.196] result() for ClusterFuture ... [18:41:52.196] - result already collected: FutureResult [18:41:52.196] result() for ClusterFuture ... done [18:41:52.196] result() for ClusterFuture ... [18:41:52.197] - result already collected: FutureResult [18:41:52.197] result() for ClusterFuture ... done [18:41:52.197] result() for ClusterFuture ... [18:41:52.198] - result already collected: FutureResult [18:41:52.198] result() for ClusterFuture ... done [18:41:52.198] - relayed: [n=2] TRUE, TRUE [18:41:52.198] - queued futures: [n=2] TRUE, TRUE [18:41:52.199] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:52.199] length: 0 (resolved future 2) [18:41:52.199] Relaying remaining futures [18:41:52.200] signalConditionsASAP(NULL, pos=0) ... [18:41:52.200] - nx: 2 [18:41:52.200] - relay: TRUE [18:41:52.200] - stdout: TRUE [18:41:52.201] - signal: TRUE [18:41:52.201] - resignal: FALSE [18:41:52.201] - force: TRUE [18:41:52.202] - relayed: [n=2] TRUE, TRUE [18:41:52.202] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:52.202] - relayed: [n=2] TRUE, TRUE [18:41:52.203] - queued futures: [n=2] TRUE, TRUE [18:41:52.203] signalConditionsASAP(NULL, pos=0) ... done [18:41:52.203] resolve() on list ... DONE [18:41:52.203] result() for ClusterFuture ... [18:41:52.204] - result already collected: FutureResult [18:41:52.204] result() for ClusterFuture ... done [18:41:52.204] result() for ClusterFuture ... [18:41:52.205] - result already collected: FutureResult [18:41:52.205] result() for ClusterFuture ... done [18:41:52.205] result() for ClusterFuture ... [18:41:52.206] - result already collected: FutureResult [18:41:52.206] result() for ClusterFuture ... done [18:41:52.206] result() for ClusterFuture ... [18:41:52.206] - result already collected: FutureResult [18:41:52.207] result() for ClusterFuture ... done [18:41:52.207] - Number of value chunks collected: 2 [18:41:52.207] Resolving 2 futures (chunks) ... DONE [18:41:52.208] Reducing values from 2 chunks ... [18:41:52.208] - Number of values collected after concatenation: 6 [18:41:52.208] - Number of values expected: 6 [18:41:52.208] Reducing values from 2 chunks ... DONE [18:41:52.209] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:52.213] future_lapply() ... [18:41:52.219] Number of chunks: 2 [18:41:52.219] getGlobalsAndPackagesXApply() ... [18:41:52.219] - future.globals: TRUE [18:41:52.220] getGlobalsAndPackages() ... [18:41:52.220] Searching for globals... [18:41:52.223] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:52.224] Searching for globals ... DONE [18:41:52.229] Resolving globals: FALSE [18:41:52.230] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:52.230] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:52.231] - globals: [1] 'FUN' [18:41:52.231] [18:41:52.231] getGlobalsAndPackages() ... DONE [18:41:52.232] - globals found/used: [n=1] 'FUN' [18:41:52.232] - needed namespaces: [n=0] [18:41:52.232] Finding globals ... DONE [18:41:52.233] - use_args: TRUE [18:41:52.233] - Getting '...' globals ... [18:41:52.234] resolve() on list ... [18:41:52.234] recursive: 0 [18:41:52.234] length: 1 [18:41:52.235] elements: '...' [18:41:52.235] length: 0 (resolved future 1) [18:41:52.235] resolve() on list ... DONE [18:41:52.236] - '...' content: [n=0] [18:41:52.236] List of 1 [18:41:52.236] $ ...: list() [18:41:52.236] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.236] - attr(*, "where")=List of 1 [18:41:52.236] ..$ ...: [18:41:52.236] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.236] - attr(*, "resolved")= logi TRUE [18:41:52.236] - attr(*, "total_size")= num NA [18:41:52.241] - Getting '...' globals ... DONE [18:41:52.242] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:52.242] List of 2 [18:41:52.242] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:52.242] $ ... : list() [18:41:52.242] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.242] - attr(*, "where")=List of 2 [18:41:52.242] ..$ ...future.FUN: [18:41:52.242] ..$ ... : [18:41:52.242] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.242] - attr(*, "resolved")= logi FALSE [18:41:52.242] - attr(*, "total_size")= int 6664 [18:41:52.248] Packages to be attached in all futures: [n=0] [18:41:52.248] getGlobalsAndPackagesXApply() ... DONE [18:41:52.249] Number of futures (= number of chunks): 2 [18:41:52.249] Launching 2 futures (chunks) ... [18:41:52.249] Chunk #1 of 2 ... [18:41:52.250] - Finding globals in 'X' for chunk #1 ... [18:41:52.250] getGlobalsAndPackages() ... [18:41:52.250] Searching for globals... [18:41:52.251] [18:41:52.251] Searching for globals ... DONE [18:41:52.251] - globals: [0] [18:41:52.252] getGlobalsAndPackages() ... DONE [18:41:52.252] + additional globals found: [n=0] [18:41:52.252] + additional namespaces needed: [n=0] [18:41:52.253] - Finding globals in 'X' for chunk #1 ... DONE [18:41:52.253] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.253] - seeds: [18:41:52.253] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.254] getGlobalsAndPackages() ... [18:41:52.254] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.254] Resolving globals: FALSE [18:41:52.255] Tweak future expression to call with '...' arguments ... [18:41:52.255] { [18:41:52.255] do.call(function(...) { [18:41:52.255] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.255] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.255] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.255] on.exit(options(oopts), add = TRUE) [18:41:52.255] } [18:41:52.255] { [18:41:52.255] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.255] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.255] ...future.FUN(...future.X_jj, ...) [18:41:52.255] }) [18:41:52.255] } [18:41:52.255] }, args = future.call.arguments) [18:41:52.255] } [18:41:52.256] Tweak future expression to call with '...' arguments ... DONE [18:41:52.257] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.257] [18:41:52.257] getGlobalsAndPackages() ... DONE [18:41:52.258] run() for 'Future' ... [18:41:52.258] - state: 'created' [18:41:52.259] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.287] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.287] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.288] - Field: 'node' [18:41:52.288] - Field: 'label' [18:41:52.288] - Field: 'local' [18:41:52.289] - Field: 'owner' [18:41:52.289] - Field: 'envir' [18:41:52.289] - Field: 'workers' [18:41:52.290] - Field: 'packages' [18:41:52.290] - Field: 'gc' [18:41:52.290] - Field: 'conditions' [18:41:52.291] - Field: 'persistent' [18:41:52.291] - Field: 'expr' [18:41:52.291] - Field: 'uuid' [18:41:52.292] - Field: 'seed' [18:41:52.292] - Field: 'version' [18:41:52.292] - Field: 'result' [18:41:52.292] - Field: 'asynchronous' [18:41:52.293] - Field: 'calls' [18:41:52.293] - Field: 'globals' [18:41:52.293] - Field: 'stdout' [18:41:52.294] - Field: 'earlySignal' [18:41:52.294] - Field: 'lazy' [18:41:52.294] - Field: 'state' [18:41:52.295] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.295] - Launch lazy future ... [18:41:52.296] Packages needed by the future expression (n = 0): [18:41:52.296] Packages needed by future strategies (n = 0): [18:41:52.297] { [18:41:52.297] { [18:41:52.297] { [18:41:52.297] ...future.startTime <- base::Sys.time() [18:41:52.297] { [18:41:52.297] { [18:41:52.297] { [18:41:52.297] { [18:41:52.297] base::local({ [18:41:52.297] has_future <- base::requireNamespace("future", [18:41:52.297] quietly = TRUE) [18:41:52.297] if (has_future) { [18:41:52.297] ns <- base::getNamespace("future") [18:41:52.297] version <- ns[[".package"]][["version"]] [18:41:52.297] if (is.null(version)) [18:41:52.297] version <- utils::packageVersion("future") [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] version <- NULL [18:41:52.297] } [18:41:52.297] if (!has_future || version < "1.8.0") { [18:41:52.297] info <- base::c(r_version = base::gsub("R version ", [18:41:52.297] "", base::R.version$version.string), [18:41:52.297] platform = base::sprintf("%s (%s-bit)", [18:41:52.297] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.297] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.297] "release", "version")], collapse = " "), [18:41:52.297] hostname = base::Sys.info()[["nodename"]]) [18:41:52.297] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.297] info) [18:41:52.297] info <- base::paste(info, collapse = "; ") [18:41:52.297] if (!has_future) { [18:41:52.297] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.297] info) [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.297] info, version) [18:41:52.297] } [18:41:52.297] base::stop(msg) [18:41:52.297] } [18:41:52.297] }) [18:41:52.297] } [18:41:52.297] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.297] base::options(mc.cores = 1L) [18:41:52.297] } [18:41:52.297] ...future.strategy.old <- future::plan("list") [18:41:52.297] options(future.plan = NULL) [18:41:52.297] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.297] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.297] } [18:41:52.297] ...future.workdir <- getwd() [18:41:52.297] } [18:41:52.297] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.297] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.297] } [18:41:52.297] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.297] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.297] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.297] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.297] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.297] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.297] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.297] base::names(...future.oldOptions)) [18:41:52.297] } [18:41:52.297] if (FALSE) { [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] if (TRUE) { [18:41:52.297] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.297] open = "w") [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.297] windows = "NUL", "/dev/null"), open = "w") [18:41:52.297] } [18:41:52.297] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.297] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.297] base::sink(type = "output", split = FALSE) [18:41:52.297] base::close(...future.stdout) [18:41:52.297] }, add = TRUE) [18:41:52.297] } [18:41:52.297] ...future.frame <- base::sys.nframe() [18:41:52.297] ...future.conditions <- base::list() [18:41:52.297] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.297] if (FALSE) { [18:41:52.297] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.297] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.297] } [18:41:52.297] ...future.result <- base::tryCatch({ [18:41:52.297] base::withCallingHandlers({ [18:41:52.297] ...future.value <- base::withVisible(base::local({ [18:41:52.297] ...future.makeSendCondition <- base::local({ [18:41:52.297] sendCondition <- NULL [18:41:52.297] function(frame = 1L) { [18:41:52.297] if (is.function(sendCondition)) [18:41:52.297] return(sendCondition) [18:41:52.297] ns <- getNamespace("parallel") [18:41:52.297] if (exists("sendData", mode = "function", [18:41:52.297] envir = ns)) { [18:41:52.297] parallel_sendData <- get("sendData", mode = "function", [18:41:52.297] envir = ns) [18:41:52.297] envir <- sys.frame(frame) [18:41:52.297] master <- NULL [18:41:52.297] while (!identical(envir, .GlobalEnv) && [18:41:52.297] !identical(envir, emptyenv())) { [18:41:52.297] if (exists("master", mode = "list", envir = envir, [18:41:52.297] inherits = FALSE)) { [18:41:52.297] master <- get("master", mode = "list", [18:41:52.297] envir = envir, inherits = FALSE) [18:41:52.297] if (inherits(master, c("SOCKnode", [18:41:52.297] "SOCK0node"))) { [18:41:52.297] sendCondition <<- function(cond) { [18:41:52.297] data <- list(type = "VALUE", value = cond, [18:41:52.297] success = TRUE) [18:41:52.297] parallel_sendData(master, data) [18:41:52.297] } [18:41:52.297] return(sendCondition) [18:41:52.297] } [18:41:52.297] } [18:41:52.297] frame <- frame + 1L [18:41:52.297] envir <- sys.frame(frame) [18:41:52.297] } [18:41:52.297] } [18:41:52.297] sendCondition <<- function(cond) NULL [18:41:52.297] } [18:41:52.297] }) [18:41:52.297] withCallingHandlers({ [18:41:52.297] { [18:41:52.297] do.call(function(...) { [18:41:52.297] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.297] if (!identical(...future.globals.maxSize.org, [18:41:52.297] ...future.globals.maxSize)) { [18:41:52.297] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.297] on.exit(options(oopts), add = TRUE) [18:41:52.297] } [18:41:52.297] { [18:41:52.297] lapply(seq_along(...future.elements_ii), [18:41:52.297] FUN = function(jj) { [18:41:52.297] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.297] ...future.FUN(...future.X_jj, ...) [18:41:52.297] }) [18:41:52.297] } [18:41:52.297] }, args = future.call.arguments) [18:41:52.297] } [18:41:52.297] }, immediateCondition = function(cond) { [18:41:52.297] sendCondition <- ...future.makeSendCondition() [18:41:52.297] sendCondition(cond) [18:41:52.297] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.297] { [18:41:52.297] inherits <- base::inherits [18:41:52.297] invokeRestart <- base::invokeRestart [18:41:52.297] is.null <- base::is.null [18:41:52.297] muffled <- FALSE [18:41:52.297] if (inherits(cond, "message")) { [18:41:52.297] muffled <- grepl(pattern, "muffleMessage") [18:41:52.297] if (muffled) [18:41:52.297] invokeRestart("muffleMessage") [18:41:52.297] } [18:41:52.297] else if (inherits(cond, "warning")) { [18:41:52.297] muffled <- grepl(pattern, "muffleWarning") [18:41:52.297] if (muffled) [18:41:52.297] invokeRestart("muffleWarning") [18:41:52.297] } [18:41:52.297] else if (inherits(cond, "condition")) { [18:41:52.297] if (!is.null(pattern)) { [18:41:52.297] computeRestarts <- base::computeRestarts [18:41:52.297] grepl <- base::grepl [18:41:52.297] restarts <- computeRestarts(cond) [18:41:52.297] for (restart in restarts) { [18:41:52.297] name <- restart$name [18:41:52.297] if (is.null(name)) [18:41:52.297] next [18:41:52.297] if (!grepl(pattern, name)) [18:41:52.297] next [18:41:52.297] invokeRestart(restart) [18:41:52.297] muffled <- TRUE [18:41:52.297] break [18:41:52.297] } [18:41:52.297] } [18:41:52.297] } [18:41:52.297] invisible(muffled) [18:41:52.297] } [18:41:52.297] muffleCondition(cond) [18:41:52.297] }) [18:41:52.297] })) [18:41:52.297] future::FutureResult(value = ...future.value$value, [18:41:52.297] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.297] ...future.rng), globalenv = if (FALSE) [18:41:52.297] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.297] ...future.globalenv.names)) [18:41:52.297] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.297] }, condition = base::local({ [18:41:52.297] c <- base::c [18:41:52.297] inherits <- base::inherits [18:41:52.297] invokeRestart <- base::invokeRestart [18:41:52.297] length <- base::length [18:41:52.297] list <- base::list [18:41:52.297] seq.int <- base::seq.int [18:41:52.297] signalCondition <- base::signalCondition [18:41:52.297] sys.calls <- base::sys.calls [18:41:52.297] `[[` <- base::`[[` [18:41:52.297] `+` <- base::`+` [18:41:52.297] `<<-` <- base::`<<-` [18:41:52.297] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.297] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.297] 3L)] [18:41:52.297] } [18:41:52.297] function(cond) { [18:41:52.297] is_error <- inherits(cond, "error") [18:41:52.297] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.297] NULL) [18:41:52.297] if (is_error) { [18:41:52.297] sessionInformation <- function() { [18:41:52.297] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.297] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.297] search = base::search(), system = base::Sys.info()) [18:41:52.297] } [18:41:52.297] ...future.conditions[[length(...future.conditions) + [18:41:52.297] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.297] cond$call), session = sessionInformation(), [18:41:52.297] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.297] signalCondition(cond) [18:41:52.297] } [18:41:52.297] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.297] "immediateCondition"))) { [18:41:52.297] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.297] ...future.conditions[[length(...future.conditions) + [18:41:52.297] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.297] if (TRUE && !signal) { [18:41:52.297] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.297] { [18:41:52.297] inherits <- base::inherits [18:41:52.297] invokeRestart <- base::invokeRestart [18:41:52.297] is.null <- base::is.null [18:41:52.297] muffled <- FALSE [18:41:52.297] if (inherits(cond, "message")) { [18:41:52.297] muffled <- grepl(pattern, "muffleMessage") [18:41:52.297] if (muffled) [18:41:52.297] invokeRestart("muffleMessage") [18:41:52.297] } [18:41:52.297] else if (inherits(cond, "warning")) { [18:41:52.297] muffled <- grepl(pattern, "muffleWarning") [18:41:52.297] if (muffled) [18:41:52.297] invokeRestart("muffleWarning") [18:41:52.297] } [18:41:52.297] else if (inherits(cond, "condition")) { [18:41:52.297] if (!is.null(pattern)) { [18:41:52.297] computeRestarts <- base::computeRestarts [18:41:52.297] grepl <- base::grepl [18:41:52.297] restarts <- computeRestarts(cond) [18:41:52.297] for (restart in restarts) { [18:41:52.297] name <- restart$name [18:41:52.297] if (is.null(name)) [18:41:52.297] next [18:41:52.297] if (!grepl(pattern, name)) [18:41:52.297] next [18:41:52.297] invokeRestart(restart) [18:41:52.297] muffled <- TRUE [18:41:52.297] break [18:41:52.297] } [18:41:52.297] } [18:41:52.297] } [18:41:52.297] invisible(muffled) [18:41:52.297] } [18:41:52.297] muffleCondition(cond, pattern = "^muffle") [18:41:52.297] } [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] if (TRUE) { [18:41:52.297] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.297] { [18:41:52.297] inherits <- base::inherits [18:41:52.297] invokeRestart <- base::invokeRestart [18:41:52.297] is.null <- base::is.null [18:41:52.297] muffled <- FALSE [18:41:52.297] if (inherits(cond, "message")) { [18:41:52.297] muffled <- grepl(pattern, "muffleMessage") [18:41:52.297] if (muffled) [18:41:52.297] invokeRestart("muffleMessage") [18:41:52.297] } [18:41:52.297] else if (inherits(cond, "warning")) { [18:41:52.297] muffled <- grepl(pattern, "muffleWarning") [18:41:52.297] if (muffled) [18:41:52.297] invokeRestart("muffleWarning") [18:41:52.297] } [18:41:52.297] else if (inherits(cond, "condition")) { [18:41:52.297] if (!is.null(pattern)) { [18:41:52.297] computeRestarts <- base::computeRestarts [18:41:52.297] grepl <- base::grepl [18:41:52.297] restarts <- computeRestarts(cond) [18:41:52.297] for (restart in restarts) { [18:41:52.297] name <- restart$name [18:41:52.297] if (is.null(name)) [18:41:52.297] next [18:41:52.297] if (!grepl(pattern, name)) [18:41:52.297] next [18:41:52.297] invokeRestart(restart) [18:41:52.297] muffled <- TRUE [18:41:52.297] break [18:41:52.297] } [18:41:52.297] } [18:41:52.297] } [18:41:52.297] invisible(muffled) [18:41:52.297] } [18:41:52.297] muffleCondition(cond, pattern = "^muffle") [18:41:52.297] } [18:41:52.297] } [18:41:52.297] } [18:41:52.297] })) [18:41:52.297] }, error = function(ex) { [18:41:52.297] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.297] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.297] ...future.rng), started = ...future.startTime, [18:41:52.297] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.297] version = "1.8"), class = "FutureResult") [18:41:52.297] }, finally = { [18:41:52.297] if (!identical(...future.workdir, getwd())) [18:41:52.297] setwd(...future.workdir) [18:41:52.297] { [18:41:52.297] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.297] ...future.oldOptions$nwarnings <- NULL [18:41:52.297] } [18:41:52.297] base::options(...future.oldOptions) [18:41:52.297] if (.Platform$OS.type == "windows") { [18:41:52.297] old_names <- names(...future.oldEnvVars) [18:41:52.297] envs <- base::Sys.getenv() [18:41:52.297] names <- names(envs) [18:41:52.297] common <- intersect(names, old_names) [18:41:52.297] added <- setdiff(names, old_names) [18:41:52.297] removed <- setdiff(old_names, names) [18:41:52.297] changed <- common[...future.oldEnvVars[common] != [18:41:52.297] envs[common]] [18:41:52.297] NAMES <- toupper(changed) [18:41:52.297] args <- list() [18:41:52.297] for (kk in seq_along(NAMES)) { [18:41:52.297] name <- changed[[kk]] [18:41:52.297] NAME <- NAMES[[kk]] [18:41:52.297] if (name != NAME && is.element(NAME, old_names)) [18:41:52.297] next [18:41:52.297] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.297] } [18:41:52.297] NAMES <- toupper(added) [18:41:52.297] for (kk in seq_along(NAMES)) { [18:41:52.297] name <- added[[kk]] [18:41:52.297] NAME <- NAMES[[kk]] [18:41:52.297] if (name != NAME && is.element(NAME, old_names)) [18:41:52.297] next [18:41:52.297] args[[name]] <- "" [18:41:52.297] } [18:41:52.297] NAMES <- toupper(removed) [18:41:52.297] for (kk in seq_along(NAMES)) { [18:41:52.297] name <- removed[[kk]] [18:41:52.297] NAME <- NAMES[[kk]] [18:41:52.297] if (name != NAME && is.element(NAME, old_names)) [18:41:52.297] next [18:41:52.297] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.297] } [18:41:52.297] if (length(args) > 0) [18:41:52.297] base::do.call(base::Sys.setenv, args = args) [18:41:52.297] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.297] } [18:41:52.297] { [18:41:52.297] if (base::length(...future.futureOptionsAdded) > [18:41:52.297] 0L) { [18:41:52.297] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.297] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.297] base::options(opts) [18:41:52.297] } [18:41:52.297] { [18:41:52.297] { [18:41:52.297] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.297] NULL [18:41:52.297] } [18:41:52.297] options(future.plan = NULL) [18:41:52.297] if (is.na(NA_character_)) [18:41:52.297] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.297] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.297] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.297] .init = FALSE) [18:41:52.297] } [18:41:52.297] } [18:41:52.297] } [18:41:52.297] }) [18:41:52.297] if (TRUE) { [18:41:52.297] base::sink(type = "output", split = FALSE) [18:41:52.297] if (TRUE) { [18:41:52.297] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.297] } [18:41:52.297] else { [18:41:52.297] ...future.result["stdout"] <- base::list(NULL) [18:41:52.297] } [18:41:52.297] base::close(...future.stdout) [18:41:52.297] ...future.stdout <- NULL [18:41:52.297] } [18:41:52.297] ...future.result$conditions <- ...future.conditions [18:41:52.297] ...future.result$finished <- base::Sys.time() [18:41:52.297] ...future.result [18:41:52.297] } [18:41:52.306] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:52.306] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:52.307] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:52.307] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.308] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.308] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.309] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.309] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.310] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.310] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.311] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.311] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:52.312] MultisessionFuture started [18:41:52.313] - Launch lazy future ... done [18:41:52.313] run() for 'MultisessionFuture' ... done [18:41:52.313] Created future: [18:41:52.327] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.327] - Validating connection of MultisessionFuture [18:41:52.328] - received message: FutureResult [18:41:52.328] - Received FutureResult [18:41:52.328] - Erased future from FutureRegistry [18:41:52.329] result() for ClusterFuture ... [18:41:52.329] - result already collected: FutureResult [18:41:52.329] result() for ClusterFuture ... done [18:41:52.329] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.313] MultisessionFuture: [18:41:52.313] Label: 'future_sapply-1' [18:41:52.313] Expression: [18:41:52.313] { [18:41:52.313] do.call(function(...) { [18:41:52.313] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.313] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.313] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.313] on.exit(options(oopts), add = TRUE) [18:41:52.313] } [18:41:52.313] { [18:41:52.313] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.313] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.313] ...future.FUN(...future.X_jj, ...) [18:41:52.313] }) [18:41:52.313] } [18:41:52.313] }, args = future.call.arguments) [18:41:52.313] } [18:41:52.313] Lazy evaluation: FALSE [18:41:52.313] Asynchronous evaluation: TRUE [18:41:52.313] Local evaluation: TRUE [18:41:52.313] Environment: R_GlobalEnv [18:41:52.313] Capture standard output: TRUE [18:41:52.313] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.313] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.313] Packages: [18:41:52.313] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.313] Resolved: TRUE [18:41:52.313] Value: [18:41:52.313] Conditions captured: [18:41:52.313] Early signaling: FALSE [18:41:52.313] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.313] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.330] Chunk #1 of 2 ... DONE [18:41:52.330] Chunk #2 of 2 ... [18:41:52.331] - Finding globals in 'X' for chunk #2 ... [18:41:52.331] getGlobalsAndPackages() ... [18:41:52.331] Searching for globals... [18:41:52.332] [18:41:52.332] Searching for globals ... DONE [18:41:52.333] - globals: [0] [18:41:52.333] getGlobalsAndPackages() ... DONE [18:41:52.333] + additional globals found: [n=0] [18:41:52.333] + additional namespaces needed: [n=0] [18:41:52.334] - Finding globals in 'X' for chunk #2 ... DONE [18:41:52.334] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.334] - seeds: [18:41:52.335] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.335] getGlobalsAndPackages() ... [18:41:52.335] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.336] Resolving globals: FALSE [18:41:52.336] Tweak future expression to call with '...' arguments ... [18:41:52.336] { [18:41:52.336] do.call(function(...) { [18:41:52.336] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.336] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.336] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.336] on.exit(options(oopts), add = TRUE) [18:41:52.336] } [18:41:52.336] { [18:41:52.336] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.336] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.336] ...future.FUN(...future.X_jj, ...) [18:41:52.336] }) [18:41:52.336] } [18:41:52.336] }, args = future.call.arguments) [18:41:52.336] } [18:41:52.337] Tweak future expression to call with '...' arguments ... DONE [18:41:52.338] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.338] [18:41:52.338] getGlobalsAndPackages() ... DONE [18:41:52.339] run() for 'Future' ... [18:41:52.339] - state: 'created' [18:41:52.340] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.369] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.369] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.369] - Field: 'node' [18:41:52.370] - Field: 'label' [18:41:52.370] - Field: 'local' [18:41:52.370] - Field: 'owner' [18:41:52.371] - Field: 'envir' [18:41:52.371] - Field: 'workers' [18:41:52.371] - Field: 'packages' [18:41:52.372] - Field: 'gc' [18:41:52.372] - Field: 'conditions' [18:41:52.372] - Field: 'persistent' [18:41:52.373] - Field: 'expr' [18:41:52.373] - Field: 'uuid' [18:41:52.373] - Field: 'seed' [18:41:52.374] - Field: 'version' [18:41:52.374] - Field: 'result' [18:41:52.374] - Field: 'asynchronous' [18:41:52.375] - Field: 'calls' [18:41:52.375] - Field: 'globals' [18:41:52.375] - Field: 'stdout' [18:41:52.376] - Field: 'earlySignal' [18:41:52.376] - Field: 'lazy' [18:41:52.376] - Field: 'state' [18:41:52.376] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.377] - Launch lazy future ... [18:41:52.378] Packages needed by the future expression (n = 0): [18:41:52.378] Packages needed by future strategies (n = 0): [18:41:52.379] { [18:41:52.379] { [18:41:52.379] { [18:41:52.379] ...future.startTime <- base::Sys.time() [18:41:52.379] { [18:41:52.379] { [18:41:52.379] { [18:41:52.379] { [18:41:52.379] base::local({ [18:41:52.379] has_future <- base::requireNamespace("future", [18:41:52.379] quietly = TRUE) [18:41:52.379] if (has_future) { [18:41:52.379] ns <- base::getNamespace("future") [18:41:52.379] version <- ns[[".package"]][["version"]] [18:41:52.379] if (is.null(version)) [18:41:52.379] version <- utils::packageVersion("future") [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] version <- NULL [18:41:52.379] } [18:41:52.379] if (!has_future || version < "1.8.0") { [18:41:52.379] info <- base::c(r_version = base::gsub("R version ", [18:41:52.379] "", base::R.version$version.string), [18:41:52.379] platform = base::sprintf("%s (%s-bit)", [18:41:52.379] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.379] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.379] "release", "version")], collapse = " "), [18:41:52.379] hostname = base::Sys.info()[["nodename"]]) [18:41:52.379] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.379] info) [18:41:52.379] info <- base::paste(info, collapse = "; ") [18:41:52.379] if (!has_future) { [18:41:52.379] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.379] info) [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.379] info, version) [18:41:52.379] } [18:41:52.379] base::stop(msg) [18:41:52.379] } [18:41:52.379] }) [18:41:52.379] } [18:41:52.379] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.379] base::options(mc.cores = 1L) [18:41:52.379] } [18:41:52.379] ...future.strategy.old <- future::plan("list") [18:41:52.379] options(future.plan = NULL) [18:41:52.379] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.379] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.379] } [18:41:52.379] ...future.workdir <- getwd() [18:41:52.379] } [18:41:52.379] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.379] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.379] } [18:41:52.379] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.379] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.379] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.379] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.379] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.379] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.379] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.379] base::names(...future.oldOptions)) [18:41:52.379] } [18:41:52.379] if (FALSE) { [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] if (TRUE) { [18:41:52.379] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.379] open = "w") [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.379] windows = "NUL", "/dev/null"), open = "w") [18:41:52.379] } [18:41:52.379] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.379] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.379] base::sink(type = "output", split = FALSE) [18:41:52.379] base::close(...future.stdout) [18:41:52.379] }, add = TRUE) [18:41:52.379] } [18:41:52.379] ...future.frame <- base::sys.nframe() [18:41:52.379] ...future.conditions <- base::list() [18:41:52.379] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.379] if (FALSE) { [18:41:52.379] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.379] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.379] } [18:41:52.379] ...future.result <- base::tryCatch({ [18:41:52.379] base::withCallingHandlers({ [18:41:52.379] ...future.value <- base::withVisible(base::local({ [18:41:52.379] ...future.makeSendCondition <- base::local({ [18:41:52.379] sendCondition <- NULL [18:41:52.379] function(frame = 1L) { [18:41:52.379] if (is.function(sendCondition)) [18:41:52.379] return(sendCondition) [18:41:52.379] ns <- getNamespace("parallel") [18:41:52.379] if (exists("sendData", mode = "function", [18:41:52.379] envir = ns)) { [18:41:52.379] parallel_sendData <- get("sendData", mode = "function", [18:41:52.379] envir = ns) [18:41:52.379] envir <- sys.frame(frame) [18:41:52.379] master <- NULL [18:41:52.379] while (!identical(envir, .GlobalEnv) && [18:41:52.379] !identical(envir, emptyenv())) { [18:41:52.379] if (exists("master", mode = "list", envir = envir, [18:41:52.379] inherits = FALSE)) { [18:41:52.379] master <- get("master", mode = "list", [18:41:52.379] envir = envir, inherits = FALSE) [18:41:52.379] if (inherits(master, c("SOCKnode", [18:41:52.379] "SOCK0node"))) { [18:41:52.379] sendCondition <<- function(cond) { [18:41:52.379] data <- list(type = "VALUE", value = cond, [18:41:52.379] success = TRUE) [18:41:52.379] parallel_sendData(master, data) [18:41:52.379] } [18:41:52.379] return(sendCondition) [18:41:52.379] } [18:41:52.379] } [18:41:52.379] frame <- frame + 1L [18:41:52.379] envir <- sys.frame(frame) [18:41:52.379] } [18:41:52.379] } [18:41:52.379] sendCondition <<- function(cond) NULL [18:41:52.379] } [18:41:52.379] }) [18:41:52.379] withCallingHandlers({ [18:41:52.379] { [18:41:52.379] do.call(function(...) { [18:41:52.379] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.379] if (!identical(...future.globals.maxSize.org, [18:41:52.379] ...future.globals.maxSize)) { [18:41:52.379] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.379] on.exit(options(oopts), add = TRUE) [18:41:52.379] } [18:41:52.379] { [18:41:52.379] lapply(seq_along(...future.elements_ii), [18:41:52.379] FUN = function(jj) { [18:41:52.379] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.379] ...future.FUN(...future.X_jj, ...) [18:41:52.379] }) [18:41:52.379] } [18:41:52.379] }, args = future.call.arguments) [18:41:52.379] } [18:41:52.379] }, immediateCondition = function(cond) { [18:41:52.379] sendCondition <- ...future.makeSendCondition() [18:41:52.379] sendCondition(cond) [18:41:52.379] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.379] { [18:41:52.379] inherits <- base::inherits [18:41:52.379] invokeRestart <- base::invokeRestart [18:41:52.379] is.null <- base::is.null [18:41:52.379] muffled <- FALSE [18:41:52.379] if (inherits(cond, "message")) { [18:41:52.379] muffled <- grepl(pattern, "muffleMessage") [18:41:52.379] if (muffled) [18:41:52.379] invokeRestart("muffleMessage") [18:41:52.379] } [18:41:52.379] else if (inherits(cond, "warning")) { [18:41:52.379] muffled <- grepl(pattern, "muffleWarning") [18:41:52.379] if (muffled) [18:41:52.379] invokeRestart("muffleWarning") [18:41:52.379] } [18:41:52.379] else if (inherits(cond, "condition")) { [18:41:52.379] if (!is.null(pattern)) { [18:41:52.379] computeRestarts <- base::computeRestarts [18:41:52.379] grepl <- base::grepl [18:41:52.379] restarts <- computeRestarts(cond) [18:41:52.379] for (restart in restarts) { [18:41:52.379] name <- restart$name [18:41:52.379] if (is.null(name)) [18:41:52.379] next [18:41:52.379] if (!grepl(pattern, name)) [18:41:52.379] next [18:41:52.379] invokeRestart(restart) [18:41:52.379] muffled <- TRUE [18:41:52.379] break [18:41:52.379] } [18:41:52.379] } [18:41:52.379] } [18:41:52.379] invisible(muffled) [18:41:52.379] } [18:41:52.379] muffleCondition(cond) [18:41:52.379] }) [18:41:52.379] })) [18:41:52.379] future::FutureResult(value = ...future.value$value, [18:41:52.379] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.379] ...future.rng), globalenv = if (FALSE) [18:41:52.379] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.379] ...future.globalenv.names)) [18:41:52.379] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.379] }, condition = base::local({ [18:41:52.379] c <- base::c [18:41:52.379] inherits <- base::inherits [18:41:52.379] invokeRestart <- base::invokeRestart [18:41:52.379] length <- base::length [18:41:52.379] list <- base::list [18:41:52.379] seq.int <- base::seq.int [18:41:52.379] signalCondition <- base::signalCondition [18:41:52.379] sys.calls <- base::sys.calls [18:41:52.379] `[[` <- base::`[[` [18:41:52.379] `+` <- base::`+` [18:41:52.379] `<<-` <- base::`<<-` [18:41:52.379] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.379] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.379] 3L)] [18:41:52.379] } [18:41:52.379] function(cond) { [18:41:52.379] is_error <- inherits(cond, "error") [18:41:52.379] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.379] NULL) [18:41:52.379] if (is_error) { [18:41:52.379] sessionInformation <- function() { [18:41:52.379] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.379] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.379] search = base::search(), system = base::Sys.info()) [18:41:52.379] } [18:41:52.379] ...future.conditions[[length(...future.conditions) + [18:41:52.379] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.379] cond$call), session = sessionInformation(), [18:41:52.379] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.379] signalCondition(cond) [18:41:52.379] } [18:41:52.379] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.379] "immediateCondition"))) { [18:41:52.379] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.379] ...future.conditions[[length(...future.conditions) + [18:41:52.379] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.379] if (TRUE && !signal) { [18:41:52.379] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.379] { [18:41:52.379] inherits <- base::inherits [18:41:52.379] invokeRestart <- base::invokeRestart [18:41:52.379] is.null <- base::is.null [18:41:52.379] muffled <- FALSE [18:41:52.379] if (inherits(cond, "message")) { [18:41:52.379] muffled <- grepl(pattern, "muffleMessage") [18:41:52.379] if (muffled) [18:41:52.379] invokeRestart("muffleMessage") [18:41:52.379] } [18:41:52.379] else if (inherits(cond, "warning")) { [18:41:52.379] muffled <- grepl(pattern, "muffleWarning") [18:41:52.379] if (muffled) [18:41:52.379] invokeRestart("muffleWarning") [18:41:52.379] } [18:41:52.379] else if (inherits(cond, "condition")) { [18:41:52.379] if (!is.null(pattern)) { [18:41:52.379] computeRestarts <- base::computeRestarts [18:41:52.379] grepl <- base::grepl [18:41:52.379] restarts <- computeRestarts(cond) [18:41:52.379] for (restart in restarts) { [18:41:52.379] name <- restart$name [18:41:52.379] if (is.null(name)) [18:41:52.379] next [18:41:52.379] if (!grepl(pattern, name)) [18:41:52.379] next [18:41:52.379] invokeRestart(restart) [18:41:52.379] muffled <- TRUE [18:41:52.379] break [18:41:52.379] } [18:41:52.379] } [18:41:52.379] } [18:41:52.379] invisible(muffled) [18:41:52.379] } [18:41:52.379] muffleCondition(cond, pattern = "^muffle") [18:41:52.379] } [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] if (TRUE) { [18:41:52.379] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.379] { [18:41:52.379] inherits <- base::inherits [18:41:52.379] invokeRestart <- base::invokeRestart [18:41:52.379] is.null <- base::is.null [18:41:52.379] muffled <- FALSE [18:41:52.379] if (inherits(cond, "message")) { [18:41:52.379] muffled <- grepl(pattern, "muffleMessage") [18:41:52.379] if (muffled) [18:41:52.379] invokeRestart("muffleMessage") [18:41:52.379] } [18:41:52.379] else if (inherits(cond, "warning")) { [18:41:52.379] muffled <- grepl(pattern, "muffleWarning") [18:41:52.379] if (muffled) [18:41:52.379] invokeRestart("muffleWarning") [18:41:52.379] } [18:41:52.379] else if (inherits(cond, "condition")) { [18:41:52.379] if (!is.null(pattern)) { [18:41:52.379] computeRestarts <- base::computeRestarts [18:41:52.379] grepl <- base::grepl [18:41:52.379] restarts <- computeRestarts(cond) [18:41:52.379] for (restart in restarts) { [18:41:52.379] name <- restart$name [18:41:52.379] if (is.null(name)) [18:41:52.379] next [18:41:52.379] if (!grepl(pattern, name)) [18:41:52.379] next [18:41:52.379] invokeRestart(restart) [18:41:52.379] muffled <- TRUE [18:41:52.379] break [18:41:52.379] } [18:41:52.379] } [18:41:52.379] } [18:41:52.379] invisible(muffled) [18:41:52.379] } [18:41:52.379] muffleCondition(cond, pattern = "^muffle") [18:41:52.379] } [18:41:52.379] } [18:41:52.379] } [18:41:52.379] })) [18:41:52.379] }, error = function(ex) { [18:41:52.379] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.379] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.379] ...future.rng), started = ...future.startTime, [18:41:52.379] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.379] version = "1.8"), class = "FutureResult") [18:41:52.379] }, finally = { [18:41:52.379] if (!identical(...future.workdir, getwd())) [18:41:52.379] setwd(...future.workdir) [18:41:52.379] { [18:41:52.379] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.379] ...future.oldOptions$nwarnings <- NULL [18:41:52.379] } [18:41:52.379] base::options(...future.oldOptions) [18:41:52.379] if (.Platform$OS.type == "windows") { [18:41:52.379] old_names <- names(...future.oldEnvVars) [18:41:52.379] envs <- base::Sys.getenv() [18:41:52.379] names <- names(envs) [18:41:52.379] common <- intersect(names, old_names) [18:41:52.379] added <- setdiff(names, old_names) [18:41:52.379] removed <- setdiff(old_names, names) [18:41:52.379] changed <- common[...future.oldEnvVars[common] != [18:41:52.379] envs[common]] [18:41:52.379] NAMES <- toupper(changed) [18:41:52.379] args <- list() [18:41:52.379] for (kk in seq_along(NAMES)) { [18:41:52.379] name <- changed[[kk]] [18:41:52.379] NAME <- NAMES[[kk]] [18:41:52.379] if (name != NAME && is.element(NAME, old_names)) [18:41:52.379] next [18:41:52.379] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.379] } [18:41:52.379] NAMES <- toupper(added) [18:41:52.379] for (kk in seq_along(NAMES)) { [18:41:52.379] name <- added[[kk]] [18:41:52.379] NAME <- NAMES[[kk]] [18:41:52.379] if (name != NAME && is.element(NAME, old_names)) [18:41:52.379] next [18:41:52.379] args[[name]] <- "" [18:41:52.379] } [18:41:52.379] NAMES <- toupper(removed) [18:41:52.379] for (kk in seq_along(NAMES)) { [18:41:52.379] name <- removed[[kk]] [18:41:52.379] NAME <- NAMES[[kk]] [18:41:52.379] if (name != NAME && is.element(NAME, old_names)) [18:41:52.379] next [18:41:52.379] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.379] } [18:41:52.379] if (length(args) > 0) [18:41:52.379] base::do.call(base::Sys.setenv, args = args) [18:41:52.379] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.379] } [18:41:52.379] { [18:41:52.379] if (base::length(...future.futureOptionsAdded) > [18:41:52.379] 0L) { [18:41:52.379] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.379] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.379] base::options(opts) [18:41:52.379] } [18:41:52.379] { [18:41:52.379] { [18:41:52.379] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.379] NULL [18:41:52.379] } [18:41:52.379] options(future.plan = NULL) [18:41:52.379] if (is.na(NA_character_)) [18:41:52.379] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.379] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.379] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.379] .init = FALSE) [18:41:52.379] } [18:41:52.379] } [18:41:52.379] } [18:41:52.379] }) [18:41:52.379] if (TRUE) { [18:41:52.379] base::sink(type = "output", split = FALSE) [18:41:52.379] if (TRUE) { [18:41:52.379] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.379] } [18:41:52.379] else { [18:41:52.379] ...future.result["stdout"] <- base::list(NULL) [18:41:52.379] } [18:41:52.379] base::close(...future.stdout) [18:41:52.379] ...future.stdout <- NULL [18:41:52.379] } [18:41:52.379] ...future.result$conditions <- ...future.conditions [18:41:52.379] ...future.result$finished <- base::Sys.time() [18:41:52.379] ...future.result [18:41:52.379] } [18:41:52.388] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:52.388] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:52.389] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:52.389] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.390] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.390] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.391] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.391] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.392] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.392] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.393] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.393] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:52.394] MultisessionFuture started [18:41:52.395] - Launch lazy future ... done [18:41:52.395] run() for 'MultisessionFuture' ... done [18:41:52.395] Created future: [18:41:52.408] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.408] - Validating connection of MultisessionFuture [18:41:52.409] - received message: FutureResult [18:41:52.409] - Received FutureResult [18:41:52.409] - Erased future from FutureRegistry [18:41:52.410] result() for ClusterFuture ... [18:41:52.410] - result already collected: FutureResult [18:41:52.410] result() for ClusterFuture ... done [18:41:52.411] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.396] MultisessionFuture: [18:41:52.396] Label: 'future_sapply-2' [18:41:52.396] Expression: [18:41:52.396] { [18:41:52.396] do.call(function(...) { [18:41:52.396] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.396] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.396] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.396] on.exit(options(oopts), add = TRUE) [18:41:52.396] } [18:41:52.396] { [18:41:52.396] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.396] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.396] ...future.FUN(...future.X_jj, ...) [18:41:52.396] }) [18:41:52.396] } [18:41:52.396] }, args = future.call.arguments) [18:41:52.396] } [18:41:52.396] Lazy evaluation: FALSE [18:41:52.396] Asynchronous evaluation: TRUE [18:41:52.396] Local evaluation: TRUE [18:41:52.396] Environment: R_GlobalEnv [18:41:52.396] Capture standard output: TRUE [18:41:52.396] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.396] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.396] Packages: [18:41:52.396] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.396] Resolved: TRUE [18:41:52.396] Value: [18:41:52.396] Conditions captured: [18:41:52.396] Early signaling: FALSE [18:41:52.396] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.396] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.412] Chunk #2 of 2 ... DONE [18:41:52.412] Launching 2 futures (chunks) ... DONE [18:41:52.412] Resolving 2 futures (chunks) ... [18:41:52.412] resolve() on list ... [18:41:52.413] recursive: 0 [18:41:52.413] length: 2 [18:41:52.413] [18:41:52.414] Future #1 [18:41:52.414] result() for ClusterFuture ... [18:41:52.414] - result already collected: FutureResult [18:41:52.415] result() for ClusterFuture ... done [18:41:52.415] result() for ClusterFuture ... [18:41:52.415] - result already collected: FutureResult [18:41:52.415] result() for ClusterFuture ... done [18:41:52.416] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:52.416] - nx: 2 [18:41:52.416] - relay: TRUE [18:41:52.417] - stdout: TRUE [18:41:52.417] - signal: TRUE [18:41:52.417] - resignal: FALSE [18:41:52.417] - force: TRUE [18:41:52.418] - relayed: [n=2] FALSE, FALSE [18:41:52.418] - queued futures: [n=2] FALSE, FALSE [18:41:52.418] - until=1 [18:41:52.419] - relaying element #1 [18:41:52.419] result() for ClusterFuture ... [18:41:52.419] - result already collected: FutureResult [18:41:52.419] result() for ClusterFuture ... done [18:41:52.420] result() for ClusterFuture ... [18:41:52.420] - result already collected: FutureResult [18:41:52.420] result() for ClusterFuture ... done [18:41:52.421] result() for ClusterFuture ... [18:41:52.421] - result already collected: FutureResult [18:41:52.421] result() for ClusterFuture ... done [18:41:52.422] result() for ClusterFuture ... [18:41:52.422] - result already collected: FutureResult [18:41:52.422] result() for ClusterFuture ... done [18:41:52.422] - relayed: [n=2] TRUE, FALSE [18:41:52.423] - queued futures: [n=2] TRUE, FALSE [18:41:52.423] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:52.423] length: 1 (resolved future 1) [18:41:52.424] Future #2 [18:41:52.424] result() for ClusterFuture ... [18:41:52.424] - result already collected: FutureResult [18:41:52.425] result() for ClusterFuture ... done [18:41:52.425] result() for ClusterFuture ... [18:41:52.425] - result already collected: FutureResult [18:41:52.425] result() for ClusterFuture ... done [18:41:52.426] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:52.426] - nx: 2 [18:41:52.426] - relay: TRUE [18:41:52.427] - stdout: TRUE [18:41:52.427] - signal: TRUE [18:41:52.427] - resignal: FALSE [18:41:52.427] - force: TRUE [18:41:52.428] - relayed: [n=2] TRUE, FALSE [18:41:52.428] - queued futures: [n=2] TRUE, FALSE [18:41:52.428] - until=2 [18:41:52.429] - relaying element #2 [18:41:52.429] result() for ClusterFuture ... [18:41:52.429] - result already collected: FutureResult [18:41:52.429] result() for ClusterFuture ... done [18:41:52.430] result() for ClusterFuture ... [18:41:52.430] - result already collected: FutureResult [18:41:52.430] result() for ClusterFuture ... done [18:41:52.431] result() for ClusterFuture ... [18:41:52.431] - result already collected: FutureResult [18:41:52.431] result() for ClusterFuture ... done [18:41:52.432] result() for ClusterFuture ... [18:41:52.432] - result already collected: FutureResult [18:41:52.432] result() for ClusterFuture ... done [18:41:52.432] - relayed: [n=2] TRUE, TRUE [18:41:52.433] - queued futures: [n=2] TRUE, TRUE [18:41:52.433] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:52.433] length: 0 (resolved future 2) [18:41:52.434] Relaying remaining futures [18:41:52.434] signalConditionsASAP(NULL, pos=0) ... [18:41:52.434] - nx: 2 [18:41:52.434] - relay: TRUE [18:41:52.435] - stdout: TRUE [18:41:52.435] - signal: TRUE [18:41:52.435] - resignal: FALSE [18:41:52.436] - force: TRUE [18:41:52.436] - relayed: [n=2] TRUE, TRUE [18:41:52.436] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:52.437] - relayed: [n=2] TRUE, TRUE [18:41:52.437] - queued futures: [n=2] TRUE, TRUE [18:41:52.437] signalConditionsASAP(NULL, pos=0) ... done [18:41:52.437] resolve() on list ... DONE [18:41:52.438] result() for ClusterFuture ... [18:41:52.438] - result already collected: FutureResult [18:41:52.438] result() for ClusterFuture ... done [18:41:52.439] result() for ClusterFuture ... [18:41:52.439] - result already collected: FutureResult [18:41:52.439] result() for ClusterFuture ... done [18:41:52.440] result() for ClusterFuture ... [18:41:52.440] - result already collected: FutureResult [18:41:52.440] result() for ClusterFuture ... done [18:41:52.440] result() for ClusterFuture ... [18:41:52.441] - result already collected: FutureResult [18:41:52.441] result() for ClusterFuture ... done [18:41:52.441] - Number of value chunks collected: 2 [18:41:52.442] Resolving 2 futures (chunks) ... DONE [18:41:52.442] Reducing values from 2 chunks ... [18:41:52.442] - Number of values collected after concatenation: 6 [18:41:52.442] - Number of values expected: 6 [18:41:52.443] Reducing values from 2 chunks ... DONE [18:41:52.443] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:15, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:52.449] future_lapply() ... [18:41:52.455] Number of chunks: 2 [18:41:52.455] getGlobalsAndPackagesXApply() ... [18:41:52.455] - future.globals: TRUE [18:41:52.455] getGlobalsAndPackages() ... [18:41:52.456] Searching for globals... [18:41:52.458] - globals found: [1] 'FUN' [18:41:52.458] Searching for globals ... DONE [18:41:52.459] Resolving globals: FALSE [18:41:52.459] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:52.460] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:52.460] - globals: [1] 'FUN' [18:41:52.461] [18:41:52.461] getGlobalsAndPackages() ... DONE [18:41:52.461] - globals found/used: [n=1] 'FUN' [18:41:52.462] - needed namespaces: [n=0] [18:41:52.462] Finding globals ... DONE [18:41:52.462] - use_args: TRUE [18:41:52.463] - Getting '...' globals ... [18:41:52.463] resolve() on list ... [18:41:52.464] recursive: 0 [18:41:52.464] length: 1 [18:41:52.464] elements: '...' [18:41:52.465] length: 0 (resolved future 1) [18:41:52.465] resolve() on list ... DONE [18:41:52.465] - '...' content: [n=0] [18:41:52.465] List of 1 [18:41:52.465] $ ...: list() [18:41:52.465] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.465] - attr(*, "where")=List of 1 [18:41:52.465] ..$ ...: [18:41:52.465] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.465] - attr(*, "resolved")= logi TRUE [18:41:52.465] - attr(*, "total_size")= num NA [18:41:52.471] - Getting '...' globals ... DONE [18:41:52.471] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:52.472] List of 2 [18:41:52.472] $ ...future.FUN:function (x) [18:41:52.472] $ ... : list() [18:41:52.472] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.472] - attr(*, "where")=List of 2 [18:41:52.472] ..$ ...future.FUN: [18:41:52.472] ..$ ... : [18:41:52.472] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.472] - attr(*, "resolved")= logi FALSE [18:41:52.472] - attr(*, "total_size")= int 4942 [18:41:52.478] Packages to be attached in all futures: [n=0] [18:41:52.478] getGlobalsAndPackagesXApply() ... DONE [18:41:52.478] Number of futures (= number of chunks): 2 [18:41:52.479] Launching 2 futures (chunks) ... [18:41:52.479] Chunk #1 of 2 ... [18:41:52.479] - Finding globals in 'X' for chunk #1 ... [18:41:52.480] getGlobalsAndPackages() ... [18:41:52.480] Searching for globals... [18:41:52.486] [18:41:52.486] Searching for globals ... DONE [18:41:52.486] - globals: [0] [18:41:52.486] getGlobalsAndPackages() ... DONE [18:41:52.487] + additional globals found: [n=0] [18:41:52.487] + additional namespaces needed: [n=0] [18:41:52.487] - Finding globals in 'X' for chunk #1 ... DONE [18:41:52.488] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.488] - seeds: [18:41:52.488] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.489] getGlobalsAndPackages() ... [18:41:52.489] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.489] Resolving globals: FALSE [18:41:52.490] Tweak future expression to call with '...' arguments ... [18:41:52.490] { [18:41:52.490] do.call(function(...) { [18:41:52.490] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.490] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.490] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.490] on.exit(options(oopts), add = TRUE) [18:41:52.490] } [18:41:52.490] { [18:41:52.490] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.490] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.490] ...future.FUN(...future.X_jj, ...) [18:41:52.490] }) [18:41:52.490] } [18:41:52.490] }, args = future.call.arguments) [18:41:52.490] } [18:41:52.491] Tweak future expression to call with '...' arguments ... DONE [18:41:52.492] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.492] [18:41:52.492] getGlobalsAndPackages() ... DONE [18:41:52.493] run() for 'Future' ... [18:41:52.493] - state: 'created' [18:41:52.494] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.523] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.523] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.524] - Field: 'node' [18:41:52.524] - Field: 'label' [18:41:52.524] - Field: 'local' [18:41:52.525] - Field: 'owner' [18:41:52.525] - Field: 'envir' [18:41:52.525] - Field: 'workers' [18:41:52.526] - Field: 'packages' [18:41:52.526] - Field: 'gc' [18:41:52.526] - Field: 'conditions' [18:41:52.527] - Field: 'persistent' [18:41:52.527] - Field: 'expr' [18:41:52.527] - Field: 'uuid' [18:41:52.528] - Field: 'seed' [18:41:52.528] - Field: 'version' [18:41:52.528] - Field: 'result' [18:41:52.529] - Field: 'asynchronous' [18:41:52.529] - Field: 'calls' [18:41:52.529] - Field: 'globals' [18:41:52.530] - Field: 'stdout' [18:41:52.530] - Field: 'earlySignal' [18:41:52.530] - Field: 'lazy' [18:41:52.531] - Field: 'state' [18:41:52.531] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.531] - Launch lazy future ... [18:41:52.532] Packages needed by the future expression (n = 0): [18:41:52.532] Packages needed by future strategies (n = 0): [18:41:52.533] { [18:41:52.533] { [18:41:52.533] { [18:41:52.533] ...future.startTime <- base::Sys.time() [18:41:52.533] { [18:41:52.533] { [18:41:52.533] { [18:41:52.533] { [18:41:52.533] base::local({ [18:41:52.533] has_future <- base::requireNamespace("future", [18:41:52.533] quietly = TRUE) [18:41:52.533] if (has_future) { [18:41:52.533] ns <- base::getNamespace("future") [18:41:52.533] version <- ns[[".package"]][["version"]] [18:41:52.533] if (is.null(version)) [18:41:52.533] version <- utils::packageVersion("future") [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] version <- NULL [18:41:52.533] } [18:41:52.533] if (!has_future || version < "1.8.0") { [18:41:52.533] info <- base::c(r_version = base::gsub("R version ", [18:41:52.533] "", base::R.version$version.string), [18:41:52.533] platform = base::sprintf("%s (%s-bit)", [18:41:52.533] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.533] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.533] "release", "version")], collapse = " "), [18:41:52.533] hostname = base::Sys.info()[["nodename"]]) [18:41:52.533] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.533] info) [18:41:52.533] info <- base::paste(info, collapse = "; ") [18:41:52.533] if (!has_future) { [18:41:52.533] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.533] info) [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.533] info, version) [18:41:52.533] } [18:41:52.533] base::stop(msg) [18:41:52.533] } [18:41:52.533] }) [18:41:52.533] } [18:41:52.533] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.533] base::options(mc.cores = 1L) [18:41:52.533] } [18:41:52.533] ...future.strategy.old <- future::plan("list") [18:41:52.533] options(future.plan = NULL) [18:41:52.533] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.533] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.533] } [18:41:52.533] ...future.workdir <- getwd() [18:41:52.533] } [18:41:52.533] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.533] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.533] } [18:41:52.533] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.533] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.533] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.533] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.533] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.533] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.533] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.533] base::names(...future.oldOptions)) [18:41:52.533] } [18:41:52.533] if (FALSE) { [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] if (TRUE) { [18:41:52.533] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.533] open = "w") [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.533] windows = "NUL", "/dev/null"), open = "w") [18:41:52.533] } [18:41:52.533] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.533] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.533] base::sink(type = "output", split = FALSE) [18:41:52.533] base::close(...future.stdout) [18:41:52.533] }, add = TRUE) [18:41:52.533] } [18:41:52.533] ...future.frame <- base::sys.nframe() [18:41:52.533] ...future.conditions <- base::list() [18:41:52.533] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.533] if (FALSE) { [18:41:52.533] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.533] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.533] } [18:41:52.533] ...future.result <- base::tryCatch({ [18:41:52.533] base::withCallingHandlers({ [18:41:52.533] ...future.value <- base::withVisible(base::local({ [18:41:52.533] ...future.makeSendCondition <- base::local({ [18:41:52.533] sendCondition <- NULL [18:41:52.533] function(frame = 1L) { [18:41:52.533] if (is.function(sendCondition)) [18:41:52.533] return(sendCondition) [18:41:52.533] ns <- getNamespace("parallel") [18:41:52.533] if (exists("sendData", mode = "function", [18:41:52.533] envir = ns)) { [18:41:52.533] parallel_sendData <- get("sendData", mode = "function", [18:41:52.533] envir = ns) [18:41:52.533] envir <- sys.frame(frame) [18:41:52.533] master <- NULL [18:41:52.533] while (!identical(envir, .GlobalEnv) && [18:41:52.533] !identical(envir, emptyenv())) { [18:41:52.533] if (exists("master", mode = "list", envir = envir, [18:41:52.533] inherits = FALSE)) { [18:41:52.533] master <- get("master", mode = "list", [18:41:52.533] envir = envir, inherits = FALSE) [18:41:52.533] if (inherits(master, c("SOCKnode", [18:41:52.533] "SOCK0node"))) { [18:41:52.533] sendCondition <<- function(cond) { [18:41:52.533] data <- list(type = "VALUE", value = cond, [18:41:52.533] success = TRUE) [18:41:52.533] parallel_sendData(master, data) [18:41:52.533] } [18:41:52.533] return(sendCondition) [18:41:52.533] } [18:41:52.533] } [18:41:52.533] frame <- frame + 1L [18:41:52.533] envir <- sys.frame(frame) [18:41:52.533] } [18:41:52.533] } [18:41:52.533] sendCondition <<- function(cond) NULL [18:41:52.533] } [18:41:52.533] }) [18:41:52.533] withCallingHandlers({ [18:41:52.533] { [18:41:52.533] do.call(function(...) { [18:41:52.533] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.533] if (!identical(...future.globals.maxSize.org, [18:41:52.533] ...future.globals.maxSize)) { [18:41:52.533] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.533] on.exit(options(oopts), add = TRUE) [18:41:52.533] } [18:41:52.533] { [18:41:52.533] lapply(seq_along(...future.elements_ii), [18:41:52.533] FUN = function(jj) { [18:41:52.533] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.533] ...future.FUN(...future.X_jj, ...) [18:41:52.533] }) [18:41:52.533] } [18:41:52.533] }, args = future.call.arguments) [18:41:52.533] } [18:41:52.533] }, immediateCondition = function(cond) { [18:41:52.533] sendCondition <- ...future.makeSendCondition() [18:41:52.533] sendCondition(cond) [18:41:52.533] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.533] { [18:41:52.533] inherits <- base::inherits [18:41:52.533] invokeRestart <- base::invokeRestart [18:41:52.533] is.null <- base::is.null [18:41:52.533] muffled <- FALSE [18:41:52.533] if (inherits(cond, "message")) { [18:41:52.533] muffled <- grepl(pattern, "muffleMessage") [18:41:52.533] if (muffled) [18:41:52.533] invokeRestart("muffleMessage") [18:41:52.533] } [18:41:52.533] else if (inherits(cond, "warning")) { [18:41:52.533] muffled <- grepl(pattern, "muffleWarning") [18:41:52.533] if (muffled) [18:41:52.533] invokeRestart("muffleWarning") [18:41:52.533] } [18:41:52.533] else if (inherits(cond, "condition")) { [18:41:52.533] if (!is.null(pattern)) { [18:41:52.533] computeRestarts <- base::computeRestarts [18:41:52.533] grepl <- base::grepl [18:41:52.533] restarts <- computeRestarts(cond) [18:41:52.533] for (restart in restarts) { [18:41:52.533] name <- restart$name [18:41:52.533] if (is.null(name)) [18:41:52.533] next [18:41:52.533] if (!grepl(pattern, name)) [18:41:52.533] next [18:41:52.533] invokeRestart(restart) [18:41:52.533] muffled <- TRUE [18:41:52.533] break [18:41:52.533] } [18:41:52.533] } [18:41:52.533] } [18:41:52.533] invisible(muffled) [18:41:52.533] } [18:41:52.533] muffleCondition(cond) [18:41:52.533] }) [18:41:52.533] })) [18:41:52.533] future::FutureResult(value = ...future.value$value, [18:41:52.533] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.533] ...future.rng), globalenv = if (FALSE) [18:41:52.533] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.533] ...future.globalenv.names)) [18:41:52.533] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.533] }, condition = base::local({ [18:41:52.533] c <- base::c [18:41:52.533] inherits <- base::inherits [18:41:52.533] invokeRestart <- base::invokeRestart [18:41:52.533] length <- base::length [18:41:52.533] list <- base::list [18:41:52.533] seq.int <- base::seq.int [18:41:52.533] signalCondition <- base::signalCondition [18:41:52.533] sys.calls <- base::sys.calls [18:41:52.533] `[[` <- base::`[[` [18:41:52.533] `+` <- base::`+` [18:41:52.533] `<<-` <- base::`<<-` [18:41:52.533] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.533] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.533] 3L)] [18:41:52.533] } [18:41:52.533] function(cond) { [18:41:52.533] is_error <- inherits(cond, "error") [18:41:52.533] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.533] NULL) [18:41:52.533] if (is_error) { [18:41:52.533] sessionInformation <- function() { [18:41:52.533] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.533] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.533] search = base::search(), system = base::Sys.info()) [18:41:52.533] } [18:41:52.533] ...future.conditions[[length(...future.conditions) + [18:41:52.533] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.533] cond$call), session = sessionInformation(), [18:41:52.533] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.533] signalCondition(cond) [18:41:52.533] } [18:41:52.533] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.533] "immediateCondition"))) { [18:41:52.533] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.533] ...future.conditions[[length(...future.conditions) + [18:41:52.533] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.533] if (TRUE && !signal) { [18:41:52.533] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.533] { [18:41:52.533] inherits <- base::inherits [18:41:52.533] invokeRestart <- base::invokeRestart [18:41:52.533] is.null <- base::is.null [18:41:52.533] muffled <- FALSE [18:41:52.533] if (inherits(cond, "message")) { [18:41:52.533] muffled <- grepl(pattern, "muffleMessage") [18:41:52.533] if (muffled) [18:41:52.533] invokeRestart("muffleMessage") [18:41:52.533] } [18:41:52.533] else if (inherits(cond, "warning")) { [18:41:52.533] muffled <- grepl(pattern, "muffleWarning") [18:41:52.533] if (muffled) [18:41:52.533] invokeRestart("muffleWarning") [18:41:52.533] } [18:41:52.533] else if (inherits(cond, "condition")) { [18:41:52.533] if (!is.null(pattern)) { [18:41:52.533] computeRestarts <- base::computeRestarts [18:41:52.533] grepl <- base::grepl [18:41:52.533] restarts <- computeRestarts(cond) [18:41:52.533] for (restart in restarts) { [18:41:52.533] name <- restart$name [18:41:52.533] if (is.null(name)) [18:41:52.533] next [18:41:52.533] if (!grepl(pattern, name)) [18:41:52.533] next [18:41:52.533] invokeRestart(restart) [18:41:52.533] muffled <- TRUE [18:41:52.533] break [18:41:52.533] } [18:41:52.533] } [18:41:52.533] } [18:41:52.533] invisible(muffled) [18:41:52.533] } [18:41:52.533] muffleCondition(cond, pattern = "^muffle") [18:41:52.533] } [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] if (TRUE) { [18:41:52.533] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.533] { [18:41:52.533] inherits <- base::inherits [18:41:52.533] invokeRestart <- base::invokeRestart [18:41:52.533] is.null <- base::is.null [18:41:52.533] muffled <- FALSE [18:41:52.533] if (inherits(cond, "message")) { [18:41:52.533] muffled <- grepl(pattern, "muffleMessage") [18:41:52.533] if (muffled) [18:41:52.533] invokeRestart("muffleMessage") [18:41:52.533] } [18:41:52.533] else if (inherits(cond, "warning")) { [18:41:52.533] muffled <- grepl(pattern, "muffleWarning") [18:41:52.533] if (muffled) [18:41:52.533] invokeRestart("muffleWarning") [18:41:52.533] } [18:41:52.533] else if (inherits(cond, "condition")) { [18:41:52.533] if (!is.null(pattern)) { [18:41:52.533] computeRestarts <- base::computeRestarts [18:41:52.533] grepl <- base::grepl [18:41:52.533] restarts <- computeRestarts(cond) [18:41:52.533] for (restart in restarts) { [18:41:52.533] name <- restart$name [18:41:52.533] if (is.null(name)) [18:41:52.533] next [18:41:52.533] if (!grepl(pattern, name)) [18:41:52.533] next [18:41:52.533] invokeRestart(restart) [18:41:52.533] muffled <- TRUE [18:41:52.533] break [18:41:52.533] } [18:41:52.533] } [18:41:52.533] } [18:41:52.533] invisible(muffled) [18:41:52.533] } [18:41:52.533] muffleCondition(cond, pattern = "^muffle") [18:41:52.533] } [18:41:52.533] } [18:41:52.533] } [18:41:52.533] })) [18:41:52.533] }, error = function(ex) { [18:41:52.533] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.533] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.533] ...future.rng), started = ...future.startTime, [18:41:52.533] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.533] version = "1.8"), class = "FutureResult") [18:41:52.533] }, finally = { [18:41:52.533] if (!identical(...future.workdir, getwd())) [18:41:52.533] setwd(...future.workdir) [18:41:52.533] { [18:41:52.533] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.533] ...future.oldOptions$nwarnings <- NULL [18:41:52.533] } [18:41:52.533] base::options(...future.oldOptions) [18:41:52.533] if (.Platform$OS.type == "windows") { [18:41:52.533] old_names <- names(...future.oldEnvVars) [18:41:52.533] envs <- base::Sys.getenv() [18:41:52.533] names <- names(envs) [18:41:52.533] common <- intersect(names, old_names) [18:41:52.533] added <- setdiff(names, old_names) [18:41:52.533] removed <- setdiff(old_names, names) [18:41:52.533] changed <- common[...future.oldEnvVars[common] != [18:41:52.533] envs[common]] [18:41:52.533] NAMES <- toupper(changed) [18:41:52.533] args <- list() [18:41:52.533] for (kk in seq_along(NAMES)) { [18:41:52.533] name <- changed[[kk]] [18:41:52.533] NAME <- NAMES[[kk]] [18:41:52.533] if (name != NAME && is.element(NAME, old_names)) [18:41:52.533] next [18:41:52.533] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.533] } [18:41:52.533] NAMES <- toupper(added) [18:41:52.533] for (kk in seq_along(NAMES)) { [18:41:52.533] name <- added[[kk]] [18:41:52.533] NAME <- NAMES[[kk]] [18:41:52.533] if (name != NAME && is.element(NAME, old_names)) [18:41:52.533] next [18:41:52.533] args[[name]] <- "" [18:41:52.533] } [18:41:52.533] NAMES <- toupper(removed) [18:41:52.533] for (kk in seq_along(NAMES)) { [18:41:52.533] name <- removed[[kk]] [18:41:52.533] NAME <- NAMES[[kk]] [18:41:52.533] if (name != NAME && is.element(NAME, old_names)) [18:41:52.533] next [18:41:52.533] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.533] } [18:41:52.533] if (length(args) > 0) [18:41:52.533] base::do.call(base::Sys.setenv, args = args) [18:41:52.533] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.533] } [18:41:52.533] { [18:41:52.533] if (base::length(...future.futureOptionsAdded) > [18:41:52.533] 0L) { [18:41:52.533] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.533] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.533] base::options(opts) [18:41:52.533] } [18:41:52.533] { [18:41:52.533] { [18:41:52.533] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.533] NULL [18:41:52.533] } [18:41:52.533] options(future.plan = NULL) [18:41:52.533] if (is.na(NA_character_)) [18:41:52.533] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.533] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.533] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.533] .init = FALSE) [18:41:52.533] } [18:41:52.533] } [18:41:52.533] } [18:41:52.533] }) [18:41:52.533] if (TRUE) { [18:41:52.533] base::sink(type = "output", split = FALSE) [18:41:52.533] if (TRUE) { [18:41:52.533] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.533] } [18:41:52.533] else { [18:41:52.533] ...future.result["stdout"] <- base::list(NULL) [18:41:52.533] } [18:41:52.533] base::close(...future.stdout) [18:41:52.533] ...future.stdout <- NULL [18:41:52.533] } [18:41:52.533] ...future.result$conditions <- ...future.conditions [18:41:52.533] ...future.result$finished <- base::Sys.time() [18:41:52.533] ...future.result [18:41:52.533] } [18:41:52.542] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:52.543] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:52.544] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:52.544] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.545] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.545] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.546] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.546] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.547] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.547] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.548] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.548] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:52.549] MultisessionFuture started [18:41:52.550] - Launch lazy future ... done [18:41:52.550] run() for 'MultisessionFuture' ... done [18:41:52.550] Created future: [18:41:52.564] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.564] - Validating connection of MultisessionFuture [18:41:52.565] - received message: FutureResult [18:41:52.565] - Received FutureResult [18:41:52.565] - Erased future from FutureRegistry [18:41:52.566] result() for ClusterFuture ... [18:41:52.566] - result already collected: FutureResult [18:41:52.566] result() for ClusterFuture ... done [18:41:52.566] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.551] MultisessionFuture: [18:41:52.551] Label: 'future_sapply-1' [18:41:52.551] Expression: [18:41:52.551] { [18:41:52.551] do.call(function(...) { [18:41:52.551] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.551] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.551] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.551] on.exit(options(oopts), add = TRUE) [18:41:52.551] } [18:41:52.551] { [18:41:52.551] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.551] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.551] ...future.FUN(...future.X_jj, ...) [18:41:52.551] }) [18:41:52.551] } [18:41:52.551] }, args = future.call.arguments) [18:41:52.551] } [18:41:52.551] Lazy evaluation: FALSE [18:41:52.551] Asynchronous evaluation: TRUE [18:41:52.551] Local evaluation: TRUE [18:41:52.551] Environment: R_GlobalEnv [18:41:52.551] Capture standard output: TRUE [18:41:52.551] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.551] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.551] Packages: [18:41:52.551] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.551] Resolved: TRUE [18:41:52.551] Value: [18:41:52.551] Conditions captured: [18:41:52.551] Early signaling: FALSE [18:41:52.551] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.551] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.567] Chunk #1 of 2 ... DONE [18:41:52.568] Chunk #2 of 2 ... [18:41:52.568] - Finding globals in 'X' for chunk #2 ... [18:41:52.568] getGlobalsAndPackages() ... [18:41:52.568] Searching for globals... [18:41:52.569] [18:41:52.569] Searching for globals ... DONE [18:41:52.570] - globals: [0] [18:41:52.570] getGlobalsAndPackages() ... DONE [18:41:52.570] + additional globals found: [n=0] [18:41:52.571] + additional namespaces needed: [n=0] [18:41:52.571] - Finding globals in 'X' for chunk #2 ... DONE [18:41:52.571] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.571] - seeds: [18:41:52.572] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.572] getGlobalsAndPackages() ... [18:41:52.572] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.573] Resolving globals: FALSE [18:41:52.573] Tweak future expression to call with '...' arguments ... [18:41:52.573] { [18:41:52.573] do.call(function(...) { [18:41:52.573] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.573] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.573] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.573] on.exit(options(oopts), add = TRUE) [18:41:52.573] } [18:41:52.573] { [18:41:52.573] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.573] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.573] ...future.FUN(...future.X_jj, ...) [18:41:52.573] }) [18:41:52.573] } [18:41:52.573] }, args = future.call.arguments) [18:41:52.573] } [18:41:52.574] Tweak future expression to call with '...' arguments ... DONE [18:41:52.575] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.575] [18:41:52.576] getGlobalsAndPackages() ... DONE [18:41:52.576] run() for 'Future' ... [18:41:52.577] - state: 'created' [18:41:52.577] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.605] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.605] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.606] - Field: 'node' [18:41:52.606] - Field: 'label' [18:41:52.607] - Field: 'local' [18:41:52.607] - Field: 'owner' [18:41:52.607] - Field: 'envir' [18:41:52.607] - Field: 'workers' [18:41:52.608] - Field: 'packages' [18:41:52.608] - Field: 'gc' [18:41:52.608] - Field: 'conditions' [18:41:52.609] - Field: 'persistent' [18:41:52.609] - Field: 'expr' [18:41:52.609] - Field: 'uuid' [18:41:52.610] - Field: 'seed' [18:41:52.610] - Field: 'version' [18:41:52.610] - Field: 'result' [18:41:52.611] - Field: 'asynchronous' [18:41:52.611] - Field: 'calls' [18:41:52.611] - Field: 'globals' [18:41:52.612] - Field: 'stdout' [18:41:52.612] - Field: 'earlySignal' [18:41:52.612] - Field: 'lazy' [18:41:52.613] - Field: 'state' [18:41:52.613] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.613] - Launch lazy future ... [18:41:52.614] Packages needed by the future expression (n = 0): [18:41:52.614] Packages needed by future strategies (n = 0): [18:41:52.615] { [18:41:52.615] { [18:41:52.615] { [18:41:52.615] ...future.startTime <- base::Sys.time() [18:41:52.615] { [18:41:52.615] { [18:41:52.615] { [18:41:52.615] { [18:41:52.615] base::local({ [18:41:52.615] has_future <- base::requireNamespace("future", [18:41:52.615] quietly = TRUE) [18:41:52.615] if (has_future) { [18:41:52.615] ns <- base::getNamespace("future") [18:41:52.615] version <- ns[[".package"]][["version"]] [18:41:52.615] if (is.null(version)) [18:41:52.615] version <- utils::packageVersion("future") [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] version <- NULL [18:41:52.615] } [18:41:52.615] if (!has_future || version < "1.8.0") { [18:41:52.615] info <- base::c(r_version = base::gsub("R version ", [18:41:52.615] "", base::R.version$version.string), [18:41:52.615] platform = base::sprintf("%s (%s-bit)", [18:41:52.615] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.615] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.615] "release", "version")], collapse = " "), [18:41:52.615] hostname = base::Sys.info()[["nodename"]]) [18:41:52.615] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.615] info) [18:41:52.615] info <- base::paste(info, collapse = "; ") [18:41:52.615] if (!has_future) { [18:41:52.615] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.615] info) [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.615] info, version) [18:41:52.615] } [18:41:52.615] base::stop(msg) [18:41:52.615] } [18:41:52.615] }) [18:41:52.615] } [18:41:52.615] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.615] base::options(mc.cores = 1L) [18:41:52.615] } [18:41:52.615] ...future.strategy.old <- future::plan("list") [18:41:52.615] options(future.plan = NULL) [18:41:52.615] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.615] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.615] } [18:41:52.615] ...future.workdir <- getwd() [18:41:52.615] } [18:41:52.615] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.615] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.615] } [18:41:52.615] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.615] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.615] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.615] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.615] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.615] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.615] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.615] base::names(...future.oldOptions)) [18:41:52.615] } [18:41:52.615] if (FALSE) { [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] if (TRUE) { [18:41:52.615] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.615] open = "w") [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.615] windows = "NUL", "/dev/null"), open = "w") [18:41:52.615] } [18:41:52.615] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.615] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.615] base::sink(type = "output", split = FALSE) [18:41:52.615] base::close(...future.stdout) [18:41:52.615] }, add = TRUE) [18:41:52.615] } [18:41:52.615] ...future.frame <- base::sys.nframe() [18:41:52.615] ...future.conditions <- base::list() [18:41:52.615] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.615] if (FALSE) { [18:41:52.615] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.615] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.615] } [18:41:52.615] ...future.result <- base::tryCatch({ [18:41:52.615] base::withCallingHandlers({ [18:41:52.615] ...future.value <- base::withVisible(base::local({ [18:41:52.615] ...future.makeSendCondition <- base::local({ [18:41:52.615] sendCondition <- NULL [18:41:52.615] function(frame = 1L) { [18:41:52.615] if (is.function(sendCondition)) [18:41:52.615] return(sendCondition) [18:41:52.615] ns <- getNamespace("parallel") [18:41:52.615] if (exists("sendData", mode = "function", [18:41:52.615] envir = ns)) { [18:41:52.615] parallel_sendData <- get("sendData", mode = "function", [18:41:52.615] envir = ns) [18:41:52.615] envir <- sys.frame(frame) [18:41:52.615] master <- NULL [18:41:52.615] while (!identical(envir, .GlobalEnv) && [18:41:52.615] !identical(envir, emptyenv())) { [18:41:52.615] if (exists("master", mode = "list", envir = envir, [18:41:52.615] inherits = FALSE)) { [18:41:52.615] master <- get("master", mode = "list", [18:41:52.615] envir = envir, inherits = FALSE) [18:41:52.615] if (inherits(master, c("SOCKnode", [18:41:52.615] "SOCK0node"))) { [18:41:52.615] sendCondition <<- function(cond) { [18:41:52.615] data <- list(type = "VALUE", value = cond, [18:41:52.615] success = TRUE) [18:41:52.615] parallel_sendData(master, data) [18:41:52.615] } [18:41:52.615] return(sendCondition) [18:41:52.615] } [18:41:52.615] } [18:41:52.615] frame <- frame + 1L [18:41:52.615] envir <- sys.frame(frame) [18:41:52.615] } [18:41:52.615] } [18:41:52.615] sendCondition <<- function(cond) NULL [18:41:52.615] } [18:41:52.615] }) [18:41:52.615] withCallingHandlers({ [18:41:52.615] { [18:41:52.615] do.call(function(...) { [18:41:52.615] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.615] if (!identical(...future.globals.maxSize.org, [18:41:52.615] ...future.globals.maxSize)) { [18:41:52.615] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.615] on.exit(options(oopts), add = TRUE) [18:41:52.615] } [18:41:52.615] { [18:41:52.615] lapply(seq_along(...future.elements_ii), [18:41:52.615] FUN = function(jj) { [18:41:52.615] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.615] ...future.FUN(...future.X_jj, ...) [18:41:52.615] }) [18:41:52.615] } [18:41:52.615] }, args = future.call.arguments) [18:41:52.615] } [18:41:52.615] }, immediateCondition = function(cond) { [18:41:52.615] sendCondition <- ...future.makeSendCondition() [18:41:52.615] sendCondition(cond) [18:41:52.615] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.615] { [18:41:52.615] inherits <- base::inherits [18:41:52.615] invokeRestart <- base::invokeRestart [18:41:52.615] is.null <- base::is.null [18:41:52.615] muffled <- FALSE [18:41:52.615] if (inherits(cond, "message")) { [18:41:52.615] muffled <- grepl(pattern, "muffleMessage") [18:41:52.615] if (muffled) [18:41:52.615] invokeRestart("muffleMessage") [18:41:52.615] } [18:41:52.615] else if (inherits(cond, "warning")) { [18:41:52.615] muffled <- grepl(pattern, "muffleWarning") [18:41:52.615] if (muffled) [18:41:52.615] invokeRestart("muffleWarning") [18:41:52.615] } [18:41:52.615] else if (inherits(cond, "condition")) { [18:41:52.615] if (!is.null(pattern)) { [18:41:52.615] computeRestarts <- base::computeRestarts [18:41:52.615] grepl <- base::grepl [18:41:52.615] restarts <- computeRestarts(cond) [18:41:52.615] for (restart in restarts) { [18:41:52.615] name <- restart$name [18:41:52.615] if (is.null(name)) [18:41:52.615] next [18:41:52.615] if (!grepl(pattern, name)) [18:41:52.615] next [18:41:52.615] invokeRestart(restart) [18:41:52.615] muffled <- TRUE [18:41:52.615] break [18:41:52.615] } [18:41:52.615] } [18:41:52.615] } [18:41:52.615] invisible(muffled) [18:41:52.615] } [18:41:52.615] muffleCondition(cond) [18:41:52.615] }) [18:41:52.615] })) [18:41:52.615] future::FutureResult(value = ...future.value$value, [18:41:52.615] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.615] ...future.rng), globalenv = if (FALSE) [18:41:52.615] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.615] ...future.globalenv.names)) [18:41:52.615] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.615] }, condition = base::local({ [18:41:52.615] c <- base::c [18:41:52.615] inherits <- base::inherits [18:41:52.615] invokeRestart <- base::invokeRestart [18:41:52.615] length <- base::length [18:41:52.615] list <- base::list [18:41:52.615] seq.int <- base::seq.int [18:41:52.615] signalCondition <- base::signalCondition [18:41:52.615] sys.calls <- base::sys.calls [18:41:52.615] `[[` <- base::`[[` [18:41:52.615] `+` <- base::`+` [18:41:52.615] `<<-` <- base::`<<-` [18:41:52.615] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.615] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.615] 3L)] [18:41:52.615] } [18:41:52.615] function(cond) { [18:41:52.615] is_error <- inherits(cond, "error") [18:41:52.615] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.615] NULL) [18:41:52.615] if (is_error) { [18:41:52.615] sessionInformation <- function() { [18:41:52.615] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.615] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.615] search = base::search(), system = base::Sys.info()) [18:41:52.615] } [18:41:52.615] ...future.conditions[[length(...future.conditions) + [18:41:52.615] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.615] cond$call), session = sessionInformation(), [18:41:52.615] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.615] signalCondition(cond) [18:41:52.615] } [18:41:52.615] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.615] "immediateCondition"))) { [18:41:52.615] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.615] ...future.conditions[[length(...future.conditions) + [18:41:52.615] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.615] if (TRUE && !signal) { [18:41:52.615] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.615] { [18:41:52.615] inherits <- base::inherits [18:41:52.615] invokeRestart <- base::invokeRestart [18:41:52.615] is.null <- base::is.null [18:41:52.615] muffled <- FALSE [18:41:52.615] if (inherits(cond, "message")) { [18:41:52.615] muffled <- grepl(pattern, "muffleMessage") [18:41:52.615] if (muffled) [18:41:52.615] invokeRestart("muffleMessage") [18:41:52.615] } [18:41:52.615] else if (inherits(cond, "warning")) { [18:41:52.615] muffled <- grepl(pattern, "muffleWarning") [18:41:52.615] if (muffled) [18:41:52.615] invokeRestart("muffleWarning") [18:41:52.615] } [18:41:52.615] else if (inherits(cond, "condition")) { [18:41:52.615] if (!is.null(pattern)) { [18:41:52.615] computeRestarts <- base::computeRestarts [18:41:52.615] grepl <- base::grepl [18:41:52.615] restarts <- computeRestarts(cond) [18:41:52.615] for (restart in restarts) { [18:41:52.615] name <- restart$name [18:41:52.615] if (is.null(name)) [18:41:52.615] next [18:41:52.615] if (!grepl(pattern, name)) [18:41:52.615] next [18:41:52.615] invokeRestart(restart) [18:41:52.615] muffled <- TRUE [18:41:52.615] break [18:41:52.615] } [18:41:52.615] } [18:41:52.615] } [18:41:52.615] invisible(muffled) [18:41:52.615] } [18:41:52.615] muffleCondition(cond, pattern = "^muffle") [18:41:52.615] } [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] if (TRUE) { [18:41:52.615] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.615] { [18:41:52.615] inherits <- base::inherits [18:41:52.615] invokeRestart <- base::invokeRestart [18:41:52.615] is.null <- base::is.null [18:41:52.615] muffled <- FALSE [18:41:52.615] if (inherits(cond, "message")) { [18:41:52.615] muffled <- grepl(pattern, "muffleMessage") [18:41:52.615] if (muffled) [18:41:52.615] invokeRestart("muffleMessage") [18:41:52.615] } [18:41:52.615] else if (inherits(cond, "warning")) { [18:41:52.615] muffled <- grepl(pattern, "muffleWarning") [18:41:52.615] if (muffled) [18:41:52.615] invokeRestart("muffleWarning") [18:41:52.615] } [18:41:52.615] else if (inherits(cond, "condition")) { [18:41:52.615] if (!is.null(pattern)) { [18:41:52.615] computeRestarts <- base::computeRestarts [18:41:52.615] grepl <- base::grepl [18:41:52.615] restarts <- computeRestarts(cond) [18:41:52.615] for (restart in restarts) { [18:41:52.615] name <- restart$name [18:41:52.615] if (is.null(name)) [18:41:52.615] next [18:41:52.615] if (!grepl(pattern, name)) [18:41:52.615] next [18:41:52.615] invokeRestart(restart) [18:41:52.615] muffled <- TRUE [18:41:52.615] break [18:41:52.615] } [18:41:52.615] } [18:41:52.615] } [18:41:52.615] invisible(muffled) [18:41:52.615] } [18:41:52.615] muffleCondition(cond, pattern = "^muffle") [18:41:52.615] } [18:41:52.615] } [18:41:52.615] } [18:41:52.615] })) [18:41:52.615] }, error = function(ex) { [18:41:52.615] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.615] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.615] ...future.rng), started = ...future.startTime, [18:41:52.615] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.615] version = "1.8"), class = "FutureResult") [18:41:52.615] }, finally = { [18:41:52.615] if (!identical(...future.workdir, getwd())) [18:41:52.615] setwd(...future.workdir) [18:41:52.615] { [18:41:52.615] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.615] ...future.oldOptions$nwarnings <- NULL [18:41:52.615] } [18:41:52.615] base::options(...future.oldOptions) [18:41:52.615] if (.Platform$OS.type == "windows") { [18:41:52.615] old_names <- names(...future.oldEnvVars) [18:41:52.615] envs <- base::Sys.getenv() [18:41:52.615] names <- names(envs) [18:41:52.615] common <- intersect(names, old_names) [18:41:52.615] added <- setdiff(names, old_names) [18:41:52.615] removed <- setdiff(old_names, names) [18:41:52.615] changed <- common[...future.oldEnvVars[common] != [18:41:52.615] envs[common]] [18:41:52.615] NAMES <- toupper(changed) [18:41:52.615] args <- list() [18:41:52.615] for (kk in seq_along(NAMES)) { [18:41:52.615] name <- changed[[kk]] [18:41:52.615] NAME <- NAMES[[kk]] [18:41:52.615] if (name != NAME && is.element(NAME, old_names)) [18:41:52.615] next [18:41:52.615] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.615] } [18:41:52.615] NAMES <- toupper(added) [18:41:52.615] for (kk in seq_along(NAMES)) { [18:41:52.615] name <- added[[kk]] [18:41:52.615] NAME <- NAMES[[kk]] [18:41:52.615] if (name != NAME && is.element(NAME, old_names)) [18:41:52.615] next [18:41:52.615] args[[name]] <- "" [18:41:52.615] } [18:41:52.615] NAMES <- toupper(removed) [18:41:52.615] for (kk in seq_along(NAMES)) { [18:41:52.615] name <- removed[[kk]] [18:41:52.615] NAME <- NAMES[[kk]] [18:41:52.615] if (name != NAME && is.element(NAME, old_names)) [18:41:52.615] next [18:41:52.615] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.615] } [18:41:52.615] if (length(args) > 0) [18:41:52.615] base::do.call(base::Sys.setenv, args = args) [18:41:52.615] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.615] } [18:41:52.615] { [18:41:52.615] if (base::length(...future.futureOptionsAdded) > [18:41:52.615] 0L) { [18:41:52.615] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.615] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.615] base::options(opts) [18:41:52.615] } [18:41:52.615] { [18:41:52.615] { [18:41:52.615] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.615] NULL [18:41:52.615] } [18:41:52.615] options(future.plan = NULL) [18:41:52.615] if (is.na(NA_character_)) [18:41:52.615] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.615] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.615] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.615] .init = FALSE) [18:41:52.615] } [18:41:52.615] } [18:41:52.615] } [18:41:52.615] }) [18:41:52.615] if (TRUE) { [18:41:52.615] base::sink(type = "output", split = FALSE) [18:41:52.615] if (TRUE) { [18:41:52.615] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.615] } [18:41:52.615] else { [18:41:52.615] ...future.result["stdout"] <- base::list(NULL) [18:41:52.615] } [18:41:52.615] base::close(...future.stdout) [18:41:52.615] ...future.stdout <- NULL [18:41:52.615] } [18:41:52.615] ...future.result$conditions <- ...future.conditions [18:41:52.615] ...future.result$finished <- base::Sys.time() [18:41:52.615] ...future.result [18:41:52.615] } [18:41:52.624] Exporting 5 global objects (916 bytes) to cluster node #1 ... [18:41:52.625] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:52.625] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:52.626] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.626] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.627] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.627] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.628] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.628] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.628] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.629] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.629] Exporting 5 global objects (916 bytes) to cluster node #1 ... DONE [18:41:52.630] MultisessionFuture started [18:41:52.631] - Launch lazy future ... done [18:41:52.631] run() for 'MultisessionFuture' ... done [18:41:52.631] Created future: [18:41:52.645] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.645] - Validating connection of MultisessionFuture [18:41:52.646] - received message: FutureResult [18:41:52.646] - Received FutureResult [18:41:52.647] - Erased future from FutureRegistry [18:41:52.647] result() for ClusterFuture ... [18:41:52.647] - result already collected: FutureResult [18:41:52.648] result() for ClusterFuture ... done [18:41:52.648] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.632] MultisessionFuture: [18:41:52.632] Label: 'future_sapply-2' [18:41:52.632] Expression: [18:41:52.632] { [18:41:52.632] do.call(function(...) { [18:41:52.632] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.632] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.632] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.632] on.exit(options(oopts), add = TRUE) [18:41:52.632] } [18:41:52.632] { [18:41:52.632] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.632] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.632] ...future.FUN(...future.X_jj, ...) [18:41:52.632] }) [18:41:52.632] } [18:41:52.632] }, args = future.call.arguments) [18:41:52.632] } [18:41:52.632] Lazy evaluation: FALSE [18:41:52.632] Asynchronous evaluation: TRUE [18:41:52.632] Local evaluation: TRUE [18:41:52.632] Environment: R_GlobalEnv [18:41:52.632] Capture standard output: TRUE [18:41:52.632] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.632] Globals: 5 objects totaling 466 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.632] Packages: [18:41:52.632] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.632] Resolved: TRUE [18:41:52.632] Value: [18:41:52.632] Conditions captured: [18:41:52.632] Early signaling: FALSE [18:41:52.632] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.632] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.648] Chunk #2 of 2 ... DONE [18:41:52.649] Launching 2 futures (chunks) ... DONE [18:41:52.649] Resolving 2 futures (chunks) ... [18:41:52.649] resolve() on list ... [18:41:52.649] recursive: 0 [18:41:52.650] length: 2 [18:41:52.650] [18:41:52.650] Future #1 [18:41:52.651] result() for ClusterFuture ... [18:41:52.651] - result already collected: FutureResult [18:41:52.651] result() for ClusterFuture ... done [18:41:52.651] result() for ClusterFuture ... [18:41:52.651] - result already collected: FutureResult [18:41:52.651] result() for ClusterFuture ... done [18:41:52.652] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:52.652] - nx: 2 [18:41:52.652] - relay: TRUE [18:41:52.652] - stdout: TRUE [18:41:52.653] - signal: TRUE [18:41:52.653] - resignal: FALSE [18:41:52.653] - force: TRUE [18:41:52.653] - relayed: [n=2] FALSE, FALSE [18:41:52.654] - queued futures: [n=2] FALSE, FALSE [18:41:52.654] - until=1 [18:41:52.654] - relaying element #1 [18:41:52.654] result() for ClusterFuture ... [18:41:52.654] - result already collected: FutureResult [18:41:52.655] result() for ClusterFuture ... done [18:41:52.655] result() for ClusterFuture ... [18:41:52.655] - result already collected: FutureResult [18:41:52.655] result() for ClusterFuture ... done [18:41:52.656] result() for ClusterFuture ... [18:41:52.656] - result already collected: FutureResult [18:41:52.656] result() for ClusterFuture ... done [18:41:52.656] result() for ClusterFuture ... [18:41:52.656] - result already collected: FutureResult [18:41:52.657] result() for ClusterFuture ... done [18:41:52.657] - relayed: [n=2] TRUE, FALSE [18:41:52.657] - queued futures: [n=2] TRUE, FALSE [18:41:52.657] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:52.658] length: 1 (resolved future 1) [18:41:52.658] Future #2 [18:41:52.658] result() for ClusterFuture ... [18:41:52.659] - result already collected: FutureResult [18:41:52.659] result() for ClusterFuture ... done [18:41:52.659] result() for ClusterFuture ... [18:41:52.659] - result already collected: FutureResult [18:41:52.659] result() for ClusterFuture ... done [18:41:52.660] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:52.660] - nx: 2 [18:41:52.660] - relay: TRUE [18:41:52.660] - stdout: TRUE [18:41:52.661] - signal: TRUE [18:41:52.661] - resignal: FALSE [18:41:52.661] - force: TRUE [18:41:52.661] - relayed: [n=2] TRUE, FALSE [18:41:52.661] - queued futures: [n=2] TRUE, FALSE [18:41:52.661] - until=2 [18:41:52.662] - relaying element #2 [18:41:52.662] result() for ClusterFuture ... [18:41:52.662] - result already collected: FutureResult [18:41:52.662] result() for ClusterFuture ... done [18:41:52.663] result() for ClusterFuture ... [18:41:52.663] - result already collected: FutureResult [18:41:52.663] result() for ClusterFuture ... done [18:41:52.663] result() for ClusterFuture ... [18:41:52.664] - result already collected: FutureResult [18:41:52.664] result() for ClusterFuture ... done [18:41:52.664] result() for ClusterFuture ... [18:41:52.664] - result already collected: FutureResult [18:41:52.665] result() for ClusterFuture ... done [18:41:52.665] - relayed: [n=2] TRUE, TRUE [18:41:52.665] - queued futures: [n=2] TRUE, TRUE [18:41:52.665] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:52.666] length: 0 (resolved future 2) [18:41:52.666] Relaying remaining futures [18:41:52.666] signalConditionsASAP(NULL, pos=0) ... [18:41:52.666] - nx: 2 [18:41:52.666] - relay: TRUE [18:41:52.667] - stdout: TRUE [18:41:52.667] - signal: TRUE [18:41:52.667] - resignal: FALSE [18:41:52.667] - force: TRUE [18:41:52.668] - relayed: [n=2] TRUE, TRUE [18:41:52.668] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:52.668] - relayed: [n=2] TRUE, TRUE [18:41:52.668] - queued futures: [n=2] TRUE, TRUE [18:41:52.669] signalConditionsASAP(NULL, pos=0) ... done [18:41:52.669] resolve() on list ... DONE [18:41:52.669] result() for ClusterFuture ... [18:41:52.669] - result already collected: FutureResult [18:41:52.670] result() for ClusterFuture ... done [18:41:52.670] result() for ClusterFuture ... [18:41:52.670] - result already collected: FutureResult [18:41:52.670] result() for ClusterFuture ... done [18:41:52.671] result() for ClusterFuture ... [18:41:52.671] - result already collected: FutureResult [18:41:52.671] result() for ClusterFuture ... done [18:41:52.671] result() for ClusterFuture ... [18:41:52.672] - result already collected: FutureResult [18:41:52.672] result() for ClusterFuture ... done [18:41:52.672] - Number of value chunks collected: 2 [18:41:52.672] Resolving 2 futures (chunks) ... DONE [18:41:52.673] Reducing values from 2 chunks ... [18:41:52.673] - Number of values collected after concatenation: 6 [18:41:52.673] - Number of values expected: 6 [18:41:52.673] Reducing values from 2 chunks ... DONE [18:41:52.673] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:52.677] future_lapply() ... [18:41:52.681] Number of chunks: 2 [18:41:52.681] getGlobalsAndPackagesXApply() ... [18:41:52.681] - future.globals: TRUE [18:41:52.682] getGlobalsAndPackages() ... [18:41:52.682] Searching for globals... [18:41:52.683] - globals found: [2] 'FUN', 'UseMethod' [18:41:52.683] Searching for globals ... DONE [18:41:52.684] Resolving globals: FALSE [18:41:52.684] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:52.685] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:52.685] - globals: [1] 'FUN' [18:41:52.685] [18:41:52.685] getGlobalsAndPackages() ... DONE [18:41:52.685] - globals found/used: [n=1] 'FUN' [18:41:52.686] - needed namespaces: [n=0] [18:41:52.686] Finding globals ... DONE [18:41:52.686] - use_args: TRUE [18:41:52.686] - Getting '...' globals ... [18:41:52.687] resolve() on list ... [18:41:52.687] recursive: 0 [18:41:52.687] length: 1 [18:41:52.687] elements: '...' [18:41:52.688] length: 0 (resolved future 1) [18:41:52.688] resolve() on list ... DONE [18:41:52.688] - '...' content: [n=0] [18:41:52.688] List of 1 [18:41:52.688] $ ...: list() [18:41:52.688] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.688] - attr(*, "where")=List of 1 [18:41:52.688] ..$ ...: [18:41:52.688] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.688] - attr(*, "resolved")= logi TRUE [18:41:52.688] - attr(*, "total_size")= num NA [18:41:52.691] - Getting '...' globals ... DONE [18:41:52.691] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:52.692] List of 2 [18:41:52.692] $ ...future.FUN:function (x, ...) [18:41:52.692] $ ... : list() [18:41:52.692] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.692] - attr(*, "where")=List of 2 [18:41:52.692] ..$ ...future.FUN: [18:41:52.692] ..$ ... : [18:41:52.692] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.692] - attr(*, "resolved")= logi FALSE [18:41:52.692] - attr(*, "total_size")= int 5182 [18:41:52.695] Packages to be attached in all futures: [n=0] [18:41:52.695] getGlobalsAndPackagesXApply() ... DONE [18:41:52.695] Number of futures (= number of chunks): 2 [18:41:52.696] Launching 2 futures (chunks) ... [18:41:52.696] Chunk #1 of 2 ... [18:41:52.696] - Finding globals in 'X' for chunk #1 ... [18:41:52.696] getGlobalsAndPackages() ... [18:41:52.696] Searching for globals... [18:41:52.697] [18:41:52.697] Searching for globals ... DONE [18:41:52.697] - globals: [0] [18:41:52.697] getGlobalsAndPackages() ... DONE [18:41:52.697] + additional globals found: [n=0] [18:41:52.697] + additional namespaces needed: [n=0] [18:41:52.698] - Finding globals in 'X' for chunk #1 ... DONE [18:41:52.698] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.698] - seeds: [18:41:52.698] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.698] getGlobalsAndPackages() ... [18:41:52.698] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.699] Resolving globals: FALSE [18:41:52.699] Tweak future expression to call with '...' arguments ... [18:41:52.699] { [18:41:52.699] do.call(function(...) { [18:41:52.699] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.699] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.699] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.699] on.exit(options(oopts), add = TRUE) [18:41:52.699] } [18:41:52.699] { [18:41:52.699] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.699] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.699] ...future.FUN(...future.X_jj, ...) [18:41:52.699] }) [18:41:52.699] } [18:41:52.699] }, args = future.call.arguments) [18:41:52.699] } [18:41:52.699] Tweak future expression to call with '...' arguments ... DONE [18:41:52.700] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.700] [18:41:52.700] getGlobalsAndPackages() ... DONE [18:41:52.701] run() for 'Future' ... [18:41:52.701] - state: 'created' [18:41:52.701] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.717] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.717] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.717] - Field: 'node' [18:41:52.717] - Field: 'label' [18:41:52.717] - Field: 'local' [18:41:52.718] - Field: 'owner' [18:41:52.718] - Field: 'envir' [18:41:52.718] - Field: 'workers' [18:41:52.718] - Field: 'packages' [18:41:52.718] - Field: 'gc' [18:41:52.718] - Field: 'conditions' [18:41:52.719] - Field: 'persistent' [18:41:52.719] - Field: 'expr' [18:41:52.719] - Field: 'uuid' [18:41:52.719] - Field: 'seed' [18:41:52.719] - Field: 'version' [18:41:52.720] - Field: 'result' [18:41:52.720] - Field: 'asynchronous' [18:41:52.720] - Field: 'calls' [18:41:52.720] - Field: 'globals' [18:41:52.720] - Field: 'stdout' [18:41:52.720] - Field: 'earlySignal' [18:41:52.721] - Field: 'lazy' [18:41:52.721] - Field: 'state' [18:41:52.721] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.721] - Launch lazy future ... [18:41:52.721] Packages needed by the future expression (n = 0): [18:41:52.722] Packages needed by future strategies (n = 0): [18:41:52.722] { [18:41:52.722] { [18:41:52.722] { [18:41:52.722] ...future.startTime <- base::Sys.time() [18:41:52.722] { [18:41:52.722] { [18:41:52.722] { [18:41:52.722] { [18:41:52.722] base::local({ [18:41:52.722] has_future <- base::requireNamespace("future", [18:41:52.722] quietly = TRUE) [18:41:52.722] if (has_future) { [18:41:52.722] ns <- base::getNamespace("future") [18:41:52.722] version <- ns[[".package"]][["version"]] [18:41:52.722] if (is.null(version)) [18:41:52.722] version <- utils::packageVersion("future") [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] version <- NULL [18:41:52.722] } [18:41:52.722] if (!has_future || version < "1.8.0") { [18:41:52.722] info <- base::c(r_version = base::gsub("R version ", [18:41:52.722] "", base::R.version$version.string), [18:41:52.722] platform = base::sprintf("%s (%s-bit)", [18:41:52.722] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.722] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.722] "release", "version")], collapse = " "), [18:41:52.722] hostname = base::Sys.info()[["nodename"]]) [18:41:52.722] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.722] info) [18:41:52.722] info <- base::paste(info, collapse = "; ") [18:41:52.722] if (!has_future) { [18:41:52.722] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.722] info) [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.722] info, version) [18:41:52.722] } [18:41:52.722] base::stop(msg) [18:41:52.722] } [18:41:52.722] }) [18:41:52.722] } [18:41:52.722] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.722] base::options(mc.cores = 1L) [18:41:52.722] } [18:41:52.722] ...future.strategy.old <- future::plan("list") [18:41:52.722] options(future.plan = NULL) [18:41:52.722] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.722] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.722] } [18:41:52.722] ...future.workdir <- getwd() [18:41:52.722] } [18:41:52.722] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.722] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.722] } [18:41:52.722] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.722] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.722] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.722] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.722] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.722] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.722] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.722] base::names(...future.oldOptions)) [18:41:52.722] } [18:41:52.722] if (FALSE) { [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] if (TRUE) { [18:41:52.722] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.722] open = "w") [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.722] windows = "NUL", "/dev/null"), open = "w") [18:41:52.722] } [18:41:52.722] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.722] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.722] base::sink(type = "output", split = FALSE) [18:41:52.722] base::close(...future.stdout) [18:41:52.722] }, add = TRUE) [18:41:52.722] } [18:41:52.722] ...future.frame <- base::sys.nframe() [18:41:52.722] ...future.conditions <- base::list() [18:41:52.722] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.722] if (FALSE) { [18:41:52.722] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.722] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.722] } [18:41:52.722] ...future.result <- base::tryCatch({ [18:41:52.722] base::withCallingHandlers({ [18:41:52.722] ...future.value <- base::withVisible(base::local({ [18:41:52.722] ...future.makeSendCondition <- base::local({ [18:41:52.722] sendCondition <- NULL [18:41:52.722] function(frame = 1L) { [18:41:52.722] if (is.function(sendCondition)) [18:41:52.722] return(sendCondition) [18:41:52.722] ns <- getNamespace("parallel") [18:41:52.722] if (exists("sendData", mode = "function", [18:41:52.722] envir = ns)) { [18:41:52.722] parallel_sendData <- get("sendData", mode = "function", [18:41:52.722] envir = ns) [18:41:52.722] envir <- sys.frame(frame) [18:41:52.722] master <- NULL [18:41:52.722] while (!identical(envir, .GlobalEnv) && [18:41:52.722] !identical(envir, emptyenv())) { [18:41:52.722] if (exists("master", mode = "list", envir = envir, [18:41:52.722] inherits = FALSE)) { [18:41:52.722] master <- get("master", mode = "list", [18:41:52.722] envir = envir, inherits = FALSE) [18:41:52.722] if (inherits(master, c("SOCKnode", [18:41:52.722] "SOCK0node"))) { [18:41:52.722] sendCondition <<- function(cond) { [18:41:52.722] data <- list(type = "VALUE", value = cond, [18:41:52.722] success = TRUE) [18:41:52.722] parallel_sendData(master, data) [18:41:52.722] } [18:41:52.722] return(sendCondition) [18:41:52.722] } [18:41:52.722] } [18:41:52.722] frame <- frame + 1L [18:41:52.722] envir <- sys.frame(frame) [18:41:52.722] } [18:41:52.722] } [18:41:52.722] sendCondition <<- function(cond) NULL [18:41:52.722] } [18:41:52.722] }) [18:41:52.722] withCallingHandlers({ [18:41:52.722] { [18:41:52.722] do.call(function(...) { [18:41:52.722] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.722] if (!identical(...future.globals.maxSize.org, [18:41:52.722] ...future.globals.maxSize)) { [18:41:52.722] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.722] on.exit(options(oopts), add = TRUE) [18:41:52.722] } [18:41:52.722] { [18:41:52.722] lapply(seq_along(...future.elements_ii), [18:41:52.722] FUN = function(jj) { [18:41:52.722] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.722] ...future.FUN(...future.X_jj, ...) [18:41:52.722] }) [18:41:52.722] } [18:41:52.722] }, args = future.call.arguments) [18:41:52.722] } [18:41:52.722] }, immediateCondition = function(cond) { [18:41:52.722] sendCondition <- ...future.makeSendCondition() [18:41:52.722] sendCondition(cond) [18:41:52.722] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.722] { [18:41:52.722] inherits <- base::inherits [18:41:52.722] invokeRestart <- base::invokeRestart [18:41:52.722] is.null <- base::is.null [18:41:52.722] muffled <- FALSE [18:41:52.722] if (inherits(cond, "message")) { [18:41:52.722] muffled <- grepl(pattern, "muffleMessage") [18:41:52.722] if (muffled) [18:41:52.722] invokeRestart("muffleMessage") [18:41:52.722] } [18:41:52.722] else if (inherits(cond, "warning")) { [18:41:52.722] muffled <- grepl(pattern, "muffleWarning") [18:41:52.722] if (muffled) [18:41:52.722] invokeRestart("muffleWarning") [18:41:52.722] } [18:41:52.722] else if (inherits(cond, "condition")) { [18:41:52.722] if (!is.null(pattern)) { [18:41:52.722] computeRestarts <- base::computeRestarts [18:41:52.722] grepl <- base::grepl [18:41:52.722] restarts <- computeRestarts(cond) [18:41:52.722] for (restart in restarts) { [18:41:52.722] name <- restart$name [18:41:52.722] if (is.null(name)) [18:41:52.722] next [18:41:52.722] if (!grepl(pattern, name)) [18:41:52.722] next [18:41:52.722] invokeRestart(restart) [18:41:52.722] muffled <- TRUE [18:41:52.722] break [18:41:52.722] } [18:41:52.722] } [18:41:52.722] } [18:41:52.722] invisible(muffled) [18:41:52.722] } [18:41:52.722] muffleCondition(cond) [18:41:52.722] }) [18:41:52.722] })) [18:41:52.722] future::FutureResult(value = ...future.value$value, [18:41:52.722] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.722] ...future.rng), globalenv = if (FALSE) [18:41:52.722] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.722] ...future.globalenv.names)) [18:41:52.722] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.722] }, condition = base::local({ [18:41:52.722] c <- base::c [18:41:52.722] inherits <- base::inherits [18:41:52.722] invokeRestart <- base::invokeRestart [18:41:52.722] length <- base::length [18:41:52.722] list <- base::list [18:41:52.722] seq.int <- base::seq.int [18:41:52.722] signalCondition <- base::signalCondition [18:41:52.722] sys.calls <- base::sys.calls [18:41:52.722] `[[` <- base::`[[` [18:41:52.722] `+` <- base::`+` [18:41:52.722] `<<-` <- base::`<<-` [18:41:52.722] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.722] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.722] 3L)] [18:41:52.722] } [18:41:52.722] function(cond) { [18:41:52.722] is_error <- inherits(cond, "error") [18:41:52.722] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.722] NULL) [18:41:52.722] if (is_error) { [18:41:52.722] sessionInformation <- function() { [18:41:52.722] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.722] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.722] search = base::search(), system = base::Sys.info()) [18:41:52.722] } [18:41:52.722] ...future.conditions[[length(...future.conditions) + [18:41:52.722] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.722] cond$call), session = sessionInformation(), [18:41:52.722] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.722] signalCondition(cond) [18:41:52.722] } [18:41:52.722] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.722] "immediateCondition"))) { [18:41:52.722] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.722] ...future.conditions[[length(...future.conditions) + [18:41:52.722] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.722] if (TRUE && !signal) { [18:41:52.722] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.722] { [18:41:52.722] inherits <- base::inherits [18:41:52.722] invokeRestart <- base::invokeRestart [18:41:52.722] is.null <- base::is.null [18:41:52.722] muffled <- FALSE [18:41:52.722] if (inherits(cond, "message")) { [18:41:52.722] muffled <- grepl(pattern, "muffleMessage") [18:41:52.722] if (muffled) [18:41:52.722] invokeRestart("muffleMessage") [18:41:52.722] } [18:41:52.722] else if (inherits(cond, "warning")) { [18:41:52.722] muffled <- grepl(pattern, "muffleWarning") [18:41:52.722] if (muffled) [18:41:52.722] invokeRestart("muffleWarning") [18:41:52.722] } [18:41:52.722] else if (inherits(cond, "condition")) { [18:41:52.722] if (!is.null(pattern)) { [18:41:52.722] computeRestarts <- base::computeRestarts [18:41:52.722] grepl <- base::grepl [18:41:52.722] restarts <- computeRestarts(cond) [18:41:52.722] for (restart in restarts) { [18:41:52.722] name <- restart$name [18:41:52.722] if (is.null(name)) [18:41:52.722] next [18:41:52.722] if (!grepl(pattern, name)) [18:41:52.722] next [18:41:52.722] invokeRestart(restart) [18:41:52.722] muffled <- TRUE [18:41:52.722] break [18:41:52.722] } [18:41:52.722] } [18:41:52.722] } [18:41:52.722] invisible(muffled) [18:41:52.722] } [18:41:52.722] muffleCondition(cond, pattern = "^muffle") [18:41:52.722] } [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] if (TRUE) { [18:41:52.722] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.722] { [18:41:52.722] inherits <- base::inherits [18:41:52.722] invokeRestart <- base::invokeRestart [18:41:52.722] is.null <- base::is.null [18:41:52.722] muffled <- FALSE [18:41:52.722] if (inherits(cond, "message")) { [18:41:52.722] muffled <- grepl(pattern, "muffleMessage") [18:41:52.722] if (muffled) [18:41:52.722] invokeRestart("muffleMessage") [18:41:52.722] } [18:41:52.722] else if (inherits(cond, "warning")) { [18:41:52.722] muffled <- grepl(pattern, "muffleWarning") [18:41:52.722] if (muffled) [18:41:52.722] invokeRestart("muffleWarning") [18:41:52.722] } [18:41:52.722] else if (inherits(cond, "condition")) { [18:41:52.722] if (!is.null(pattern)) { [18:41:52.722] computeRestarts <- base::computeRestarts [18:41:52.722] grepl <- base::grepl [18:41:52.722] restarts <- computeRestarts(cond) [18:41:52.722] for (restart in restarts) { [18:41:52.722] name <- restart$name [18:41:52.722] if (is.null(name)) [18:41:52.722] next [18:41:52.722] if (!grepl(pattern, name)) [18:41:52.722] next [18:41:52.722] invokeRestart(restart) [18:41:52.722] muffled <- TRUE [18:41:52.722] break [18:41:52.722] } [18:41:52.722] } [18:41:52.722] } [18:41:52.722] invisible(muffled) [18:41:52.722] } [18:41:52.722] muffleCondition(cond, pattern = "^muffle") [18:41:52.722] } [18:41:52.722] } [18:41:52.722] } [18:41:52.722] })) [18:41:52.722] }, error = function(ex) { [18:41:52.722] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.722] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.722] ...future.rng), started = ...future.startTime, [18:41:52.722] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.722] version = "1.8"), class = "FutureResult") [18:41:52.722] }, finally = { [18:41:52.722] if (!identical(...future.workdir, getwd())) [18:41:52.722] setwd(...future.workdir) [18:41:52.722] { [18:41:52.722] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.722] ...future.oldOptions$nwarnings <- NULL [18:41:52.722] } [18:41:52.722] base::options(...future.oldOptions) [18:41:52.722] if (.Platform$OS.type == "windows") { [18:41:52.722] old_names <- names(...future.oldEnvVars) [18:41:52.722] envs <- base::Sys.getenv() [18:41:52.722] names <- names(envs) [18:41:52.722] common <- intersect(names, old_names) [18:41:52.722] added <- setdiff(names, old_names) [18:41:52.722] removed <- setdiff(old_names, names) [18:41:52.722] changed <- common[...future.oldEnvVars[common] != [18:41:52.722] envs[common]] [18:41:52.722] NAMES <- toupper(changed) [18:41:52.722] args <- list() [18:41:52.722] for (kk in seq_along(NAMES)) { [18:41:52.722] name <- changed[[kk]] [18:41:52.722] NAME <- NAMES[[kk]] [18:41:52.722] if (name != NAME && is.element(NAME, old_names)) [18:41:52.722] next [18:41:52.722] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.722] } [18:41:52.722] NAMES <- toupper(added) [18:41:52.722] for (kk in seq_along(NAMES)) { [18:41:52.722] name <- added[[kk]] [18:41:52.722] NAME <- NAMES[[kk]] [18:41:52.722] if (name != NAME && is.element(NAME, old_names)) [18:41:52.722] next [18:41:52.722] args[[name]] <- "" [18:41:52.722] } [18:41:52.722] NAMES <- toupper(removed) [18:41:52.722] for (kk in seq_along(NAMES)) { [18:41:52.722] name <- removed[[kk]] [18:41:52.722] NAME <- NAMES[[kk]] [18:41:52.722] if (name != NAME && is.element(NAME, old_names)) [18:41:52.722] next [18:41:52.722] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.722] } [18:41:52.722] if (length(args) > 0) [18:41:52.722] base::do.call(base::Sys.setenv, args = args) [18:41:52.722] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.722] } [18:41:52.722] { [18:41:52.722] if (base::length(...future.futureOptionsAdded) > [18:41:52.722] 0L) { [18:41:52.722] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.722] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.722] base::options(opts) [18:41:52.722] } [18:41:52.722] { [18:41:52.722] { [18:41:52.722] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.722] NULL [18:41:52.722] } [18:41:52.722] options(future.plan = NULL) [18:41:52.722] if (is.na(NA_character_)) [18:41:52.722] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.722] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.722] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.722] .init = FALSE) [18:41:52.722] } [18:41:52.722] } [18:41:52.722] } [18:41:52.722] }) [18:41:52.722] if (TRUE) { [18:41:52.722] base::sink(type = "output", split = FALSE) [18:41:52.722] if (TRUE) { [18:41:52.722] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.722] } [18:41:52.722] else { [18:41:52.722] ...future.result["stdout"] <- base::list(NULL) [18:41:52.722] } [18:41:52.722] base::close(...future.stdout) [18:41:52.722] ...future.stdout <- NULL [18:41:52.722] } [18:41:52.722] ...future.result$conditions <- ...future.conditions [18:41:52.722] ...future.result$finished <- base::Sys.time() [18:41:52.722] ...future.result [18:41:52.722] } [18:41:52.728] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:52.728] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:52.729] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:52.729] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.729] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.730] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.730] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.730] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.744] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.744] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.745] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.745] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:52.746] MultisessionFuture started [18:41:52.746] - Launch lazy future ... done [18:41:52.746] run() for 'MultisessionFuture' ... done [18:41:52.746] Created future: [18:41:52.761] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.761] - Validating connection of MultisessionFuture [18:41:52.761] - received message: FutureResult [18:41:52.761] - Received FutureResult [18:41:52.761] - Erased future from FutureRegistry [18:41:52.762] result() for ClusterFuture ... [18:41:52.762] - result already collected: FutureResult [18:41:52.762] result() for ClusterFuture ... done [18:41:52.762] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.746] MultisessionFuture: [18:41:52.746] Label: 'future_sapply-1' [18:41:52.746] Expression: [18:41:52.746] { [18:41:52.746] do.call(function(...) { [18:41:52.746] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.746] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.746] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.746] on.exit(options(oopts), add = TRUE) [18:41:52.746] } [18:41:52.746] { [18:41:52.746] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.746] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.746] ...future.FUN(...future.X_jj, ...) [18:41:52.746] }) [18:41:52.746] } [18:41:52.746] }, args = future.call.arguments) [18:41:52.746] } [18:41:52.746] Lazy evaluation: FALSE [18:41:52.746] Asynchronous evaluation: TRUE [18:41:52.746] Local evaluation: TRUE [18:41:52.746] Environment: R_GlobalEnv [18:41:52.746] Capture standard output: TRUE [18:41:52.746] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.746] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.746] Packages: [18:41:52.746] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.746] Resolved: TRUE [18:41:52.746] Value: [18:41:52.746] Conditions captured: [18:41:52.746] Early signaling: FALSE [18:41:52.746] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.746] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.763] Chunk #1 of 2 ... DONE [18:41:52.763] Chunk #2 of 2 ... [18:41:52.763] - Finding globals in 'X' for chunk #2 ... [18:41:52.763] getGlobalsAndPackages() ... [18:41:52.763] Searching for globals... [18:41:52.764] [18:41:52.764] Searching for globals ... DONE [18:41:52.764] - globals: [0] [18:41:52.764] getGlobalsAndPackages() ... DONE [18:41:52.764] + additional globals found: [n=0] [18:41:52.764] + additional namespaces needed: [n=0] [18:41:52.765] - Finding globals in 'X' for chunk #2 ... DONE [18:41:52.765] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.765] - seeds: [18:41:52.765] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.765] getGlobalsAndPackages() ... [18:41:52.765] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.766] Resolving globals: FALSE [18:41:52.766] Tweak future expression to call with '...' arguments ... [18:41:52.766] { [18:41:52.766] do.call(function(...) { [18:41:52.766] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.766] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.766] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.766] on.exit(options(oopts), add = TRUE) [18:41:52.766] } [18:41:52.766] { [18:41:52.766] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.766] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.766] ...future.FUN(...future.X_jj, ...) [18:41:52.766] }) [18:41:52.766] } [18:41:52.766] }, args = future.call.arguments) [18:41:52.766] } [18:41:52.766] Tweak future expression to call with '...' arguments ... DONE [18:41:52.767] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.767] [18:41:52.767] getGlobalsAndPackages() ... DONE [18:41:52.768] run() for 'Future' ... [18:41:52.768] - state: 'created' [18:41:52.768] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.784] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.785] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.785] - Field: 'node' [18:41:52.785] - Field: 'label' [18:41:52.785] - Field: 'local' [18:41:52.786] - Field: 'owner' [18:41:52.786] - Field: 'envir' [18:41:52.786] - Field: 'workers' [18:41:52.786] - Field: 'packages' [18:41:52.786] - Field: 'gc' [18:41:52.787] - Field: 'conditions' [18:41:52.787] - Field: 'persistent' [18:41:52.787] - Field: 'expr' [18:41:52.787] - Field: 'uuid' [18:41:52.787] - Field: 'seed' [18:41:52.787] - Field: 'version' [18:41:52.788] - Field: 'result' [18:41:52.788] - Field: 'asynchronous' [18:41:52.788] - Field: 'calls' [18:41:52.788] - Field: 'globals' [18:41:52.788] - Field: 'stdout' [18:41:52.789] - Field: 'earlySignal' [18:41:52.789] - Field: 'lazy' [18:41:52.789] - Field: 'state' [18:41:52.789] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.789] - Launch lazy future ... [18:41:52.790] Packages needed by the future expression (n = 0): [18:41:52.790] Packages needed by future strategies (n = 0): [18:41:52.790] { [18:41:52.790] { [18:41:52.790] { [18:41:52.790] ...future.startTime <- base::Sys.time() [18:41:52.790] { [18:41:52.790] { [18:41:52.790] { [18:41:52.790] { [18:41:52.790] base::local({ [18:41:52.790] has_future <- base::requireNamespace("future", [18:41:52.790] quietly = TRUE) [18:41:52.790] if (has_future) { [18:41:52.790] ns <- base::getNamespace("future") [18:41:52.790] version <- ns[[".package"]][["version"]] [18:41:52.790] if (is.null(version)) [18:41:52.790] version <- utils::packageVersion("future") [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] version <- NULL [18:41:52.790] } [18:41:52.790] if (!has_future || version < "1.8.0") { [18:41:52.790] info <- base::c(r_version = base::gsub("R version ", [18:41:52.790] "", base::R.version$version.string), [18:41:52.790] platform = base::sprintf("%s (%s-bit)", [18:41:52.790] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.790] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.790] "release", "version")], collapse = " "), [18:41:52.790] hostname = base::Sys.info()[["nodename"]]) [18:41:52.790] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.790] info) [18:41:52.790] info <- base::paste(info, collapse = "; ") [18:41:52.790] if (!has_future) { [18:41:52.790] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.790] info) [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.790] info, version) [18:41:52.790] } [18:41:52.790] base::stop(msg) [18:41:52.790] } [18:41:52.790] }) [18:41:52.790] } [18:41:52.790] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.790] base::options(mc.cores = 1L) [18:41:52.790] } [18:41:52.790] ...future.strategy.old <- future::plan("list") [18:41:52.790] options(future.plan = NULL) [18:41:52.790] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.790] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.790] } [18:41:52.790] ...future.workdir <- getwd() [18:41:52.790] } [18:41:52.790] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.790] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.790] } [18:41:52.790] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.790] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.790] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.790] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.790] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.790] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.790] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.790] base::names(...future.oldOptions)) [18:41:52.790] } [18:41:52.790] if (FALSE) { [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] if (TRUE) { [18:41:52.790] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.790] open = "w") [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.790] windows = "NUL", "/dev/null"), open = "w") [18:41:52.790] } [18:41:52.790] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.790] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.790] base::sink(type = "output", split = FALSE) [18:41:52.790] base::close(...future.stdout) [18:41:52.790] }, add = TRUE) [18:41:52.790] } [18:41:52.790] ...future.frame <- base::sys.nframe() [18:41:52.790] ...future.conditions <- base::list() [18:41:52.790] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.790] if (FALSE) { [18:41:52.790] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.790] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.790] } [18:41:52.790] ...future.result <- base::tryCatch({ [18:41:52.790] base::withCallingHandlers({ [18:41:52.790] ...future.value <- base::withVisible(base::local({ [18:41:52.790] ...future.makeSendCondition <- base::local({ [18:41:52.790] sendCondition <- NULL [18:41:52.790] function(frame = 1L) { [18:41:52.790] if (is.function(sendCondition)) [18:41:52.790] return(sendCondition) [18:41:52.790] ns <- getNamespace("parallel") [18:41:52.790] if (exists("sendData", mode = "function", [18:41:52.790] envir = ns)) { [18:41:52.790] parallel_sendData <- get("sendData", mode = "function", [18:41:52.790] envir = ns) [18:41:52.790] envir <- sys.frame(frame) [18:41:52.790] master <- NULL [18:41:52.790] while (!identical(envir, .GlobalEnv) && [18:41:52.790] !identical(envir, emptyenv())) { [18:41:52.790] if (exists("master", mode = "list", envir = envir, [18:41:52.790] inherits = FALSE)) { [18:41:52.790] master <- get("master", mode = "list", [18:41:52.790] envir = envir, inherits = FALSE) [18:41:52.790] if (inherits(master, c("SOCKnode", [18:41:52.790] "SOCK0node"))) { [18:41:52.790] sendCondition <<- function(cond) { [18:41:52.790] data <- list(type = "VALUE", value = cond, [18:41:52.790] success = TRUE) [18:41:52.790] parallel_sendData(master, data) [18:41:52.790] } [18:41:52.790] return(sendCondition) [18:41:52.790] } [18:41:52.790] } [18:41:52.790] frame <- frame + 1L [18:41:52.790] envir <- sys.frame(frame) [18:41:52.790] } [18:41:52.790] } [18:41:52.790] sendCondition <<- function(cond) NULL [18:41:52.790] } [18:41:52.790] }) [18:41:52.790] withCallingHandlers({ [18:41:52.790] { [18:41:52.790] do.call(function(...) { [18:41:52.790] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.790] if (!identical(...future.globals.maxSize.org, [18:41:52.790] ...future.globals.maxSize)) { [18:41:52.790] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.790] on.exit(options(oopts), add = TRUE) [18:41:52.790] } [18:41:52.790] { [18:41:52.790] lapply(seq_along(...future.elements_ii), [18:41:52.790] FUN = function(jj) { [18:41:52.790] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.790] ...future.FUN(...future.X_jj, ...) [18:41:52.790] }) [18:41:52.790] } [18:41:52.790] }, args = future.call.arguments) [18:41:52.790] } [18:41:52.790] }, immediateCondition = function(cond) { [18:41:52.790] sendCondition <- ...future.makeSendCondition() [18:41:52.790] sendCondition(cond) [18:41:52.790] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.790] { [18:41:52.790] inherits <- base::inherits [18:41:52.790] invokeRestart <- base::invokeRestart [18:41:52.790] is.null <- base::is.null [18:41:52.790] muffled <- FALSE [18:41:52.790] if (inherits(cond, "message")) { [18:41:52.790] muffled <- grepl(pattern, "muffleMessage") [18:41:52.790] if (muffled) [18:41:52.790] invokeRestart("muffleMessage") [18:41:52.790] } [18:41:52.790] else if (inherits(cond, "warning")) { [18:41:52.790] muffled <- grepl(pattern, "muffleWarning") [18:41:52.790] if (muffled) [18:41:52.790] invokeRestart("muffleWarning") [18:41:52.790] } [18:41:52.790] else if (inherits(cond, "condition")) { [18:41:52.790] if (!is.null(pattern)) { [18:41:52.790] computeRestarts <- base::computeRestarts [18:41:52.790] grepl <- base::grepl [18:41:52.790] restarts <- computeRestarts(cond) [18:41:52.790] for (restart in restarts) { [18:41:52.790] name <- restart$name [18:41:52.790] if (is.null(name)) [18:41:52.790] next [18:41:52.790] if (!grepl(pattern, name)) [18:41:52.790] next [18:41:52.790] invokeRestart(restart) [18:41:52.790] muffled <- TRUE [18:41:52.790] break [18:41:52.790] } [18:41:52.790] } [18:41:52.790] } [18:41:52.790] invisible(muffled) [18:41:52.790] } [18:41:52.790] muffleCondition(cond) [18:41:52.790] }) [18:41:52.790] })) [18:41:52.790] future::FutureResult(value = ...future.value$value, [18:41:52.790] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.790] ...future.rng), globalenv = if (FALSE) [18:41:52.790] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.790] ...future.globalenv.names)) [18:41:52.790] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.790] }, condition = base::local({ [18:41:52.790] c <- base::c [18:41:52.790] inherits <- base::inherits [18:41:52.790] invokeRestart <- base::invokeRestart [18:41:52.790] length <- base::length [18:41:52.790] list <- base::list [18:41:52.790] seq.int <- base::seq.int [18:41:52.790] signalCondition <- base::signalCondition [18:41:52.790] sys.calls <- base::sys.calls [18:41:52.790] `[[` <- base::`[[` [18:41:52.790] `+` <- base::`+` [18:41:52.790] `<<-` <- base::`<<-` [18:41:52.790] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.790] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.790] 3L)] [18:41:52.790] } [18:41:52.790] function(cond) { [18:41:52.790] is_error <- inherits(cond, "error") [18:41:52.790] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.790] NULL) [18:41:52.790] if (is_error) { [18:41:52.790] sessionInformation <- function() { [18:41:52.790] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.790] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.790] search = base::search(), system = base::Sys.info()) [18:41:52.790] } [18:41:52.790] ...future.conditions[[length(...future.conditions) + [18:41:52.790] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.790] cond$call), session = sessionInformation(), [18:41:52.790] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.790] signalCondition(cond) [18:41:52.790] } [18:41:52.790] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.790] "immediateCondition"))) { [18:41:52.790] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.790] ...future.conditions[[length(...future.conditions) + [18:41:52.790] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.790] if (TRUE && !signal) { [18:41:52.790] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.790] { [18:41:52.790] inherits <- base::inherits [18:41:52.790] invokeRestart <- base::invokeRestart [18:41:52.790] is.null <- base::is.null [18:41:52.790] muffled <- FALSE [18:41:52.790] if (inherits(cond, "message")) { [18:41:52.790] muffled <- grepl(pattern, "muffleMessage") [18:41:52.790] if (muffled) [18:41:52.790] invokeRestart("muffleMessage") [18:41:52.790] } [18:41:52.790] else if (inherits(cond, "warning")) { [18:41:52.790] muffled <- grepl(pattern, "muffleWarning") [18:41:52.790] if (muffled) [18:41:52.790] invokeRestart("muffleWarning") [18:41:52.790] } [18:41:52.790] else if (inherits(cond, "condition")) { [18:41:52.790] if (!is.null(pattern)) { [18:41:52.790] computeRestarts <- base::computeRestarts [18:41:52.790] grepl <- base::grepl [18:41:52.790] restarts <- computeRestarts(cond) [18:41:52.790] for (restart in restarts) { [18:41:52.790] name <- restart$name [18:41:52.790] if (is.null(name)) [18:41:52.790] next [18:41:52.790] if (!grepl(pattern, name)) [18:41:52.790] next [18:41:52.790] invokeRestart(restart) [18:41:52.790] muffled <- TRUE [18:41:52.790] break [18:41:52.790] } [18:41:52.790] } [18:41:52.790] } [18:41:52.790] invisible(muffled) [18:41:52.790] } [18:41:52.790] muffleCondition(cond, pattern = "^muffle") [18:41:52.790] } [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] if (TRUE) { [18:41:52.790] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.790] { [18:41:52.790] inherits <- base::inherits [18:41:52.790] invokeRestart <- base::invokeRestart [18:41:52.790] is.null <- base::is.null [18:41:52.790] muffled <- FALSE [18:41:52.790] if (inherits(cond, "message")) { [18:41:52.790] muffled <- grepl(pattern, "muffleMessage") [18:41:52.790] if (muffled) [18:41:52.790] invokeRestart("muffleMessage") [18:41:52.790] } [18:41:52.790] else if (inherits(cond, "warning")) { [18:41:52.790] muffled <- grepl(pattern, "muffleWarning") [18:41:52.790] if (muffled) [18:41:52.790] invokeRestart("muffleWarning") [18:41:52.790] } [18:41:52.790] else if (inherits(cond, "condition")) { [18:41:52.790] if (!is.null(pattern)) { [18:41:52.790] computeRestarts <- base::computeRestarts [18:41:52.790] grepl <- base::grepl [18:41:52.790] restarts <- computeRestarts(cond) [18:41:52.790] for (restart in restarts) { [18:41:52.790] name <- restart$name [18:41:52.790] if (is.null(name)) [18:41:52.790] next [18:41:52.790] if (!grepl(pattern, name)) [18:41:52.790] next [18:41:52.790] invokeRestart(restart) [18:41:52.790] muffled <- TRUE [18:41:52.790] break [18:41:52.790] } [18:41:52.790] } [18:41:52.790] } [18:41:52.790] invisible(muffled) [18:41:52.790] } [18:41:52.790] muffleCondition(cond, pattern = "^muffle") [18:41:52.790] } [18:41:52.790] } [18:41:52.790] } [18:41:52.790] })) [18:41:52.790] }, error = function(ex) { [18:41:52.790] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.790] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.790] ...future.rng), started = ...future.startTime, [18:41:52.790] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.790] version = "1.8"), class = "FutureResult") [18:41:52.790] }, finally = { [18:41:52.790] if (!identical(...future.workdir, getwd())) [18:41:52.790] setwd(...future.workdir) [18:41:52.790] { [18:41:52.790] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.790] ...future.oldOptions$nwarnings <- NULL [18:41:52.790] } [18:41:52.790] base::options(...future.oldOptions) [18:41:52.790] if (.Platform$OS.type == "windows") { [18:41:52.790] old_names <- names(...future.oldEnvVars) [18:41:52.790] envs <- base::Sys.getenv() [18:41:52.790] names <- names(envs) [18:41:52.790] common <- intersect(names, old_names) [18:41:52.790] added <- setdiff(names, old_names) [18:41:52.790] removed <- setdiff(old_names, names) [18:41:52.790] changed <- common[...future.oldEnvVars[common] != [18:41:52.790] envs[common]] [18:41:52.790] NAMES <- toupper(changed) [18:41:52.790] args <- list() [18:41:52.790] for (kk in seq_along(NAMES)) { [18:41:52.790] name <- changed[[kk]] [18:41:52.790] NAME <- NAMES[[kk]] [18:41:52.790] if (name != NAME && is.element(NAME, old_names)) [18:41:52.790] next [18:41:52.790] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.790] } [18:41:52.790] NAMES <- toupper(added) [18:41:52.790] for (kk in seq_along(NAMES)) { [18:41:52.790] name <- added[[kk]] [18:41:52.790] NAME <- NAMES[[kk]] [18:41:52.790] if (name != NAME && is.element(NAME, old_names)) [18:41:52.790] next [18:41:52.790] args[[name]] <- "" [18:41:52.790] } [18:41:52.790] NAMES <- toupper(removed) [18:41:52.790] for (kk in seq_along(NAMES)) { [18:41:52.790] name <- removed[[kk]] [18:41:52.790] NAME <- NAMES[[kk]] [18:41:52.790] if (name != NAME && is.element(NAME, old_names)) [18:41:52.790] next [18:41:52.790] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.790] } [18:41:52.790] if (length(args) > 0) [18:41:52.790] base::do.call(base::Sys.setenv, args = args) [18:41:52.790] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.790] } [18:41:52.790] { [18:41:52.790] if (base::length(...future.futureOptionsAdded) > [18:41:52.790] 0L) { [18:41:52.790] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.790] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.790] base::options(opts) [18:41:52.790] } [18:41:52.790] { [18:41:52.790] { [18:41:52.790] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.790] NULL [18:41:52.790] } [18:41:52.790] options(future.plan = NULL) [18:41:52.790] if (is.na(NA_character_)) [18:41:52.790] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.790] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.790] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.790] .init = FALSE) [18:41:52.790] } [18:41:52.790] } [18:41:52.790] } [18:41:52.790] }) [18:41:52.790] if (TRUE) { [18:41:52.790] base::sink(type = "output", split = FALSE) [18:41:52.790] if (TRUE) { [18:41:52.790] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.790] } [18:41:52.790] else { [18:41:52.790] ...future.result["stdout"] <- base::list(NULL) [18:41:52.790] } [18:41:52.790] base::close(...future.stdout) [18:41:52.790] ...future.stdout <- NULL [18:41:52.790] } [18:41:52.790] ...future.result$conditions <- ...future.conditions [18:41:52.790] ...future.result$finished <- base::Sys.time() [18:41:52.790] ...future.result [18:41:52.790] } [18:41:52.796] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... [18:41:52.796] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:52.797] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:52.797] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.797] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.797] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.798] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.798] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.798] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.799] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.799] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.799] Exporting 5 global objects (0.99 KiB) to cluster node #1 ... DONE [18:41:52.800] MultisessionFuture started [18:41:52.800] - Launch lazy future ... done [18:41:52.800] run() for 'MultisessionFuture' ... done [18:41:52.800] Created future: [18:41:52.814] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.814] - Validating connection of MultisessionFuture [18:41:52.815] - received message: FutureResult [18:41:52.815] - Received FutureResult [18:41:52.815] - Erased future from FutureRegistry [18:41:52.815] result() for ClusterFuture ... [18:41:52.815] - result already collected: FutureResult [18:41:52.816] result() for ClusterFuture ... done [18:41:52.816] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.801] MultisessionFuture: [18:41:52.801] Label: 'future_sapply-2' [18:41:52.801] Expression: [18:41:52.801] { [18:41:52.801] do.call(function(...) { [18:41:52.801] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.801] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.801] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.801] on.exit(options(oopts), add = TRUE) [18:41:52.801] } [18:41:52.801] { [18:41:52.801] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.801] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.801] ...future.FUN(...future.X_jj, ...) [18:41:52.801] }) [18:41:52.801] } [18:41:52.801] }, args = future.call.arguments) [18:41:52.801] } [18:41:52.801] Lazy evaluation: FALSE [18:41:52.801] Asynchronous evaluation: TRUE [18:41:52.801] Local evaluation: TRUE [18:41:52.801] Environment: R_GlobalEnv [18:41:52.801] Capture standard output: TRUE [18:41:52.801] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.801] Globals: 5 objects totaling 559 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.801] Packages: [18:41:52.801] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.801] Resolved: TRUE [18:41:52.801] Value: [18:41:52.801] Conditions captured: [18:41:52.801] Early signaling: FALSE [18:41:52.801] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.801] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.816] Chunk #2 of 2 ... DONE [18:41:52.816] Launching 2 futures (chunks) ... DONE [18:41:52.817] Resolving 2 futures (chunks) ... [18:41:52.817] resolve() on list ... [18:41:52.817] recursive: 0 [18:41:52.817] length: 2 [18:41:52.818] [18:41:52.818] Future #1 [18:41:52.818] result() for ClusterFuture ... [18:41:52.819] - result already collected: FutureResult [18:41:52.819] result() for ClusterFuture ... done [18:41:52.819] result() for ClusterFuture ... [18:41:52.819] - result already collected: FutureResult [18:41:52.820] result() for ClusterFuture ... done [18:41:52.820] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:52.820] - nx: 2 [18:41:52.820] - relay: TRUE [18:41:52.821] - stdout: TRUE [18:41:52.821] - signal: TRUE [18:41:52.821] - resignal: FALSE [18:41:52.821] - force: TRUE [18:41:52.821] - relayed: [n=2] FALSE, FALSE [18:41:52.822] - queued futures: [n=2] FALSE, FALSE [18:41:52.822] - until=1 [18:41:52.822] - relaying element #1 [18:41:52.823] result() for ClusterFuture ... [18:41:52.823] - result already collected: FutureResult [18:41:52.823] result() for ClusterFuture ... done [18:41:52.823] result() for ClusterFuture ... [18:41:52.824] - result already collected: FutureResult [18:41:52.824] result() for ClusterFuture ... done [18:41:52.824] result() for ClusterFuture ... [18:41:52.824] - result already collected: FutureResult [18:41:52.825] result() for ClusterFuture ... done [18:41:52.825] result() for ClusterFuture ... [18:41:52.825] - result already collected: FutureResult [18:41:52.825] result() for ClusterFuture ... done [18:41:52.826] - relayed: [n=2] TRUE, FALSE [18:41:52.826] - queued futures: [n=2] TRUE, FALSE [18:41:52.826] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:52.826] length: 1 (resolved future 1) [18:41:52.827] Future #2 [18:41:52.827] result() for ClusterFuture ... [18:41:52.827] - result already collected: FutureResult [18:41:52.827] result() for ClusterFuture ... done [18:41:52.828] result() for ClusterFuture ... [18:41:52.828] - result already collected: FutureResult [18:41:52.828] result() for ClusterFuture ... done [18:41:52.829] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:52.829] - nx: 2 [18:41:52.829] - relay: TRUE [18:41:52.829] - stdout: TRUE [18:41:52.830] - signal: TRUE [18:41:52.830] - resignal: FALSE [18:41:52.830] - force: TRUE [18:41:52.830] - relayed: [n=2] TRUE, FALSE [18:41:52.830] - queued futures: [n=2] TRUE, FALSE [18:41:52.831] - until=2 [18:41:52.831] - relaying element #2 [18:41:52.831] result() for ClusterFuture ... [18:41:52.832] - result already collected: FutureResult [18:41:52.832] result() for ClusterFuture ... done [18:41:52.832] result() for ClusterFuture ... [18:41:52.832] - result already collected: FutureResult [18:41:52.833] result() for ClusterFuture ... done [18:41:52.833] result() for ClusterFuture ... [18:41:52.833] - result already collected: FutureResult [18:41:52.833] result() for ClusterFuture ... done [18:41:52.834] result() for ClusterFuture ... [18:41:52.834] - result already collected: FutureResult [18:41:52.834] result() for ClusterFuture ... done [18:41:52.834] - relayed: [n=2] TRUE, TRUE [18:41:52.835] - queued futures: [n=2] TRUE, TRUE [18:41:52.835] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:52.835] length: 0 (resolved future 2) [18:41:52.835] Relaying remaining futures [18:41:52.836] signalConditionsASAP(NULL, pos=0) ... [18:41:52.836] - nx: 2 [18:41:52.836] - relay: TRUE [18:41:52.836] - stdout: TRUE [18:41:52.837] - signal: TRUE [18:41:52.837] - resignal: FALSE [18:41:52.837] - force: TRUE [18:41:52.837] - relayed: [n=2] TRUE, TRUE [18:41:52.838] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:52.838] - relayed: [n=2] TRUE, TRUE [18:41:52.838] - queued futures: [n=2] TRUE, TRUE [18:41:52.839] signalConditionsASAP(NULL, pos=0) ... done [18:41:52.839] resolve() on list ... DONE [18:41:52.839] result() for ClusterFuture ... [18:41:52.839] - result already collected: FutureResult [18:41:52.840] result() for ClusterFuture ... done [18:41:52.840] result() for ClusterFuture ... [18:41:52.840] - result already collected: FutureResult [18:41:52.840] result() for ClusterFuture ... done [18:41:52.841] result() for ClusterFuture ... [18:41:52.841] - result already collected: FutureResult [18:41:52.841] result() for ClusterFuture ... done [18:41:52.841] result() for ClusterFuture ... [18:41:52.842] - result already collected: FutureResult [18:41:52.842] result() for ClusterFuture ... done [18:41:52.842] - Number of value chunks collected: 2 [18:41:52.842] Resolving 2 futures (chunks) ... DONE [18:41:52.843] Reducing values from 2 chunks ... [18:41:52.843] - Number of values collected after concatenation: 6 [18:41:52.843] - Number of values expected: 6 [18:41:52.843] Reducing values from 2 chunks ... DONE [18:41:52.844] future_lapply() ... DONE List of 2 $ y0: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: Named int [1:6] 1 2 2 3 3 4 ..- attr(*, "names")= chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:52.847] future_lapply() ... [18:41:52.851] Number of chunks: 2 [18:41:52.851] getGlobalsAndPackagesXApply() ... [18:41:52.851] - future.globals: TRUE [18:41:52.852] getGlobalsAndPackages() ... [18:41:52.852] Searching for globals... [18:41:52.854] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:52.854] Searching for globals ... DONE [18:41:52.854] Resolving globals: FALSE [18:41:52.855] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:52.855] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:52.856] - globals: [1] 'FUN' [18:41:52.856] [18:41:52.856] getGlobalsAndPackages() ... DONE [18:41:52.856] - globals found/used: [n=1] 'FUN' [18:41:52.856] - needed namespaces: [n=0] [18:41:52.856] Finding globals ... DONE [18:41:52.857] - use_args: TRUE [18:41:52.857] - Getting '...' globals ... [18:41:52.857] resolve() on list ... [18:41:52.857] recursive: 0 [18:41:52.858] length: 1 [18:41:52.858] elements: '...' [18:41:52.858] length: 0 (resolved future 1) [18:41:52.858] resolve() on list ... DONE [18:41:52.858] - '...' content: [n=0] [18:41:52.858] List of 1 [18:41:52.858] $ ...: list() [18:41:52.858] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.858] - attr(*, "where")=List of 1 [18:41:52.858] ..$ ...: [18:41:52.858] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.858] - attr(*, "resolved")= logi TRUE [18:41:52.858] - attr(*, "total_size")= num NA [18:41:52.861] - Getting '...' globals ... DONE [18:41:52.862] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:52.862] List of 2 [18:41:52.862] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:52.862] $ ... : list() [18:41:52.862] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:52.862] - attr(*, "where")=List of 2 [18:41:52.862] ..$ ...future.FUN: [18:41:52.862] ..$ ... : [18:41:52.862] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:52.862] - attr(*, "resolved")= logi FALSE [18:41:52.862] - attr(*, "total_size")= int 6664 [18:41:52.866] Packages to be attached in all futures: [n=0] [18:41:52.866] getGlobalsAndPackagesXApply() ... DONE [18:41:52.866] Number of futures (= number of chunks): 2 [18:41:52.866] Launching 2 futures (chunks) ... [18:41:52.866] Chunk #1 of 2 ... [18:41:52.867] - Finding globals in 'X' for chunk #1 ... [18:41:52.867] getGlobalsAndPackages() ... [18:41:52.867] Searching for globals... [18:41:52.867] [18:41:52.868] Searching for globals ... DONE [18:41:52.868] - globals: [0] [18:41:52.868] getGlobalsAndPackages() ... DONE [18:41:52.868] + additional globals found: [n=0] [18:41:52.868] + additional namespaces needed: [n=0] [18:41:52.868] - Finding globals in 'X' for chunk #1 ... DONE [18:41:52.868] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.869] - seeds: [18:41:52.869] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.869] getGlobalsAndPackages() ... [18:41:52.869] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.869] Resolving globals: FALSE [18:41:52.869] Tweak future expression to call with '...' arguments ... [18:41:52.870] { [18:41:52.870] do.call(function(...) { [18:41:52.870] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.870] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.870] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.870] on.exit(options(oopts), add = TRUE) [18:41:52.870] } [18:41:52.870] { [18:41:52.870] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.870] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.870] ...future.FUN(...future.X_jj, ...) [18:41:52.870] }) [18:41:52.870] } [18:41:52.870] }, args = future.call.arguments) [18:41:52.870] } [18:41:52.870] Tweak future expression to call with '...' arguments ... DONE [18:41:52.871] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.871] [18:41:52.871] getGlobalsAndPackages() ... DONE [18:41:52.871] run() for 'Future' ... [18:41:52.872] - state: 'created' [18:41:52.872] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.887] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.888] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.888] - Field: 'node' [18:41:52.888] - Field: 'label' [18:41:52.888] - Field: 'local' [18:41:52.888] - Field: 'owner' [18:41:52.889] - Field: 'envir' [18:41:52.889] - Field: 'workers' [18:41:52.889] - Field: 'packages' [18:41:52.889] - Field: 'gc' [18:41:52.889] - Field: 'conditions' [18:41:52.890] - Field: 'persistent' [18:41:52.890] - Field: 'expr' [18:41:52.890] - Field: 'uuid' [18:41:52.890] - Field: 'seed' [18:41:52.890] - Field: 'version' [18:41:52.890] - Field: 'result' [18:41:52.891] - Field: 'asynchronous' [18:41:52.891] - Field: 'calls' [18:41:52.891] - Field: 'globals' [18:41:52.891] - Field: 'stdout' [18:41:52.891] - Field: 'earlySignal' [18:41:52.892] - Field: 'lazy' [18:41:52.892] - Field: 'state' [18:41:52.892] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.892] - Launch lazy future ... [18:41:52.893] Packages needed by the future expression (n = 0): [18:41:52.893] Packages needed by future strategies (n = 0): [18:41:52.893] { [18:41:52.893] { [18:41:52.893] { [18:41:52.893] ...future.startTime <- base::Sys.time() [18:41:52.893] { [18:41:52.893] { [18:41:52.893] { [18:41:52.893] { [18:41:52.893] base::local({ [18:41:52.893] has_future <- base::requireNamespace("future", [18:41:52.893] quietly = TRUE) [18:41:52.893] if (has_future) { [18:41:52.893] ns <- base::getNamespace("future") [18:41:52.893] version <- ns[[".package"]][["version"]] [18:41:52.893] if (is.null(version)) [18:41:52.893] version <- utils::packageVersion("future") [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] version <- NULL [18:41:52.893] } [18:41:52.893] if (!has_future || version < "1.8.0") { [18:41:52.893] info <- base::c(r_version = base::gsub("R version ", [18:41:52.893] "", base::R.version$version.string), [18:41:52.893] platform = base::sprintf("%s (%s-bit)", [18:41:52.893] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.893] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.893] "release", "version")], collapse = " "), [18:41:52.893] hostname = base::Sys.info()[["nodename"]]) [18:41:52.893] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.893] info) [18:41:52.893] info <- base::paste(info, collapse = "; ") [18:41:52.893] if (!has_future) { [18:41:52.893] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.893] info) [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.893] info, version) [18:41:52.893] } [18:41:52.893] base::stop(msg) [18:41:52.893] } [18:41:52.893] }) [18:41:52.893] } [18:41:52.893] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.893] base::options(mc.cores = 1L) [18:41:52.893] } [18:41:52.893] ...future.strategy.old <- future::plan("list") [18:41:52.893] options(future.plan = NULL) [18:41:52.893] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.893] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.893] } [18:41:52.893] ...future.workdir <- getwd() [18:41:52.893] } [18:41:52.893] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.893] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.893] } [18:41:52.893] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.893] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.893] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.893] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.893] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.893] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.893] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.893] base::names(...future.oldOptions)) [18:41:52.893] } [18:41:52.893] if (FALSE) { [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] if (TRUE) { [18:41:52.893] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.893] open = "w") [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.893] windows = "NUL", "/dev/null"), open = "w") [18:41:52.893] } [18:41:52.893] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.893] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.893] base::sink(type = "output", split = FALSE) [18:41:52.893] base::close(...future.stdout) [18:41:52.893] }, add = TRUE) [18:41:52.893] } [18:41:52.893] ...future.frame <- base::sys.nframe() [18:41:52.893] ...future.conditions <- base::list() [18:41:52.893] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.893] if (FALSE) { [18:41:52.893] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.893] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.893] } [18:41:52.893] ...future.result <- base::tryCatch({ [18:41:52.893] base::withCallingHandlers({ [18:41:52.893] ...future.value <- base::withVisible(base::local({ [18:41:52.893] ...future.makeSendCondition <- base::local({ [18:41:52.893] sendCondition <- NULL [18:41:52.893] function(frame = 1L) { [18:41:52.893] if (is.function(sendCondition)) [18:41:52.893] return(sendCondition) [18:41:52.893] ns <- getNamespace("parallel") [18:41:52.893] if (exists("sendData", mode = "function", [18:41:52.893] envir = ns)) { [18:41:52.893] parallel_sendData <- get("sendData", mode = "function", [18:41:52.893] envir = ns) [18:41:52.893] envir <- sys.frame(frame) [18:41:52.893] master <- NULL [18:41:52.893] while (!identical(envir, .GlobalEnv) && [18:41:52.893] !identical(envir, emptyenv())) { [18:41:52.893] if (exists("master", mode = "list", envir = envir, [18:41:52.893] inherits = FALSE)) { [18:41:52.893] master <- get("master", mode = "list", [18:41:52.893] envir = envir, inherits = FALSE) [18:41:52.893] if (inherits(master, c("SOCKnode", [18:41:52.893] "SOCK0node"))) { [18:41:52.893] sendCondition <<- function(cond) { [18:41:52.893] data <- list(type = "VALUE", value = cond, [18:41:52.893] success = TRUE) [18:41:52.893] parallel_sendData(master, data) [18:41:52.893] } [18:41:52.893] return(sendCondition) [18:41:52.893] } [18:41:52.893] } [18:41:52.893] frame <- frame + 1L [18:41:52.893] envir <- sys.frame(frame) [18:41:52.893] } [18:41:52.893] } [18:41:52.893] sendCondition <<- function(cond) NULL [18:41:52.893] } [18:41:52.893] }) [18:41:52.893] withCallingHandlers({ [18:41:52.893] { [18:41:52.893] do.call(function(...) { [18:41:52.893] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.893] if (!identical(...future.globals.maxSize.org, [18:41:52.893] ...future.globals.maxSize)) { [18:41:52.893] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.893] on.exit(options(oopts), add = TRUE) [18:41:52.893] } [18:41:52.893] { [18:41:52.893] lapply(seq_along(...future.elements_ii), [18:41:52.893] FUN = function(jj) { [18:41:52.893] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.893] ...future.FUN(...future.X_jj, ...) [18:41:52.893] }) [18:41:52.893] } [18:41:52.893] }, args = future.call.arguments) [18:41:52.893] } [18:41:52.893] }, immediateCondition = function(cond) { [18:41:52.893] sendCondition <- ...future.makeSendCondition() [18:41:52.893] sendCondition(cond) [18:41:52.893] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.893] { [18:41:52.893] inherits <- base::inherits [18:41:52.893] invokeRestart <- base::invokeRestart [18:41:52.893] is.null <- base::is.null [18:41:52.893] muffled <- FALSE [18:41:52.893] if (inherits(cond, "message")) { [18:41:52.893] muffled <- grepl(pattern, "muffleMessage") [18:41:52.893] if (muffled) [18:41:52.893] invokeRestart("muffleMessage") [18:41:52.893] } [18:41:52.893] else if (inherits(cond, "warning")) { [18:41:52.893] muffled <- grepl(pattern, "muffleWarning") [18:41:52.893] if (muffled) [18:41:52.893] invokeRestart("muffleWarning") [18:41:52.893] } [18:41:52.893] else if (inherits(cond, "condition")) { [18:41:52.893] if (!is.null(pattern)) { [18:41:52.893] computeRestarts <- base::computeRestarts [18:41:52.893] grepl <- base::grepl [18:41:52.893] restarts <- computeRestarts(cond) [18:41:52.893] for (restart in restarts) { [18:41:52.893] name <- restart$name [18:41:52.893] if (is.null(name)) [18:41:52.893] next [18:41:52.893] if (!grepl(pattern, name)) [18:41:52.893] next [18:41:52.893] invokeRestart(restart) [18:41:52.893] muffled <- TRUE [18:41:52.893] break [18:41:52.893] } [18:41:52.893] } [18:41:52.893] } [18:41:52.893] invisible(muffled) [18:41:52.893] } [18:41:52.893] muffleCondition(cond) [18:41:52.893] }) [18:41:52.893] })) [18:41:52.893] future::FutureResult(value = ...future.value$value, [18:41:52.893] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.893] ...future.rng), globalenv = if (FALSE) [18:41:52.893] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.893] ...future.globalenv.names)) [18:41:52.893] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.893] }, condition = base::local({ [18:41:52.893] c <- base::c [18:41:52.893] inherits <- base::inherits [18:41:52.893] invokeRestart <- base::invokeRestart [18:41:52.893] length <- base::length [18:41:52.893] list <- base::list [18:41:52.893] seq.int <- base::seq.int [18:41:52.893] signalCondition <- base::signalCondition [18:41:52.893] sys.calls <- base::sys.calls [18:41:52.893] `[[` <- base::`[[` [18:41:52.893] `+` <- base::`+` [18:41:52.893] `<<-` <- base::`<<-` [18:41:52.893] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.893] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.893] 3L)] [18:41:52.893] } [18:41:52.893] function(cond) { [18:41:52.893] is_error <- inherits(cond, "error") [18:41:52.893] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.893] NULL) [18:41:52.893] if (is_error) { [18:41:52.893] sessionInformation <- function() { [18:41:52.893] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.893] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.893] search = base::search(), system = base::Sys.info()) [18:41:52.893] } [18:41:52.893] ...future.conditions[[length(...future.conditions) + [18:41:52.893] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.893] cond$call), session = sessionInformation(), [18:41:52.893] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.893] signalCondition(cond) [18:41:52.893] } [18:41:52.893] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.893] "immediateCondition"))) { [18:41:52.893] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.893] ...future.conditions[[length(...future.conditions) + [18:41:52.893] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.893] if (TRUE && !signal) { [18:41:52.893] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.893] { [18:41:52.893] inherits <- base::inherits [18:41:52.893] invokeRestart <- base::invokeRestart [18:41:52.893] is.null <- base::is.null [18:41:52.893] muffled <- FALSE [18:41:52.893] if (inherits(cond, "message")) { [18:41:52.893] muffled <- grepl(pattern, "muffleMessage") [18:41:52.893] if (muffled) [18:41:52.893] invokeRestart("muffleMessage") [18:41:52.893] } [18:41:52.893] else if (inherits(cond, "warning")) { [18:41:52.893] muffled <- grepl(pattern, "muffleWarning") [18:41:52.893] if (muffled) [18:41:52.893] invokeRestart("muffleWarning") [18:41:52.893] } [18:41:52.893] else if (inherits(cond, "condition")) { [18:41:52.893] if (!is.null(pattern)) { [18:41:52.893] computeRestarts <- base::computeRestarts [18:41:52.893] grepl <- base::grepl [18:41:52.893] restarts <- computeRestarts(cond) [18:41:52.893] for (restart in restarts) { [18:41:52.893] name <- restart$name [18:41:52.893] if (is.null(name)) [18:41:52.893] next [18:41:52.893] if (!grepl(pattern, name)) [18:41:52.893] next [18:41:52.893] invokeRestart(restart) [18:41:52.893] muffled <- TRUE [18:41:52.893] break [18:41:52.893] } [18:41:52.893] } [18:41:52.893] } [18:41:52.893] invisible(muffled) [18:41:52.893] } [18:41:52.893] muffleCondition(cond, pattern = "^muffle") [18:41:52.893] } [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] if (TRUE) { [18:41:52.893] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.893] { [18:41:52.893] inherits <- base::inherits [18:41:52.893] invokeRestart <- base::invokeRestart [18:41:52.893] is.null <- base::is.null [18:41:52.893] muffled <- FALSE [18:41:52.893] if (inherits(cond, "message")) { [18:41:52.893] muffled <- grepl(pattern, "muffleMessage") [18:41:52.893] if (muffled) [18:41:52.893] invokeRestart("muffleMessage") [18:41:52.893] } [18:41:52.893] else if (inherits(cond, "warning")) { [18:41:52.893] muffled <- grepl(pattern, "muffleWarning") [18:41:52.893] if (muffled) [18:41:52.893] invokeRestart("muffleWarning") [18:41:52.893] } [18:41:52.893] else if (inherits(cond, "condition")) { [18:41:52.893] if (!is.null(pattern)) { [18:41:52.893] computeRestarts <- base::computeRestarts [18:41:52.893] grepl <- base::grepl [18:41:52.893] restarts <- computeRestarts(cond) [18:41:52.893] for (restart in restarts) { [18:41:52.893] name <- restart$name [18:41:52.893] if (is.null(name)) [18:41:52.893] next [18:41:52.893] if (!grepl(pattern, name)) [18:41:52.893] next [18:41:52.893] invokeRestart(restart) [18:41:52.893] muffled <- TRUE [18:41:52.893] break [18:41:52.893] } [18:41:52.893] } [18:41:52.893] } [18:41:52.893] invisible(muffled) [18:41:52.893] } [18:41:52.893] muffleCondition(cond, pattern = "^muffle") [18:41:52.893] } [18:41:52.893] } [18:41:52.893] } [18:41:52.893] })) [18:41:52.893] }, error = function(ex) { [18:41:52.893] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.893] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.893] ...future.rng), started = ...future.startTime, [18:41:52.893] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.893] version = "1.8"), class = "FutureResult") [18:41:52.893] }, finally = { [18:41:52.893] if (!identical(...future.workdir, getwd())) [18:41:52.893] setwd(...future.workdir) [18:41:52.893] { [18:41:52.893] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.893] ...future.oldOptions$nwarnings <- NULL [18:41:52.893] } [18:41:52.893] base::options(...future.oldOptions) [18:41:52.893] if (.Platform$OS.type == "windows") { [18:41:52.893] old_names <- names(...future.oldEnvVars) [18:41:52.893] envs <- base::Sys.getenv() [18:41:52.893] names <- names(envs) [18:41:52.893] common <- intersect(names, old_names) [18:41:52.893] added <- setdiff(names, old_names) [18:41:52.893] removed <- setdiff(old_names, names) [18:41:52.893] changed <- common[...future.oldEnvVars[common] != [18:41:52.893] envs[common]] [18:41:52.893] NAMES <- toupper(changed) [18:41:52.893] args <- list() [18:41:52.893] for (kk in seq_along(NAMES)) { [18:41:52.893] name <- changed[[kk]] [18:41:52.893] NAME <- NAMES[[kk]] [18:41:52.893] if (name != NAME && is.element(NAME, old_names)) [18:41:52.893] next [18:41:52.893] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.893] } [18:41:52.893] NAMES <- toupper(added) [18:41:52.893] for (kk in seq_along(NAMES)) { [18:41:52.893] name <- added[[kk]] [18:41:52.893] NAME <- NAMES[[kk]] [18:41:52.893] if (name != NAME && is.element(NAME, old_names)) [18:41:52.893] next [18:41:52.893] args[[name]] <- "" [18:41:52.893] } [18:41:52.893] NAMES <- toupper(removed) [18:41:52.893] for (kk in seq_along(NAMES)) { [18:41:52.893] name <- removed[[kk]] [18:41:52.893] NAME <- NAMES[[kk]] [18:41:52.893] if (name != NAME && is.element(NAME, old_names)) [18:41:52.893] next [18:41:52.893] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.893] } [18:41:52.893] if (length(args) > 0) [18:41:52.893] base::do.call(base::Sys.setenv, args = args) [18:41:52.893] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.893] } [18:41:52.893] { [18:41:52.893] if (base::length(...future.futureOptionsAdded) > [18:41:52.893] 0L) { [18:41:52.893] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.893] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.893] base::options(opts) [18:41:52.893] } [18:41:52.893] { [18:41:52.893] { [18:41:52.893] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.893] NULL [18:41:52.893] } [18:41:52.893] options(future.plan = NULL) [18:41:52.893] if (is.na(NA_character_)) [18:41:52.893] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.893] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.893] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.893] .init = FALSE) [18:41:52.893] } [18:41:52.893] } [18:41:52.893] } [18:41:52.893] }) [18:41:52.893] if (TRUE) { [18:41:52.893] base::sink(type = "output", split = FALSE) [18:41:52.893] if (TRUE) { [18:41:52.893] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.893] } [18:41:52.893] else { [18:41:52.893] ...future.result["stdout"] <- base::list(NULL) [18:41:52.893] } [18:41:52.893] base::close(...future.stdout) [18:41:52.893] ...future.stdout <- NULL [18:41:52.893] } [18:41:52.893] ...future.result$conditions <- ...future.conditions [18:41:52.893] ...future.result$finished <- base::Sys.time() [18:41:52.893] ...future.result [18:41:52.893] } [18:41:52.899] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:52.900] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:52.900] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:52.900] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.901] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.901] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.901] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.902] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.902] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.902] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.903] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.903] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:52.904] MultisessionFuture started [18:41:52.904] - Launch lazy future ... done [18:41:52.904] run() for 'MultisessionFuture' ... done [18:41:52.904] Created future: [18:41:52.919] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.919] - Validating connection of MultisessionFuture [18:41:52.919] - received message: FutureResult [18:41:52.919] - Received FutureResult [18:41:52.920] - Erased future from FutureRegistry [18:41:52.920] result() for ClusterFuture ... [18:41:52.920] - result already collected: FutureResult [18:41:52.920] result() for ClusterFuture ... done [18:41:52.920] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.904] MultisessionFuture: [18:41:52.904] Label: 'future_sapply-1' [18:41:52.904] Expression: [18:41:52.904] { [18:41:52.904] do.call(function(...) { [18:41:52.904] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.904] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.904] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.904] on.exit(options(oopts), add = TRUE) [18:41:52.904] } [18:41:52.904] { [18:41:52.904] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.904] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.904] ...future.FUN(...future.X_jj, ...) [18:41:52.904] }) [18:41:52.904] } [18:41:52.904] }, args = future.call.arguments) [18:41:52.904] } [18:41:52.904] Lazy evaluation: FALSE [18:41:52.904] Asynchronous evaluation: TRUE [18:41:52.904] Local evaluation: TRUE [18:41:52.904] Environment: R_GlobalEnv [18:41:52.904] Capture standard output: TRUE [18:41:52.904] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.904] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.904] Packages: [18:41:52.904] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.904] Resolved: TRUE [18:41:52.904] Value: [18:41:52.904] Conditions captured: [18:41:52.904] Early signaling: FALSE [18:41:52.904] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.904] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.921] Chunk #1 of 2 ... DONE [18:41:52.921] Chunk #2 of 2 ... [18:41:52.921] - Finding globals in 'X' for chunk #2 ... [18:41:52.921] getGlobalsAndPackages() ... [18:41:52.921] Searching for globals... [18:41:52.922] [18:41:52.922] Searching for globals ... DONE [18:41:52.922] - globals: [0] [18:41:52.922] getGlobalsAndPackages() ... DONE [18:41:52.923] + additional globals found: [n=0] [18:41:52.923] + additional namespaces needed: [n=0] [18:41:52.923] - Finding globals in 'X' for chunk #2 ... DONE [18:41:52.923] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:52.923] - seeds: [18:41:52.923] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.924] getGlobalsAndPackages() ... [18:41:52.924] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.924] Resolving globals: FALSE [18:41:52.924] Tweak future expression to call with '...' arguments ... [18:41:52.924] { [18:41:52.924] do.call(function(...) { [18:41:52.924] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.924] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.924] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.924] on.exit(options(oopts), add = TRUE) [18:41:52.924] } [18:41:52.924] { [18:41:52.924] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.924] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.924] ...future.FUN(...future.X_jj, ...) [18:41:52.924] }) [18:41:52.924] } [18:41:52.924] }, args = future.call.arguments) [18:41:52.924] } [18:41:52.925] Tweak future expression to call with '...' arguments ... DONE [18:41:52.925] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:52.926] [18:41:52.926] getGlobalsAndPackages() ... DONE [18:41:52.926] run() for 'Future' ... [18:41:52.927] - state: 'created' [18:41:52.927] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:52.942] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.943] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:52.943] - Field: 'node' [18:41:52.943] - Field: 'label' [18:41:52.943] - Field: 'local' [18:41:52.943] - Field: 'owner' [18:41:52.944] - Field: 'envir' [18:41:52.944] - Field: 'workers' [18:41:52.944] - Field: 'packages' [18:41:52.944] - Field: 'gc' [18:41:52.944] - Field: 'conditions' [18:41:52.945] - Field: 'persistent' [18:41:52.945] - Field: 'expr' [18:41:52.945] - Field: 'uuid' [18:41:52.945] - Field: 'seed' [18:41:52.945] - Field: 'version' [18:41:52.945] - Field: 'result' [18:41:52.946] - Field: 'asynchronous' [18:41:52.946] - Field: 'calls' [18:41:52.946] - Field: 'globals' [18:41:52.946] - Field: 'stdout' [18:41:52.946] - Field: 'earlySignal' [18:41:52.947] - Field: 'lazy' [18:41:52.947] - Field: 'state' [18:41:52.947] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:52.947] - Launch lazy future ... [18:41:52.948] Packages needed by the future expression (n = 0): [18:41:52.948] Packages needed by future strategies (n = 0): [18:41:52.948] { [18:41:52.948] { [18:41:52.948] { [18:41:52.948] ...future.startTime <- base::Sys.time() [18:41:52.948] { [18:41:52.948] { [18:41:52.948] { [18:41:52.948] { [18:41:52.948] base::local({ [18:41:52.948] has_future <- base::requireNamespace("future", [18:41:52.948] quietly = TRUE) [18:41:52.948] if (has_future) { [18:41:52.948] ns <- base::getNamespace("future") [18:41:52.948] version <- ns[[".package"]][["version"]] [18:41:52.948] if (is.null(version)) [18:41:52.948] version <- utils::packageVersion("future") [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] version <- NULL [18:41:52.948] } [18:41:52.948] if (!has_future || version < "1.8.0") { [18:41:52.948] info <- base::c(r_version = base::gsub("R version ", [18:41:52.948] "", base::R.version$version.string), [18:41:52.948] platform = base::sprintf("%s (%s-bit)", [18:41:52.948] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:52.948] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:52.948] "release", "version")], collapse = " "), [18:41:52.948] hostname = base::Sys.info()[["nodename"]]) [18:41:52.948] info <- base::sprintf("%s: %s", base::names(info), [18:41:52.948] info) [18:41:52.948] info <- base::paste(info, collapse = "; ") [18:41:52.948] if (!has_future) { [18:41:52.948] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:52.948] info) [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:52.948] info, version) [18:41:52.948] } [18:41:52.948] base::stop(msg) [18:41:52.948] } [18:41:52.948] }) [18:41:52.948] } [18:41:52.948] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:52.948] base::options(mc.cores = 1L) [18:41:52.948] } [18:41:52.948] ...future.strategy.old <- future::plan("list") [18:41:52.948] options(future.plan = NULL) [18:41:52.948] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.948] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:52.948] } [18:41:52.948] ...future.workdir <- getwd() [18:41:52.948] } [18:41:52.948] ...future.oldOptions <- base::as.list(base::.Options) [18:41:52.948] ...future.oldEnvVars <- base::Sys.getenv() [18:41:52.948] } [18:41:52.948] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:52.948] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:52.948] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:52.948] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:52.948] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:52.948] future.stdout.windows.reencode = NULL, width = 80L) [18:41:52.948] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:52.948] base::names(...future.oldOptions)) [18:41:52.948] } [18:41:52.948] if (FALSE) { [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] if (TRUE) { [18:41:52.948] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:52.948] open = "w") [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:52.948] windows = "NUL", "/dev/null"), open = "w") [18:41:52.948] } [18:41:52.948] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:52.948] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:52.948] base::sink(type = "output", split = FALSE) [18:41:52.948] base::close(...future.stdout) [18:41:52.948] }, add = TRUE) [18:41:52.948] } [18:41:52.948] ...future.frame <- base::sys.nframe() [18:41:52.948] ...future.conditions <- base::list() [18:41:52.948] ...future.rng <- base::globalenv()$.Random.seed [18:41:52.948] if (FALSE) { [18:41:52.948] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:52.948] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:52.948] } [18:41:52.948] ...future.result <- base::tryCatch({ [18:41:52.948] base::withCallingHandlers({ [18:41:52.948] ...future.value <- base::withVisible(base::local({ [18:41:52.948] ...future.makeSendCondition <- base::local({ [18:41:52.948] sendCondition <- NULL [18:41:52.948] function(frame = 1L) { [18:41:52.948] if (is.function(sendCondition)) [18:41:52.948] return(sendCondition) [18:41:52.948] ns <- getNamespace("parallel") [18:41:52.948] if (exists("sendData", mode = "function", [18:41:52.948] envir = ns)) { [18:41:52.948] parallel_sendData <- get("sendData", mode = "function", [18:41:52.948] envir = ns) [18:41:52.948] envir <- sys.frame(frame) [18:41:52.948] master <- NULL [18:41:52.948] while (!identical(envir, .GlobalEnv) && [18:41:52.948] !identical(envir, emptyenv())) { [18:41:52.948] if (exists("master", mode = "list", envir = envir, [18:41:52.948] inherits = FALSE)) { [18:41:52.948] master <- get("master", mode = "list", [18:41:52.948] envir = envir, inherits = FALSE) [18:41:52.948] if (inherits(master, c("SOCKnode", [18:41:52.948] "SOCK0node"))) { [18:41:52.948] sendCondition <<- function(cond) { [18:41:52.948] data <- list(type = "VALUE", value = cond, [18:41:52.948] success = TRUE) [18:41:52.948] parallel_sendData(master, data) [18:41:52.948] } [18:41:52.948] return(sendCondition) [18:41:52.948] } [18:41:52.948] } [18:41:52.948] frame <- frame + 1L [18:41:52.948] envir <- sys.frame(frame) [18:41:52.948] } [18:41:52.948] } [18:41:52.948] sendCondition <<- function(cond) NULL [18:41:52.948] } [18:41:52.948] }) [18:41:52.948] withCallingHandlers({ [18:41:52.948] { [18:41:52.948] do.call(function(...) { [18:41:52.948] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.948] if (!identical(...future.globals.maxSize.org, [18:41:52.948] ...future.globals.maxSize)) { [18:41:52.948] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.948] on.exit(options(oopts), add = TRUE) [18:41:52.948] } [18:41:52.948] { [18:41:52.948] lapply(seq_along(...future.elements_ii), [18:41:52.948] FUN = function(jj) { [18:41:52.948] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.948] ...future.FUN(...future.X_jj, ...) [18:41:52.948] }) [18:41:52.948] } [18:41:52.948] }, args = future.call.arguments) [18:41:52.948] } [18:41:52.948] }, immediateCondition = function(cond) { [18:41:52.948] sendCondition <- ...future.makeSendCondition() [18:41:52.948] sendCondition(cond) [18:41:52.948] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.948] { [18:41:52.948] inherits <- base::inherits [18:41:52.948] invokeRestart <- base::invokeRestart [18:41:52.948] is.null <- base::is.null [18:41:52.948] muffled <- FALSE [18:41:52.948] if (inherits(cond, "message")) { [18:41:52.948] muffled <- grepl(pattern, "muffleMessage") [18:41:52.948] if (muffled) [18:41:52.948] invokeRestart("muffleMessage") [18:41:52.948] } [18:41:52.948] else if (inherits(cond, "warning")) { [18:41:52.948] muffled <- grepl(pattern, "muffleWarning") [18:41:52.948] if (muffled) [18:41:52.948] invokeRestart("muffleWarning") [18:41:52.948] } [18:41:52.948] else if (inherits(cond, "condition")) { [18:41:52.948] if (!is.null(pattern)) { [18:41:52.948] computeRestarts <- base::computeRestarts [18:41:52.948] grepl <- base::grepl [18:41:52.948] restarts <- computeRestarts(cond) [18:41:52.948] for (restart in restarts) { [18:41:52.948] name <- restart$name [18:41:52.948] if (is.null(name)) [18:41:52.948] next [18:41:52.948] if (!grepl(pattern, name)) [18:41:52.948] next [18:41:52.948] invokeRestart(restart) [18:41:52.948] muffled <- TRUE [18:41:52.948] break [18:41:52.948] } [18:41:52.948] } [18:41:52.948] } [18:41:52.948] invisible(muffled) [18:41:52.948] } [18:41:52.948] muffleCondition(cond) [18:41:52.948] }) [18:41:52.948] })) [18:41:52.948] future::FutureResult(value = ...future.value$value, [18:41:52.948] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.948] ...future.rng), globalenv = if (FALSE) [18:41:52.948] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:52.948] ...future.globalenv.names)) [18:41:52.948] else NULL, started = ...future.startTime, version = "1.8") [18:41:52.948] }, condition = base::local({ [18:41:52.948] c <- base::c [18:41:52.948] inherits <- base::inherits [18:41:52.948] invokeRestart <- base::invokeRestart [18:41:52.948] length <- base::length [18:41:52.948] list <- base::list [18:41:52.948] seq.int <- base::seq.int [18:41:52.948] signalCondition <- base::signalCondition [18:41:52.948] sys.calls <- base::sys.calls [18:41:52.948] `[[` <- base::`[[` [18:41:52.948] `+` <- base::`+` [18:41:52.948] `<<-` <- base::`<<-` [18:41:52.948] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:52.948] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:52.948] 3L)] [18:41:52.948] } [18:41:52.948] function(cond) { [18:41:52.948] is_error <- inherits(cond, "error") [18:41:52.948] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:52.948] NULL) [18:41:52.948] if (is_error) { [18:41:52.948] sessionInformation <- function() { [18:41:52.948] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:52.948] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:52.948] search = base::search(), system = base::Sys.info()) [18:41:52.948] } [18:41:52.948] ...future.conditions[[length(...future.conditions) + [18:41:52.948] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:52.948] cond$call), session = sessionInformation(), [18:41:52.948] timestamp = base::Sys.time(), signaled = 0L) [18:41:52.948] signalCondition(cond) [18:41:52.948] } [18:41:52.948] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:52.948] "immediateCondition"))) { [18:41:52.948] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:52.948] ...future.conditions[[length(...future.conditions) + [18:41:52.948] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:52.948] if (TRUE && !signal) { [18:41:52.948] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.948] { [18:41:52.948] inherits <- base::inherits [18:41:52.948] invokeRestart <- base::invokeRestart [18:41:52.948] is.null <- base::is.null [18:41:52.948] muffled <- FALSE [18:41:52.948] if (inherits(cond, "message")) { [18:41:52.948] muffled <- grepl(pattern, "muffleMessage") [18:41:52.948] if (muffled) [18:41:52.948] invokeRestart("muffleMessage") [18:41:52.948] } [18:41:52.948] else if (inherits(cond, "warning")) { [18:41:52.948] muffled <- grepl(pattern, "muffleWarning") [18:41:52.948] if (muffled) [18:41:52.948] invokeRestart("muffleWarning") [18:41:52.948] } [18:41:52.948] else if (inherits(cond, "condition")) { [18:41:52.948] if (!is.null(pattern)) { [18:41:52.948] computeRestarts <- base::computeRestarts [18:41:52.948] grepl <- base::grepl [18:41:52.948] restarts <- computeRestarts(cond) [18:41:52.948] for (restart in restarts) { [18:41:52.948] name <- restart$name [18:41:52.948] if (is.null(name)) [18:41:52.948] next [18:41:52.948] if (!grepl(pattern, name)) [18:41:52.948] next [18:41:52.948] invokeRestart(restart) [18:41:52.948] muffled <- TRUE [18:41:52.948] break [18:41:52.948] } [18:41:52.948] } [18:41:52.948] } [18:41:52.948] invisible(muffled) [18:41:52.948] } [18:41:52.948] muffleCondition(cond, pattern = "^muffle") [18:41:52.948] } [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] if (TRUE) { [18:41:52.948] muffleCondition <- function (cond, pattern = "^muffle") [18:41:52.948] { [18:41:52.948] inherits <- base::inherits [18:41:52.948] invokeRestart <- base::invokeRestart [18:41:52.948] is.null <- base::is.null [18:41:52.948] muffled <- FALSE [18:41:52.948] if (inherits(cond, "message")) { [18:41:52.948] muffled <- grepl(pattern, "muffleMessage") [18:41:52.948] if (muffled) [18:41:52.948] invokeRestart("muffleMessage") [18:41:52.948] } [18:41:52.948] else if (inherits(cond, "warning")) { [18:41:52.948] muffled <- grepl(pattern, "muffleWarning") [18:41:52.948] if (muffled) [18:41:52.948] invokeRestart("muffleWarning") [18:41:52.948] } [18:41:52.948] else if (inherits(cond, "condition")) { [18:41:52.948] if (!is.null(pattern)) { [18:41:52.948] computeRestarts <- base::computeRestarts [18:41:52.948] grepl <- base::grepl [18:41:52.948] restarts <- computeRestarts(cond) [18:41:52.948] for (restart in restarts) { [18:41:52.948] name <- restart$name [18:41:52.948] if (is.null(name)) [18:41:52.948] next [18:41:52.948] if (!grepl(pattern, name)) [18:41:52.948] next [18:41:52.948] invokeRestart(restart) [18:41:52.948] muffled <- TRUE [18:41:52.948] break [18:41:52.948] } [18:41:52.948] } [18:41:52.948] } [18:41:52.948] invisible(muffled) [18:41:52.948] } [18:41:52.948] muffleCondition(cond, pattern = "^muffle") [18:41:52.948] } [18:41:52.948] } [18:41:52.948] } [18:41:52.948] })) [18:41:52.948] }, error = function(ex) { [18:41:52.948] base::structure(base::list(value = NULL, visible = NULL, [18:41:52.948] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:52.948] ...future.rng), started = ...future.startTime, [18:41:52.948] finished = Sys.time(), session_uuid = NA_character_, [18:41:52.948] version = "1.8"), class = "FutureResult") [18:41:52.948] }, finally = { [18:41:52.948] if (!identical(...future.workdir, getwd())) [18:41:52.948] setwd(...future.workdir) [18:41:52.948] { [18:41:52.948] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:52.948] ...future.oldOptions$nwarnings <- NULL [18:41:52.948] } [18:41:52.948] base::options(...future.oldOptions) [18:41:52.948] if (.Platform$OS.type == "windows") { [18:41:52.948] old_names <- names(...future.oldEnvVars) [18:41:52.948] envs <- base::Sys.getenv() [18:41:52.948] names <- names(envs) [18:41:52.948] common <- intersect(names, old_names) [18:41:52.948] added <- setdiff(names, old_names) [18:41:52.948] removed <- setdiff(old_names, names) [18:41:52.948] changed <- common[...future.oldEnvVars[common] != [18:41:52.948] envs[common]] [18:41:52.948] NAMES <- toupper(changed) [18:41:52.948] args <- list() [18:41:52.948] for (kk in seq_along(NAMES)) { [18:41:52.948] name <- changed[[kk]] [18:41:52.948] NAME <- NAMES[[kk]] [18:41:52.948] if (name != NAME && is.element(NAME, old_names)) [18:41:52.948] next [18:41:52.948] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.948] } [18:41:52.948] NAMES <- toupper(added) [18:41:52.948] for (kk in seq_along(NAMES)) { [18:41:52.948] name <- added[[kk]] [18:41:52.948] NAME <- NAMES[[kk]] [18:41:52.948] if (name != NAME && is.element(NAME, old_names)) [18:41:52.948] next [18:41:52.948] args[[name]] <- "" [18:41:52.948] } [18:41:52.948] NAMES <- toupper(removed) [18:41:52.948] for (kk in seq_along(NAMES)) { [18:41:52.948] name <- removed[[kk]] [18:41:52.948] NAME <- NAMES[[kk]] [18:41:52.948] if (name != NAME && is.element(NAME, old_names)) [18:41:52.948] next [18:41:52.948] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:52.948] } [18:41:52.948] if (length(args) > 0) [18:41:52.948] base::do.call(base::Sys.setenv, args = args) [18:41:52.948] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:52.948] } [18:41:52.948] { [18:41:52.948] if (base::length(...future.futureOptionsAdded) > [18:41:52.948] 0L) { [18:41:52.948] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:52.948] base::names(opts) <- ...future.futureOptionsAdded [18:41:52.948] base::options(opts) [18:41:52.948] } [18:41:52.948] { [18:41:52.948] { [18:41:52.948] base::options(mc.cores = ...future.mc.cores.old) [18:41:52.948] NULL [18:41:52.948] } [18:41:52.948] options(future.plan = NULL) [18:41:52.948] if (is.na(NA_character_)) [18:41:52.948] Sys.unsetenv("R_FUTURE_PLAN") [18:41:52.948] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:52.948] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:52.948] .init = FALSE) [18:41:52.948] } [18:41:52.948] } [18:41:52.948] } [18:41:52.948] }) [18:41:52.948] if (TRUE) { [18:41:52.948] base::sink(type = "output", split = FALSE) [18:41:52.948] if (TRUE) { [18:41:52.948] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:52.948] } [18:41:52.948] else { [18:41:52.948] ...future.result["stdout"] <- base::list(NULL) [18:41:52.948] } [18:41:52.948] base::close(...future.stdout) [18:41:52.948] ...future.stdout <- NULL [18:41:52.948] } [18:41:52.948] ...future.result$conditions <- ...future.conditions [18:41:52.948] ...future.result$finished <- base::Sys.time() [18:41:52.948] ...future.result [18:41:52.948] } [18:41:52.957] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... [18:41:52.957] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:52.957] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:52.958] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:52.958] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:52.958] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... [18:41:52.959] Exporting '...future.elements_ii' (130 bytes) to cluster node #1 ... DONE [18:41:52.959] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:52.959] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:52.960] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:52.960] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:52.960] Exporting 5 global objects (1.48 KiB) to cluster node #1 ... DONE [18:41:52.961] MultisessionFuture started [18:41:52.961] - Launch lazy future ... done [18:41:52.961] run() for 'MultisessionFuture' ... done [18:41:52.961] Created future: [18:41:52.975] receiveMessageFromWorker() for ClusterFuture ... [18:41:52.975] - Validating connection of MultisessionFuture [18:41:52.976] - received message: FutureResult [18:41:52.976] - Received FutureResult [18:41:52.976] - Erased future from FutureRegistry [18:41:52.976] result() for ClusterFuture ... [18:41:52.976] - result already collected: FutureResult [18:41:52.977] result() for ClusterFuture ... done [18:41:52.977] receiveMessageFromWorker() for ClusterFuture ... done [18:41:52.962] MultisessionFuture: [18:41:52.962] Label: 'future_sapply-2' [18:41:52.962] Expression: [18:41:52.962] { [18:41:52.962] do.call(function(...) { [18:41:52.962] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:52.962] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:52.962] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:52.962] on.exit(options(oopts), add = TRUE) [18:41:52.962] } [18:41:52.962] { [18:41:52.962] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:52.962] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:52.962] ...future.FUN(...future.X_jj, ...) [18:41:52.962] }) [18:41:52.962] } [18:41:52.962] }, args = future.call.arguments) [18:41:52.962] } [18:41:52.962] Lazy evaluation: FALSE [18:41:52.962] Asynchronous evaluation: TRUE [18:41:52.962] Local evaluation: TRUE [18:41:52.962] Environment: R_GlobalEnv [18:41:52.962] Capture standard output: TRUE [18:41:52.962] Capture condition classes: 'condition' (excluding 'nothing') [18:41:52.962] Globals: 5 objects totaling 1.04 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 130 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:52.962] Packages: [18:41:52.962] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:52.962] Resolved: TRUE [18:41:52.962] Value: [18:41:52.962] Conditions captured: [18:41:52.962] Early signaling: FALSE [18:41:52.962] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:52.962] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:52.977] Chunk #2 of 2 ... DONE [18:41:52.977] Launching 2 futures (chunks) ... DONE [18:41:52.978] Resolving 2 futures (chunks) ... [18:41:52.978] resolve() on list ... [18:41:52.978] recursive: 0 [18:41:52.978] length: 2 [18:41:52.978] [18:41:52.978] Future #1 [18:41:52.979] result() for ClusterFuture ... [18:41:52.979] - result already collected: FutureResult [18:41:52.979] result() for ClusterFuture ... done [18:41:52.979] result() for ClusterFuture ... [18:41:52.979] - result already collected: FutureResult [18:41:52.979] result() for ClusterFuture ... done [18:41:52.979] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:52.980] - nx: 2 [18:41:52.980] - relay: TRUE [18:41:52.980] - stdout: TRUE [18:41:52.980] - signal: TRUE [18:41:52.980] - resignal: FALSE [18:41:52.980] - force: TRUE [18:41:52.980] - relayed: [n=2] FALSE, FALSE [18:41:52.981] - queued futures: [n=2] FALSE, FALSE [18:41:52.981] - until=1 [18:41:52.981] - relaying element #1 [18:41:52.981] result() for ClusterFuture ... [18:41:52.981] - result already collected: FutureResult [18:41:52.981] result() for ClusterFuture ... done [18:41:52.982] result() for ClusterFuture ... [18:41:52.982] - result already collected: FutureResult [18:41:52.982] result() for ClusterFuture ... done [18:41:52.982] result() for ClusterFuture ... [18:41:52.982] - result already collected: FutureResult [18:41:52.982] result() for ClusterFuture ... done [18:41:52.983] result() for ClusterFuture ... [18:41:52.983] - result already collected: FutureResult [18:41:52.983] result() for ClusterFuture ... done [18:41:52.983] - relayed: [n=2] TRUE, FALSE [18:41:52.983] - queued futures: [n=2] TRUE, FALSE [18:41:52.983] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:52.984] length: 1 (resolved future 1) [18:41:52.984] Future #2 [18:41:52.984] result() for ClusterFuture ... [18:41:52.984] - result already collected: FutureResult [18:41:52.984] result() for ClusterFuture ... done [18:41:52.984] result() for ClusterFuture ... [18:41:52.985] - result already collected: FutureResult [18:41:52.985] result() for ClusterFuture ... done [18:41:52.985] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:52.985] - nx: 2 [18:41:52.985] - relay: TRUE [18:41:52.985] - stdout: TRUE [18:41:52.985] - signal: TRUE [18:41:52.986] - resignal: FALSE [18:41:52.986] - force: TRUE [18:41:52.986] - relayed: [n=2] TRUE, FALSE [18:41:52.986] - queued futures: [n=2] TRUE, FALSE [18:41:52.986] - until=2 [18:41:52.986] - relaying element #2 [18:41:52.986] result() for ClusterFuture ... [18:41:52.987] - result already collected: FutureResult [18:41:52.987] result() for ClusterFuture ... done [18:41:52.987] result() for ClusterFuture ... [18:41:52.987] - result already collected: FutureResult [18:41:52.987] result() for ClusterFuture ... done [18:41:52.987] result() for ClusterFuture ... [18:41:52.988] - result already collected: FutureResult [18:41:52.988] result() for ClusterFuture ... done [18:41:52.988] result() for ClusterFuture ... [18:41:52.988] - result already collected: FutureResult [18:41:52.988] result() for ClusterFuture ... done [18:41:52.988] - relayed: [n=2] TRUE, TRUE [18:41:52.989] - queued futures: [n=2] TRUE, TRUE [18:41:52.989] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:52.989] length: 0 (resolved future 2) [18:41:52.989] Relaying remaining futures [18:41:52.989] signalConditionsASAP(NULL, pos=0) ... [18:41:52.989] - nx: 2 [18:41:52.990] - relay: TRUE [18:41:52.990] - stdout: TRUE [18:41:52.990] - signal: TRUE [18:41:52.990] - resignal: FALSE [18:41:52.990] - force: TRUE [18:41:52.990] - relayed: [n=2] TRUE, TRUE [18:41:52.991] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:52.991] - relayed: [n=2] TRUE, TRUE [18:41:52.991] - queued futures: [n=2] TRUE, TRUE [18:41:52.991] signalConditionsASAP(NULL, pos=0) ... done [18:41:52.991] resolve() on list ... DONE [18:41:52.991] result() for ClusterFuture ... [18:41:52.992] - result already collected: FutureResult [18:41:52.992] result() for ClusterFuture ... done [18:41:52.992] result() for ClusterFuture ... [18:41:52.992] - result already collected: FutureResult [18:41:52.992] result() for ClusterFuture ... done [18:41:52.992] result() for ClusterFuture ... [18:41:52.992] - result already collected: FutureResult [18:41:52.993] result() for ClusterFuture ... done [18:41:52.993] result() for ClusterFuture ... [18:41:52.993] - result already collected: FutureResult [18:41:52.993] result() for ClusterFuture ... done [18:41:52.993] - Number of value chunks collected: 2 [18:41:52.993] Resolving 2 futures (chunks) ... DONE [18:41:52.994] Reducing values from 2 chunks ... [18:41:52.994] - Number of values collected after concatenation: 6 [18:41:52.994] - Number of values expected: 6 [18:41:52.994] Reducing values from 2 chunks ... DONE [18:41:52.994] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... $ y1: num [1:3, 1:5, 1:6] 2 2 2 4 4 4 6 6 6 8 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:6] "a1" "a2" "b1" "b2" ... [18:41:52.998] future_lapply() ... [18:41:53.001] Number of chunks: 2 [18:41:53.001] getGlobalsAndPackagesXApply() ... [18:41:53.001] - future.globals: TRUE [18:41:53.001] getGlobalsAndPackages() ... [18:41:53.002] Searching for globals... [18:41:53.003] - globals found: [1] 'FUN' [18:41:53.003] Searching for globals ... DONE [18:41:53.003] Resolving globals: FALSE [18:41:53.004] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:53.004] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:53.004] - globals: [1] 'FUN' [18:41:53.004] [18:41:53.005] getGlobalsAndPackages() ... DONE [18:41:53.005] - globals found/used: [n=1] 'FUN' [18:41:53.005] - needed namespaces: [n=0] [18:41:53.005] Finding globals ... DONE [18:41:53.005] - use_args: TRUE [18:41:53.005] - Getting '...' globals ... [18:41:53.006] resolve() on list ... [18:41:53.006] recursive: 0 [18:41:53.006] length: 1 [18:41:53.006] elements: '...' [18:41:53.007] length: 0 (resolved future 1) [18:41:53.007] resolve() on list ... DONE [18:41:53.007] - '...' content: [n=0] [18:41:53.007] List of 1 [18:41:53.007] $ ...: list() [18:41:53.007] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.007] - attr(*, "where")=List of 1 [18:41:53.007] ..$ ...: [18:41:53.007] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.007] - attr(*, "resolved")= logi TRUE [18:41:53.007] - attr(*, "total_size")= num NA [18:41:53.010] - Getting '...' globals ... DONE [18:41:53.010] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.010] List of 2 [18:41:53.010] $ ...future.FUN:function (x) [18:41:53.010] $ ... : list() [18:41:53.010] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.010] - attr(*, "where")=List of 2 [18:41:53.010] ..$ ...future.FUN: [18:41:53.010] ..$ ... : [18:41:53.010] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.010] - attr(*, "resolved")= logi FALSE [18:41:53.010] - attr(*, "total_size")= int 4788 [18:41:53.014] Packages to be attached in all futures: [n=0] [18:41:53.014] getGlobalsAndPackagesXApply() ... DONE [18:41:53.014] Number of futures (= number of chunks): 2 [18:41:53.014] Launching 2 futures (chunks) ... [18:41:53.014] Chunk #1 of 2 ... [18:41:53.015] - Finding globals in 'X' for chunk #1 ... [18:41:53.015] getGlobalsAndPackages() ... [18:41:53.015] Searching for globals... [18:41:53.015] [18:41:53.015] Searching for globals ... DONE [18:41:53.016] - globals: [0] [18:41:53.016] getGlobalsAndPackages() ... DONE [18:41:53.016] + additional globals found: [n=0] [18:41:53.016] + additional namespaces needed: [n=0] [18:41:53.016] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.016] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.017] - seeds: [18:41:53.017] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.017] getGlobalsAndPackages() ... [18:41:53.017] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.017] Resolving globals: FALSE [18:41:53.017] Tweak future expression to call with '...' arguments ... [18:41:53.018] { [18:41:53.018] do.call(function(...) { [18:41:53.018] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.018] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.018] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.018] on.exit(options(oopts), add = TRUE) [18:41:53.018] } [18:41:53.018] { [18:41:53.018] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.018] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.018] ...future.FUN(...future.X_jj, ...) [18:41:53.018] }) [18:41:53.018] } [18:41:53.018] }, args = future.call.arguments) [18:41:53.018] } [18:41:53.018] Tweak future expression to call with '...' arguments ... DONE [18:41:53.019] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.019] [18:41:53.019] getGlobalsAndPackages() ... DONE [18:41:53.019] run() for 'Future' ... [18:41:53.019] - state: 'created' [18:41:53.020] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.035] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.035] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.035] - Field: 'node' [18:41:53.035] - Field: 'label' [18:41:53.036] - Field: 'local' [18:41:53.036] - Field: 'owner' [18:41:53.036] - Field: 'envir' [18:41:53.036] - Field: 'workers' [18:41:53.036] - Field: 'packages' [18:41:53.037] - Field: 'gc' [18:41:53.037] - Field: 'conditions' [18:41:53.037] - Field: 'persistent' [18:41:53.037] - Field: 'expr' [18:41:53.037] - Field: 'uuid' [18:41:53.037] - Field: 'seed' [18:41:53.038] - Field: 'version' [18:41:53.038] - Field: 'result' [18:41:53.038] - Field: 'asynchronous' [18:41:53.038] - Field: 'calls' [18:41:53.038] - Field: 'globals' [18:41:53.038] - Field: 'stdout' [18:41:53.039] - Field: 'earlySignal' [18:41:53.039] - Field: 'lazy' [18:41:53.039] - Field: 'state' [18:41:53.039] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.039] - Launch lazy future ... [18:41:53.040] Packages needed by the future expression (n = 0): [18:41:53.040] Packages needed by future strategies (n = 0): [18:41:53.040] { [18:41:53.040] { [18:41:53.040] { [18:41:53.040] ...future.startTime <- base::Sys.time() [18:41:53.040] { [18:41:53.040] { [18:41:53.040] { [18:41:53.040] { [18:41:53.040] base::local({ [18:41:53.040] has_future <- base::requireNamespace("future", [18:41:53.040] quietly = TRUE) [18:41:53.040] if (has_future) { [18:41:53.040] ns <- base::getNamespace("future") [18:41:53.040] version <- ns[[".package"]][["version"]] [18:41:53.040] if (is.null(version)) [18:41:53.040] version <- utils::packageVersion("future") [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] version <- NULL [18:41:53.040] } [18:41:53.040] if (!has_future || version < "1.8.0") { [18:41:53.040] info <- base::c(r_version = base::gsub("R version ", [18:41:53.040] "", base::R.version$version.string), [18:41:53.040] platform = base::sprintf("%s (%s-bit)", [18:41:53.040] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.040] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.040] "release", "version")], collapse = " "), [18:41:53.040] hostname = base::Sys.info()[["nodename"]]) [18:41:53.040] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.040] info) [18:41:53.040] info <- base::paste(info, collapse = "; ") [18:41:53.040] if (!has_future) { [18:41:53.040] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.040] info) [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.040] info, version) [18:41:53.040] } [18:41:53.040] base::stop(msg) [18:41:53.040] } [18:41:53.040] }) [18:41:53.040] } [18:41:53.040] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.040] base::options(mc.cores = 1L) [18:41:53.040] } [18:41:53.040] ...future.strategy.old <- future::plan("list") [18:41:53.040] options(future.plan = NULL) [18:41:53.040] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.040] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.040] } [18:41:53.040] ...future.workdir <- getwd() [18:41:53.040] } [18:41:53.040] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.040] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.040] } [18:41:53.040] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.040] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.040] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.040] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.040] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.040] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.040] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.040] base::names(...future.oldOptions)) [18:41:53.040] } [18:41:53.040] if (FALSE) { [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] if (TRUE) { [18:41:53.040] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.040] open = "w") [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.040] windows = "NUL", "/dev/null"), open = "w") [18:41:53.040] } [18:41:53.040] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.040] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.040] base::sink(type = "output", split = FALSE) [18:41:53.040] base::close(...future.stdout) [18:41:53.040] }, add = TRUE) [18:41:53.040] } [18:41:53.040] ...future.frame <- base::sys.nframe() [18:41:53.040] ...future.conditions <- base::list() [18:41:53.040] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.040] if (FALSE) { [18:41:53.040] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.040] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.040] } [18:41:53.040] ...future.result <- base::tryCatch({ [18:41:53.040] base::withCallingHandlers({ [18:41:53.040] ...future.value <- base::withVisible(base::local({ [18:41:53.040] ...future.makeSendCondition <- base::local({ [18:41:53.040] sendCondition <- NULL [18:41:53.040] function(frame = 1L) { [18:41:53.040] if (is.function(sendCondition)) [18:41:53.040] return(sendCondition) [18:41:53.040] ns <- getNamespace("parallel") [18:41:53.040] if (exists("sendData", mode = "function", [18:41:53.040] envir = ns)) { [18:41:53.040] parallel_sendData <- get("sendData", mode = "function", [18:41:53.040] envir = ns) [18:41:53.040] envir <- sys.frame(frame) [18:41:53.040] master <- NULL [18:41:53.040] while (!identical(envir, .GlobalEnv) && [18:41:53.040] !identical(envir, emptyenv())) { [18:41:53.040] if (exists("master", mode = "list", envir = envir, [18:41:53.040] inherits = FALSE)) { [18:41:53.040] master <- get("master", mode = "list", [18:41:53.040] envir = envir, inherits = FALSE) [18:41:53.040] if (inherits(master, c("SOCKnode", [18:41:53.040] "SOCK0node"))) { [18:41:53.040] sendCondition <<- function(cond) { [18:41:53.040] data <- list(type = "VALUE", value = cond, [18:41:53.040] success = TRUE) [18:41:53.040] parallel_sendData(master, data) [18:41:53.040] } [18:41:53.040] return(sendCondition) [18:41:53.040] } [18:41:53.040] } [18:41:53.040] frame <- frame + 1L [18:41:53.040] envir <- sys.frame(frame) [18:41:53.040] } [18:41:53.040] } [18:41:53.040] sendCondition <<- function(cond) NULL [18:41:53.040] } [18:41:53.040] }) [18:41:53.040] withCallingHandlers({ [18:41:53.040] { [18:41:53.040] do.call(function(...) { [18:41:53.040] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.040] if (!identical(...future.globals.maxSize.org, [18:41:53.040] ...future.globals.maxSize)) { [18:41:53.040] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.040] on.exit(options(oopts), add = TRUE) [18:41:53.040] } [18:41:53.040] { [18:41:53.040] lapply(seq_along(...future.elements_ii), [18:41:53.040] FUN = function(jj) { [18:41:53.040] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.040] ...future.FUN(...future.X_jj, ...) [18:41:53.040] }) [18:41:53.040] } [18:41:53.040] }, args = future.call.arguments) [18:41:53.040] } [18:41:53.040] }, immediateCondition = function(cond) { [18:41:53.040] sendCondition <- ...future.makeSendCondition() [18:41:53.040] sendCondition(cond) [18:41:53.040] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.040] { [18:41:53.040] inherits <- base::inherits [18:41:53.040] invokeRestart <- base::invokeRestart [18:41:53.040] is.null <- base::is.null [18:41:53.040] muffled <- FALSE [18:41:53.040] if (inherits(cond, "message")) { [18:41:53.040] muffled <- grepl(pattern, "muffleMessage") [18:41:53.040] if (muffled) [18:41:53.040] invokeRestart("muffleMessage") [18:41:53.040] } [18:41:53.040] else if (inherits(cond, "warning")) { [18:41:53.040] muffled <- grepl(pattern, "muffleWarning") [18:41:53.040] if (muffled) [18:41:53.040] invokeRestart("muffleWarning") [18:41:53.040] } [18:41:53.040] else if (inherits(cond, "condition")) { [18:41:53.040] if (!is.null(pattern)) { [18:41:53.040] computeRestarts <- base::computeRestarts [18:41:53.040] grepl <- base::grepl [18:41:53.040] restarts <- computeRestarts(cond) [18:41:53.040] for (restart in restarts) { [18:41:53.040] name <- restart$name [18:41:53.040] if (is.null(name)) [18:41:53.040] next [18:41:53.040] if (!grepl(pattern, name)) [18:41:53.040] next [18:41:53.040] invokeRestart(restart) [18:41:53.040] muffled <- TRUE [18:41:53.040] break [18:41:53.040] } [18:41:53.040] } [18:41:53.040] } [18:41:53.040] invisible(muffled) [18:41:53.040] } [18:41:53.040] muffleCondition(cond) [18:41:53.040] }) [18:41:53.040] })) [18:41:53.040] future::FutureResult(value = ...future.value$value, [18:41:53.040] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.040] ...future.rng), globalenv = if (FALSE) [18:41:53.040] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.040] ...future.globalenv.names)) [18:41:53.040] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.040] }, condition = base::local({ [18:41:53.040] c <- base::c [18:41:53.040] inherits <- base::inherits [18:41:53.040] invokeRestart <- base::invokeRestart [18:41:53.040] length <- base::length [18:41:53.040] list <- base::list [18:41:53.040] seq.int <- base::seq.int [18:41:53.040] signalCondition <- base::signalCondition [18:41:53.040] sys.calls <- base::sys.calls [18:41:53.040] `[[` <- base::`[[` [18:41:53.040] `+` <- base::`+` [18:41:53.040] `<<-` <- base::`<<-` [18:41:53.040] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.040] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.040] 3L)] [18:41:53.040] } [18:41:53.040] function(cond) { [18:41:53.040] is_error <- inherits(cond, "error") [18:41:53.040] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.040] NULL) [18:41:53.040] if (is_error) { [18:41:53.040] sessionInformation <- function() { [18:41:53.040] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.040] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.040] search = base::search(), system = base::Sys.info()) [18:41:53.040] } [18:41:53.040] ...future.conditions[[length(...future.conditions) + [18:41:53.040] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.040] cond$call), session = sessionInformation(), [18:41:53.040] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.040] signalCondition(cond) [18:41:53.040] } [18:41:53.040] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.040] "immediateCondition"))) { [18:41:53.040] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.040] ...future.conditions[[length(...future.conditions) + [18:41:53.040] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.040] if (TRUE && !signal) { [18:41:53.040] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.040] { [18:41:53.040] inherits <- base::inherits [18:41:53.040] invokeRestart <- base::invokeRestart [18:41:53.040] is.null <- base::is.null [18:41:53.040] muffled <- FALSE [18:41:53.040] if (inherits(cond, "message")) { [18:41:53.040] muffled <- grepl(pattern, "muffleMessage") [18:41:53.040] if (muffled) [18:41:53.040] invokeRestart("muffleMessage") [18:41:53.040] } [18:41:53.040] else if (inherits(cond, "warning")) { [18:41:53.040] muffled <- grepl(pattern, "muffleWarning") [18:41:53.040] if (muffled) [18:41:53.040] invokeRestart("muffleWarning") [18:41:53.040] } [18:41:53.040] else if (inherits(cond, "condition")) { [18:41:53.040] if (!is.null(pattern)) { [18:41:53.040] computeRestarts <- base::computeRestarts [18:41:53.040] grepl <- base::grepl [18:41:53.040] restarts <- computeRestarts(cond) [18:41:53.040] for (restart in restarts) { [18:41:53.040] name <- restart$name [18:41:53.040] if (is.null(name)) [18:41:53.040] next [18:41:53.040] if (!grepl(pattern, name)) [18:41:53.040] next [18:41:53.040] invokeRestart(restart) [18:41:53.040] muffled <- TRUE [18:41:53.040] break [18:41:53.040] } [18:41:53.040] } [18:41:53.040] } [18:41:53.040] invisible(muffled) [18:41:53.040] } [18:41:53.040] muffleCondition(cond, pattern = "^muffle") [18:41:53.040] } [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] if (TRUE) { [18:41:53.040] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.040] { [18:41:53.040] inherits <- base::inherits [18:41:53.040] invokeRestart <- base::invokeRestart [18:41:53.040] is.null <- base::is.null [18:41:53.040] muffled <- FALSE [18:41:53.040] if (inherits(cond, "message")) { [18:41:53.040] muffled <- grepl(pattern, "muffleMessage") [18:41:53.040] if (muffled) [18:41:53.040] invokeRestart("muffleMessage") [18:41:53.040] } [18:41:53.040] else if (inherits(cond, "warning")) { [18:41:53.040] muffled <- grepl(pattern, "muffleWarning") [18:41:53.040] if (muffled) [18:41:53.040] invokeRestart("muffleWarning") [18:41:53.040] } [18:41:53.040] else if (inherits(cond, "condition")) { [18:41:53.040] if (!is.null(pattern)) { [18:41:53.040] computeRestarts <- base::computeRestarts [18:41:53.040] grepl <- base::grepl [18:41:53.040] restarts <- computeRestarts(cond) [18:41:53.040] for (restart in restarts) { [18:41:53.040] name <- restart$name [18:41:53.040] if (is.null(name)) [18:41:53.040] next [18:41:53.040] if (!grepl(pattern, name)) [18:41:53.040] next [18:41:53.040] invokeRestart(restart) [18:41:53.040] muffled <- TRUE [18:41:53.040] break [18:41:53.040] } [18:41:53.040] } [18:41:53.040] } [18:41:53.040] invisible(muffled) [18:41:53.040] } [18:41:53.040] muffleCondition(cond, pattern = "^muffle") [18:41:53.040] } [18:41:53.040] } [18:41:53.040] } [18:41:53.040] })) [18:41:53.040] }, error = function(ex) { [18:41:53.040] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.040] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.040] ...future.rng), started = ...future.startTime, [18:41:53.040] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.040] version = "1.8"), class = "FutureResult") [18:41:53.040] }, finally = { [18:41:53.040] if (!identical(...future.workdir, getwd())) [18:41:53.040] setwd(...future.workdir) [18:41:53.040] { [18:41:53.040] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.040] ...future.oldOptions$nwarnings <- NULL [18:41:53.040] } [18:41:53.040] base::options(...future.oldOptions) [18:41:53.040] if (.Platform$OS.type == "windows") { [18:41:53.040] old_names <- names(...future.oldEnvVars) [18:41:53.040] envs <- base::Sys.getenv() [18:41:53.040] names <- names(envs) [18:41:53.040] common <- intersect(names, old_names) [18:41:53.040] added <- setdiff(names, old_names) [18:41:53.040] removed <- setdiff(old_names, names) [18:41:53.040] changed <- common[...future.oldEnvVars[common] != [18:41:53.040] envs[common]] [18:41:53.040] NAMES <- toupper(changed) [18:41:53.040] args <- list() [18:41:53.040] for (kk in seq_along(NAMES)) { [18:41:53.040] name <- changed[[kk]] [18:41:53.040] NAME <- NAMES[[kk]] [18:41:53.040] if (name != NAME && is.element(NAME, old_names)) [18:41:53.040] next [18:41:53.040] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.040] } [18:41:53.040] NAMES <- toupper(added) [18:41:53.040] for (kk in seq_along(NAMES)) { [18:41:53.040] name <- added[[kk]] [18:41:53.040] NAME <- NAMES[[kk]] [18:41:53.040] if (name != NAME && is.element(NAME, old_names)) [18:41:53.040] next [18:41:53.040] args[[name]] <- "" [18:41:53.040] } [18:41:53.040] NAMES <- toupper(removed) [18:41:53.040] for (kk in seq_along(NAMES)) { [18:41:53.040] name <- removed[[kk]] [18:41:53.040] NAME <- NAMES[[kk]] [18:41:53.040] if (name != NAME && is.element(NAME, old_names)) [18:41:53.040] next [18:41:53.040] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.040] } [18:41:53.040] if (length(args) > 0) [18:41:53.040] base::do.call(base::Sys.setenv, args = args) [18:41:53.040] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.040] } [18:41:53.040] { [18:41:53.040] if (base::length(...future.futureOptionsAdded) > [18:41:53.040] 0L) { [18:41:53.040] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.040] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.040] base::options(opts) [18:41:53.040] } [18:41:53.040] { [18:41:53.040] { [18:41:53.040] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.040] NULL [18:41:53.040] } [18:41:53.040] options(future.plan = NULL) [18:41:53.040] if (is.na(NA_character_)) [18:41:53.040] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.040] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.040] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.040] .init = FALSE) [18:41:53.040] } [18:41:53.040] } [18:41:53.040] } [18:41:53.040] }) [18:41:53.040] if (TRUE) { [18:41:53.040] base::sink(type = "output", split = FALSE) [18:41:53.040] if (TRUE) { [18:41:53.040] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.040] } [18:41:53.040] else { [18:41:53.040] ...future.result["stdout"] <- base::list(NULL) [18:41:53.040] } [18:41:53.040] base::close(...future.stdout) [18:41:53.040] ...future.stdout <- NULL [18:41:53.040] } [18:41:53.040] ...future.result$conditions <- ...future.conditions [18:41:53.040] ...future.result$finished <- base::Sys.time() [18:41:53.040] ...future.result [18:41:53.040] } [18:41:53.046] Exporting 5 global objects (847 bytes) to cluster node #1 ... [18:41:53.046] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.047] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.047] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.047] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.047] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.048] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.048] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.048] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.049] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.049] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.049] Exporting 5 global objects (847 bytes) to cluster node #1 ... DONE [18:41:53.050] MultisessionFuture started [18:41:53.050] - Launch lazy future ... done [18:41:53.050] run() for 'MultisessionFuture' ... done [18:41:53.050] Created future: [18:41:53.064] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.064] - Validating connection of MultisessionFuture [18:41:53.065] - received message: FutureResult [18:41:53.065] - Received FutureResult [18:41:53.065] - Erased future from FutureRegistry [18:41:53.065] result() for ClusterFuture ... [18:41:53.065] - result already collected: FutureResult [18:41:53.065] result() for ClusterFuture ... done [18:41:53.066] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.050] MultisessionFuture: [18:41:53.050] Label: 'future_sapply-1' [18:41:53.050] Expression: [18:41:53.050] { [18:41:53.050] do.call(function(...) { [18:41:53.050] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.050] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.050] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.050] on.exit(options(oopts), add = TRUE) [18:41:53.050] } [18:41:53.050] { [18:41:53.050] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.050] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.050] ...future.FUN(...future.X_jj, ...) [18:41:53.050] }) [18:41:53.050] } [18:41:53.050] }, args = future.call.arguments) [18:41:53.050] } [18:41:53.050] Lazy evaluation: FALSE [18:41:53.050] Asynchronous evaluation: TRUE [18:41:53.050] Local evaluation: TRUE [18:41:53.050] Environment: R_GlobalEnv [18:41:53.050] Capture standard output: TRUE [18:41:53.050] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.050] Globals: 5 objects totaling 384 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.050] Packages: [18:41:53.050] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.050] Resolved: TRUE [18:41:53.050] Value: [18:41:53.050] Conditions captured: [18:41:53.050] Early signaling: FALSE [18:41:53.050] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.050] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.066] Chunk #1 of 2 ... DONE [18:41:53.066] Chunk #2 of 2 ... [18:41:53.066] - Finding globals in 'X' for chunk #2 ... [18:41:53.067] getGlobalsAndPackages() ... [18:41:53.067] Searching for globals... [18:41:53.067] [18:41:53.067] Searching for globals ... DONE [18:41:53.067] - globals: [0] [18:41:53.068] getGlobalsAndPackages() ... DONE [18:41:53.068] + additional globals found: [n=0] [18:41:53.068] + additional namespaces needed: [n=0] [18:41:53.068] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.068] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.068] - seeds: [18:41:53.068] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.069] getGlobalsAndPackages() ... [18:41:53.069] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.069] Resolving globals: FALSE [18:41:53.069] Tweak future expression to call with '...' arguments ... [18:41:53.069] { [18:41:53.069] do.call(function(...) { [18:41:53.069] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.069] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.069] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.069] on.exit(options(oopts), add = TRUE) [18:41:53.069] } [18:41:53.069] { [18:41:53.069] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.069] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.069] ...future.FUN(...future.X_jj, ...) [18:41:53.069] }) [18:41:53.069] } [18:41:53.069] }, args = future.call.arguments) [18:41:53.069] } [18:41:53.070] Tweak future expression to call with '...' arguments ... DONE [18:41:53.070] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.071] [18:41:53.071] getGlobalsAndPackages() ... DONE [18:41:53.071] run() for 'Future' ... [18:41:53.071] - state: 'created' [18:41:53.071] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.086] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.087] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.087] - Field: 'node' [18:41:53.087] - Field: 'label' [18:41:53.087] - Field: 'local' [18:41:53.087] - Field: 'owner' [18:41:53.088] - Field: 'envir' [18:41:53.088] - Field: 'workers' [18:41:53.088] - Field: 'packages' [18:41:53.088] - Field: 'gc' [18:41:53.088] - Field: 'conditions' [18:41:53.089] - Field: 'persistent' [18:41:53.089] - Field: 'expr' [18:41:53.089] - Field: 'uuid' [18:41:53.089] - Field: 'seed' [18:41:53.089] - Field: 'version' [18:41:53.089] - Field: 'result' [18:41:53.090] - Field: 'asynchronous' [18:41:53.090] - Field: 'calls' [18:41:53.090] - Field: 'globals' [18:41:53.090] - Field: 'stdout' [18:41:53.090] - Field: 'earlySignal' [18:41:53.090] - Field: 'lazy' [18:41:53.091] - Field: 'state' [18:41:53.091] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.091] - Launch lazy future ... [18:41:53.091] Packages needed by the future expression (n = 0): [18:41:53.092] Packages needed by future strategies (n = 0): [18:41:53.092] { [18:41:53.092] { [18:41:53.092] { [18:41:53.092] ...future.startTime <- base::Sys.time() [18:41:53.092] { [18:41:53.092] { [18:41:53.092] { [18:41:53.092] { [18:41:53.092] base::local({ [18:41:53.092] has_future <- base::requireNamespace("future", [18:41:53.092] quietly = TRUE) [18:41:53.092] if (has_future) { [18:41:53.092] ns <- base::getNamespace("future") [18:41:53.092] version <- ns[[".package"]][["version"]] [18:41:53.092] if (is.null(version)) [18:41:53.092] version <- utils::packageVersion("future") [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] version <- NULL [18:41:53.092] } [18:41:53.092] if (!has_future || version < "1.8.0") { [18:41:53.092] info <- base::c(r_version = base::gsub("R version ", [18:41:53.092] "", base::R.version$version.string), [18:41:53.092] platform = base::sprintf("%s (%s-bit)", [18:41:53.092] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.092] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.092] "release", "version")], collapse = " "), [18:41:53.092] hostname = base::Sys.info()[["nodename"]]) [18:41:53.092] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.092] info) [18:41:53.092] info <- base::paste(info, collapse = "; ") [18:41:53.092] if (!has_future) { [18:41:53.092] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.092] info) [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.092] info, version) [18:41:53.092] } [18:41:53.092] base::stop(msg) [18:41:53.092] } [18:41:53.092] }) [18:41:53.092] } [18:41:53.092] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.092] base::options(mc.cores = 1L) [18:41:53.092] } [18:41:53.092] ...future.strategy.old <- future::plan("list") [18:41:53.092] options(future.plan = NULL) [18:41:53.092] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.092] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.092] } [18:41:53.092] ...future.workdir <- getwd() [18:41:53.092] } [18:41:53.092] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.092] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.092] } [18:41:53.092] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.092] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.092] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.092] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.092] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.092] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.092] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.092] base::names(...future.oldOptions)) [18:41:53.092] } [18:41:53.092] if (FALSE) { [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] if (TRUE) { [18:41:53.092] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.092] open = "w") [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.092] windows = "NUL", "/dev/null"), open = "w") [18:41:53.092] } [18:41:53.092] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.092] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.092] base::sink(type = "output", split = FALSE) [18:41:53.092] base::close(...future.stdout) [18:41:53.092] }, add = TRUE) [18:41:53.092] } [18:41:53.092] ...future.frame <- base::sys.nframe() [18:41:53.092] ...future.conditions <- base::list() [18:41:53.092] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.092] if (FALSE) { [18:41:53.092] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.092] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.092] } [18:41:53.092] ...future.result <- base::tryCatch({ [18:41:53.092] base::withCallingHandlers({ [18:41:53.092] ...future.value <- base::withVisible(base::local({ [18:41:53.092] ...future.makeSendCondition <- base::local({ [18:41:53.092] sendCondition <- NULL [18:41:53.092] function(frame = 1L) { [18:41:53.092] if (is.function(sendCondition)) [18:41:53.092] return(sendCondition) [18:41:53.092] ns <- getNamespace("parallel") [18:41:53.092] if (exists("sendData", mode = "function", [18:41:53.092] envir = ns)) { [18:41:53.092] parallel_sendData <- get("sendData", mode = "function", [18:41:53.092] envir = ns) [18:41:53.092] envir <- sys.frame(frame) [18:41:53.092] master <- NULL [18:41:53.092] while (!identical(envir, .GlobalEnv) && [18:41:53.092] !identical(envir, emptyenv())) { [18:41:53.092] if (exists("master", mode = "list", envir = envir, [18:41:53.092] inherits = FALSE)) { [18:41:53.092] master <- get("master", mode = "list", [18:41:53.092] envir = envir, inherits = FALSE) [18:41:53.092] if (inherits(master, c("SOCKnode", [18:41:53.092] "SOCK0node"))) { [18:41:53.092] sendCondition <<- function(cond) { [18:41:53.092] data <- list(type = "VALUE", value = cond, [18:41:53.092] success = TRUE) [18:41:53.092] parallel_sendData(master, data) [18:41:53.092] } [18:41:53.092] return(sendCondition) [18:41:53.092] } [18:41:53.092] } [18:41:53.092] frame <- frame + 1L [18:41:53.092] envir <- sys.frame(frame) [18:41:53.092] } [18:41:53.092] } [18:41:53.092] sendCondition <<- function(cond) NULL [18:41:53.092] } [18:41:53.092] }) [18:41:53.092] withCallingHandlers({ [18:41:53.092] { [18:41:53.092] do.call(function(...) { [18:41:53.092] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.092] if (!identical(...future.globals.maxSize.org, [18:41:53.092] ...future.globals.maxSize)) { [18:41:53.092] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.092] on.exit(options(oopts), add = TRUE) [18:41:53.092] } [18:41:53.092] { [18:41:53.092] lapply(seq_along(...future.elements_ii), [18:41:53.092] FUN = function(jj) { [18:41:53.092] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.092] ...future.FUN(...future.X_jj, ...) [18:41:53.092] }) [18:41:53.092] } [18:41:53.092] }, args = future.call.arguments) [18:41:53.092] } [18:41:53.092] }, immediateCondition = function(cond) { [18:41:53.092] sendCondition <- ...future.makeSendCondition() [18:41:53.092] sendCondition(cond) [18:41:53.092] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.092] { [18:41:53.092] inherits <- base::inherits [18:41:53.092] invokeRestart <- base::invokeRestart [18:41:53.092] is.null <- base::is.null [18:41:53.092] muffled <- FALSE [18:41:53.092] if (inherits(cond, "message")) { [18:41:53.092] muffled <- grepl(pattern, "muffleMessage") [18:41:53.092] if (muffled) [18:41:53.092] invokeRestart("muffleMessage") [18:41:53.092] } [18:41:53.092] else if (inherits(cond, "warning")) { [18:41:53.092] muffled <- grepl(pattern, "muffleWarning") [18:41:53.092] if (muffled) [18:41:53.092] invokeRestart("muffleWarning") [18:41:53.092] } [18:41:53.092] else if (inherits(cond, "condition")) { [18:41:53.092] if (!is.null(pattern)) { [18:41:53.092] computeRestarts <- base::computeRestarts [18:41:53.092] grepl <- base::grepl [18:41:53.092] restarts <- computeRestarts(cond) [18:41:53.092] for (restart in restarts) { [18:41:53.092] name <- restart$name [18:41:53.092] if (is.null(name)) [18:41:53.092] next [18:41:53.092] if (!grepl(pattern, name)) [18:41:53.092] next [18:41:53.092] invokeRestart(restart) [18:41:53.092] muffled <- TRUE [18:41:53.092] break [18:41:53.092] } [18:41:53.092] } [18:41:53.092] } [18:41:53.092] invisible(muffled) [18:41:53.092] } [18:41:53.092] muffleCondition(cond) [18:41:53.092] }) [18:41:53.092] })) [18:41:53.092] future::FutureResult(value = ...future.value$value, [18:41:53.092] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.092] ...future.rng), globalenv = if (FALSE) [18:41:53.092] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.092] ...future.globalenv.names)) [18:41:53.092] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.092] }, condition = base::local({ [18:41:53.092] c <- base::c [18:41:53.092] inherits <- base::inherits [18:41:53.092] invokeRestart <- base::invokeRestart [18:41:53.092] length <- base::length [18:41:53.092] list <- base::list [18:41:53.092] seq.int <- base::seq.int [18:41:53.092] signalCondition <- base::signalCondition [18:41:53.092] sys.calls <- base::sys.calls [18:41:53.092] `[[` <- base::`[[` [18:41:53.092] `+` <- base::`+` [18:41:53.092] `<<-` <- base::`<<-` [18:41:53.092] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.092] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.092] 3L)] [18:41:53.092] } [18:41:53.092] function(cond) { [18:41:53.092] is_error <- inherits(cond, "error") [18:41:53.092] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.092] NULL) [18:41:53.092] if (is_error) { [18:41:53.092] sessionInformation <- function() { [18:41:53.092] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.092] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.092] search = base::search(), system = base::Sys.info()) [18:41:53.092] } [18:41:53.092] ...future.conditions[[length(...future.conditions) + [18:41:53.092] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.092] cond$call), session = sessionInformation(), [18:41:53.092] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.092] signalCondition(cond) [18:41:53.092] } [18:41:53.092] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.092] "immediateCondition"))) { [18:41:53.092] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.092] ...future.conditions[[length(...future.conditions) + [18:41:53.092] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.092] if (TRUE && !signal) { [18:41:53.092] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.092] { [18:41:53.092] inherits <- base::inherits [18:41:53.092] invokeRestart <- base::invokeRestart [18:41:53.092] is.null <- base::is.null [18:41:53.092] muffled <- FALSE [18:41:53.092] if (inherits(cond, "message")) { [18:41:53.092] muffled <- grepl(pattern, "muffleMessage") [18:41:53.092] if (muffled) [18:41:53.092] invokeRestart("muffleMessage") [18:41:53.092] } [18:41:53.092] else if (inherits(cond, "warning")) { [18:41:53.092] muffled <- grepl(pattern, "muffleWarning") [18:41:53.092] if (muffled) [18:41:53.092] invokeRestart("muffleWarning") [18:41:53.092] } [18:41:53.092] else if (inherits(cond, "condition")) { [18:41:53.092] if (!is.null(pattern)) { [18:41:53.092] computeRestarts <- base::computeRestarts [18:41:53.092] grepl <- base::grepl [18:41:53.092] restarts <- computeRestarts(cond) [18:41:53.092] for (restart in restarts) { [18:41:53.092] name <- restart$name [18:41:53.092] if (is.null(name)) [18:41:53.092] next [18:41:53.092] if (!grepl(pattern, name)) [18:41:53.092] next [18:41:53.092] invokeRestart(restart) [18:41:53.092] muffled <- TRUE [18:41:53.092] break [18:41:53.092] } [18:41:53.092] } [18:41:53.092] } [18:41:53.092] invisible(muffled) [18:41:53.092] } [18:41:53.092] muffleCondition(cond, pattern = "^muffle") [18:41:53.092] } [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] if (TRUE) { [18:41:53.092] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.092] { [18:41:53.092] inherits <- base::inherits [18:41:53.092] invokeRestart <- base::invokeRestart [18:41:53.092] is.null <- base::is.null [18:41:53.092] muffled <- FALSE [18:41:53.092] if (inherits(cond, "message")) { [18:41:53.092] muffled <- grepl(pattern, "muffleMessage") [18:41:53.092] if (muffled) [18:41:53.092] invokeRestart("muffleMessage") [18:41:53.092] } [18:41:53.092] else if (inherits(cond, "warning")) { [18:41:53.092] muffled <- grepl(pattern, "muffleWarning") [18:41:53.092] if (muffled) [18:41:53.092] invokeRestart("muffleWarning") [18:41:53.092] } [18:41:53.092] else if (inherits(cond, "condition")) { [18:41:53.092] if (!is.null(pattern)) { [18:41:53.092] computeRestarts <- base::computeRestarts [18:41:53.092] grepl <- base::grepl [18:41:53.092] restarts <- computeRestarts(cond) [18:41:53.092] for (restart in restarts) { [18:41:53.092] name <- restart$name [18:41:53.092] if (is.null(name)) [18:41:53.092] next [18:41:53.092] if (!grepl(pattern, name)) [18:41:53.092] next [18:41:53.092] invokeRestart(restart) [18:41:53.092] muffled <- TRUE [18:41:53.092] break [18:41:53.092] } [18:41:53.092] } [18:41:53.092] } [18:41:53.092] invisible(muffled) [18:41:53.092] } [18:41:53.092] muffleCondition(cond, pattern = "^muffle") [18:41:53.092] } [18:41:53.092] } [18:41:53.092] } [18:41:53.092] })) [18:41:53.092] }, error = function(ex) { [18:41:53.092] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.092] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.092] ...future.rng), started = ...future.startTime, [18:41:53.092] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.092] version = "1.8"), class = "FutureResult") [18:41:53.092] }, finally = { [18:41:53.092] if (!identical(...future.workdir, getwd())) [18:41:53.092] setwd(...future.workdir) [18:41:53.092] { [18:41:53.092] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.092] ...future.oldOptions$nwarnings <- NULL [18:41:53.092] } [18:41:53.092] base::options(...future.oldOptions) [18:41:53.092] if (.Platform$OS.type == "windows") { [18:41:53.092] old_names <- names(...future.oldEnvVars) [18:41:53.092] envs <- base::Sys.getenv() [18:41:53.092] names <- names(envs) [18:41:53.092] common <- intersect(names, old_names) [18:41:53.092] added <- setdiff(names, old_names) [18:41:53.092] removed <- setdiff(old_names, names) [18:41:53.092] changed <- common[...future.oldEnvVars[common] != [18:41:53.092] envs[common]] [18:41:53.092] NAMES <- toupper(changed) [18:41:53.092] args <- list() [18:41:53.092] for (kk in seq_along(NAMES)) { [18:41:53.092] name <- changed[[kk]] [18:41:53.092] NAME <- NAMES[[kk]] [18:41:53.092] if (name != NAME && is.element(NAME, old_names)) [18:41:53.092] next [18:41:53.092] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.092] } [18:41:53.092] NAMES <- toupper(added) [18:41:53.092] for (kk in seq_along(NAMES)) { [18:41:53.092] name <- added[[kk]] [18:41:53.092] NAME <- NAMES[[kk]] [18:41:53.092] if (name != NAME && is.element(NAME, old_names)) [18:41:53.092] next [18:41:53.092] args[[name]] <- "" [18:41:53.092] } [18:41:53.092] NAMES <- toupper(removed) [18:41:53.092] for (kk in seq_along(NAMES)) { [18:41:53.092] name <- removed[[kk]] [18:41:53.092] NAME <- NAMES[[kk]] [18:41:53.092] if (name != NAME && is.element(NAME, old_names)) [18:41:53.092] next [18:41:53.092] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.092] } [18:41:53.092] if (length(args) > 0) [18:41:53.092] base::do.call(base::Sys.setenv, args = args) [18:41:53.092] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.092] } [18:41:53.092] { [18:41:53.092] if (base::length(...future.futureOptionsAdded) > [18:41:53.092] 0L) { [18:41:53.092] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.092] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.092] base::options(opts) [18:41:53.092] } [18:41:53.092] { [18:41:53.092] { [18:41:53.092] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.092] NULL [18:41:53.092] } [18:41:53.092] options(future.plan = NULL) [18:41:53.092] if (is.na(NA_character_)) [18:41:53.092] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.092] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.092] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.092] .init = FALSE) [18:41:53.092] } [18:41:53.092] } [18:41:53.092] } [18:41:53.092] }) [18:41:53.092] if (TRUE) { [18:41:53.092] base::sink(type = "output", split = FALSE) [18:41:53.092] if (TRUE) { [18:41:53.092] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.092] } [18:41:53.092] else { [18:41:53.092] ...future.result["stdout"] <- base::list(NULL) [18:41:53.092] } [18:41:53.092] base::close(...future.stdout) [18:41:53.092] ...future.stdout <- NULL [18:41:53.092] } [18:41:53.092] ...future.result$conditions <- ...future.conditions [18:41:53.092] ...future.result$finished <- base::Sys.time() [18:41:53.092] ...future.result [18:41:53.092] } [18:41:53.097] Exporting 5 global objects (864 bytes) to cluster node #1 ... [18:41:53.098] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.098] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.098] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.099] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.099] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:53.100] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:53.100] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.101] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.101] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.101] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.101] Exporting 5 global objects (864 bytes) to cluster node #1 ... DONE [18:41:53.102] MultisessionFuture started [18:41:53.102] - Launch lazy future ... done [18:41:53.102] run() for 'MultisessionFuture' ... done [18:41:53.103] Created future: [18:41:53.116] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.116] - Validating connection of MultisessionFuture [18:41:53.116] - received message: FutureResult [18:41:53.116] - Received FutureResult [18:41:53.117] - Erased future from FutureRegistry [18:41:53.117] result() for ClusterFuture ... [18:41:53.117] - result already collected: FutureResult [18:41:53.117] result() for ClusterFuture ... done [18:41:53.117] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.103] MultisessionFuture: [18:41:53.103] Label: 'future_sapply-2' [18:41:53.103] Expression: [18:41:53.103] { [18:41:53.103] do.call(function(...) { [18:41:53.103] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.103] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.103] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.103] on.exit(options(oopts), add = TRUE) [18:41:53.103] } [18:41:53.103] { [18:41:53.103] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.103] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.103] ...future.FUN(...future.X_jj, ...) [18:41:53.103] }) [18:41:53.103] } [18:41:53.103] }, args = future.call.arguments) [18:41:53.103] } [18:41:53.103] Lazy evaluation: FALSE [18:41:53.103] Asynchronous evaluation: TRUE [18:41:53.103] Local evaluation: TRUE [18:41:53.103] Environment: R_GlobalEnv [18:41:53.103] Capture standard output: TRUE [18:41:53.103] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.103] Globals: 5 objects totaling 401 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.103] Packages: [18:41:53.103] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.103] Resolved: TRUE [18:41:53.103] Value: [18:41:53.103] Conditions captured: [18:41:53.103] Early signaling: FALSE [18:41:53.103] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.103] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.118] Chunk #2 of 2 ... DONE [18:41:53.118] Launching 2 futures (chunks) ... DONE [18:41:53.118] Resolving 2 futures (chunks) ... [18:41:53.118] resolve() on list ... [18:41:53.118] recursive: 0 [18:41:53.118] length: 2 [18:41:53.119] [18:41:53.119] Future #1 [18:41:53.119] result() for ClusterFuture ... [18:41:53.119] - result already collected: FutureResult [18:41:53.119] result() for ClusterFuture ... done [18:41:53.119] result() for ClusterFuture ... [18:41:53.120] - result already collected: FutureResult [18:41:53.120] result() for ClusterFuture ... done [18:41:53.120] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:53.120] - nx: 2 [18:41:53.120] - relay: TRUE [18:41:53.120] - stdout: TRUE [18:41:53.121] - signal: TRUE [18:41:53.121] - resignal: FALSE [18:41:53.121] - force: TRUE [18:41:53.121] - relayed: [n=2] FALSE, FALSE [18:41:53.121] - queued futures: [n=2] FALSE, FALSE [18:41:53.121] - until=1 [18:41:53.121] - relaying element #1 [18:41:53.122] result() for ClusterFuture ... [18:41:53.122] - result already collected: FutureResult [18:41:53.122] result() for ClusterFuture ... done [18:41:53.122] result() for ClusterFuture ... [18:41:53.122] - result already collected: FutureResult [18:41:53.122] result() for ClusterFuture ... done [18:41:53.123] result() for ClusterFuture ... [18:41:53.123] - result already collected: FutureResult [18:41:53.123] result() for ClusterFuture ... done [18:41:53.123] result() for ClusterFuture ... [18:41:53.123] - result already collected: FutureResult [18:41:53.123] result() for ClusterFuture ... done [18:41:53.124] - relayed: [n=2] TRUE, FALSE [18:41:53.124] - queued futures: [n=2] TRUE, FALSE [18:41:53.124] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:53.124] length: 1 (resolved future 1) [18:41:53.124] Future #2 [18:41:53.124] result() for ClusterFuture ... [18:41:53.125] - result already collected: FutureResult [18:41:53.125] result() for ClusterFuture ... done [18:41:53.125] result() for ClusterFuture ... [18:41:53.125] - result already collected: FutureResult [18:41:53.125] result() for ClusterFuture ... done [18:41:53.125] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:53.126] - nx: 2 [18:41:53.126] - relay: TRUE [18:41:53.126] - stdout: TRUE [18:41:53.126] - signal: TRUE [18:41:53.126] - resignal: FALSE [18:41:53.126] - force: TRUE [18:41:53.126] - relayed: [n=2] TRUE, FALSE [18:41:53.127] - queued futures: [n=2] TRUE, FALSE [18:41:53.127] - until=2 [18:41:53.127] - relaying element #2 [18:41:53.127] result() for ClusterFuture ... [18:41:53.127] - result already collected: FutureResult [18:41:53.127] result() for ClusterFuture ... done [18:41:53.128] result() for ClusterFuture ... [18:41:53.128] - result already collected: FutureResult [18:41:53.128] result() for ClusterFuture ... done [18:41:53.128] result() for ClusterFuture ... [18:41:53.128] - result already collected: FutureResult [18:41:53.128] result() for ClusterFuture ... done [18:41:53.129] result() for ClusterFuture ... [18:41:53.129] - result already collected: FutureResult [18:41:53.129] result() for ClusterFuture ... done [18:41:53.129] - relayed: [n=2] TRUE, TRUE [18:41:53.129] - queued futures: [n=2] TRUE, TRUE [18:41:53.129] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:53.130] length: 0 (resolved future 2) [18:41:53.130] Relaying remaining futures [18:41:53.130] signalConditionsASAP(NULL, pos=0) ... [18:41:53.130] - nx: 2 [18:41:53.130] - relay: TRUE [18:41:53.130] - stdout: TRUE [18:41:53.131] - signal: TRUE [18:41:53.134] - resignal: FALSE [18:41:53.134] - force: TRUE [18:41:53.134] - relayed: [n=2] TRUE, TRUE [18:41:53.134] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:53.135] - relayed: [n=2] TRUE, TRUE [18:41:53.135] - queued futures: [n=2] TRUE, TRUE [18:41:53.135] signalConditionsASAP(NULL, pos=0) ... done [18:41:53.135] resolve() on list ... DONE [18:41:53.135] result() for ClusterFuture ... [18:41:53.135] - result already collected: FutureResult [18:41:53.136] result() for ClusterFuture ... done [18:41:53.136] result() for ClusterFuture ... [18:41:53.136] - result already collected: FutureResult [18:41:53.136] result() for ClusterFuture ... done [18:41:53.136] result() for ClusterFuture ... [18:41:53.136] - result already collected: FutureResult [18:41:53.137] result() for ClusterFuture ... done [18:41:53.137] result() for ClusterFuture ... [18:41:53.137] - result already collected: FutureResult [18:41:53.137] result() for ClusterFuture ... done [18:41:53.137] - Number of value chunks collected: 2 [18:41:53.137] Resolving 2 futures (chunks) ... DONE [18:41:53.138] Reducing values from 2 chunks ... [18:41:53.138] - Number of values collected after concatenation: 3 [18:41:53.138] - Number of values expected: 3 [18:41:53.138] Reducing values from 2 chunks ... DONE [18:41:53.138] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" $ y1:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" List of 2 $ y0:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" $ y2:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" [18:41:53.144] future_lapply() ... [18:41:53.147] Number of chunks: 2 [18:41:53.147] getGlobalsAndPackagesXApply() ... [18:41:53.147] - future.globals: TRUE [18:41:53.147] getGlobalsAndPackages() ... [18:41:53.148] Searching for globals... [18:41:53.149] - globals found: [2] 'FUN', 'UseMethod' [18:41:53.149] Searching for globals ... DONE [18:41:53.149] Resolving globals: FALSE [18:41:53.150] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:53.150] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:53.150] - globals: [1] 'FUN' [18:41:53.151] [18:41:53.151] getGlobalsAndPackages() ... DONE [18:41:53.151] - globals found/used: [n=1] 'FUN' [18:41:53.151] - needed namespaces: [n=0] [18:41:53.151] Finding globals ... DONE [18:41:53.151] - use_args: TRUE [18:41:53.152] - Getting '...' globals ... [18:41:53.152] resolve() on list ... [18:41:53.152] recursive: 0 [18:41:53.152] length: 1 [18:41:53.153] elements: '...' [18:41:53.153] length: 0 (resolved future 1) [18:41:53.153] resolve() on list ... DONE [18:41:53.153] - '...' content: [n=0] [18:41:53.153] List of 1 [18:41:53.153] $ ...: list() [18:41:53.153] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.153] - attr(*, "where")=List of 1 [18:41:53.153] ..$ ...: [18:41:53.153] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.153] - attr(*, "resolved")= logi TRUE [18:41:53.153] - attr(*, "total_size")= num NA [18:41:53.156] - Getting '...' globals ... DONE [18:41:53.156] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.157] List of 2 [18:41:53.157] $ ...future.FUN:function (x, ...) [18:41:53.157] $ ... : list() [18:41:53.157] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.157] - attr(*, "where")=List of 2 [18:41:53.157] ..$ ...future.FUN: [18:41:53.157] ..$ ... : [18:41:53.157] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.157] - attr(*, "resolved")= logi FALSE [18:41:53.157] - attr(*, "total_size")= int 5028 [18:41:53.160] Packages to be attached in all futures: [n=0] [18:41:53.160] getGlobalsAndPackagesXApply() ... DONE [18:41:53.161] Number of futures (= number of chunks): 2 [18:41:53.161] Launching 2 futures (chunks) ... [18:41:53.161] Chunk #1 of 2 ... [18:41:53.161] - Finding globals in 'X' for chunk #1 ... [18:41:53.162] getGlobalsAndPackages() ... [18:41:53.162] Searching for globals... [18:41:53.163] [18:41:53.163] Searching for globals ... DONE [18:41:53.163] - globals: [0] [18:41:53.164] getGlobalsAndPackages() ... DONE [18:41:53.164] + additional globals found: [n=0] [18:41:53.164] + additional namespaces needed: [n=0] [18:41:53.164] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.165] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.165] - seeds: [18:41:53.165] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.165] getGlobalsAndPackages() ... [18:41:53.165] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.165] Resolving globals: FALSE [18:41:53.166] Tweak future expression to call with '...' arguments ... [18:41:53.166] { [18:41:53.166] do.call(function(...) { [18:41:53.166] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.166] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.166] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.166] on.exit(options(oopts), add = TRUE) [18:41:53.166] } [18:41:53.166] { [18:41:53.166] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.166] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.166] ...future.FUN(...future.X_jj, ...) [18:41:53.166] }) [18:41:53.166] } [18:41:53.166] }, args = future.call.arguments) [18:41:53.166] } [18:41:53.166] Tweak future expression to call with '...' arguments ... DONE [18:41:53.167] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.167] [18:41:53.167] getGlobalsAndPackages() ... DONE [18:41:53.167] run() for 'Future' ... [18:41:53.168] - state: 'created' [18:41:53.168] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.185] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.185] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.185] - Field: 'node' [18:41:53.185] - Field: 'label' [18:41:53.186] - Field: 'local' [18:41:53.186] - Field: 'owner' [18:41:53.186] - Field: 'envir' [18:41:53.186] - Field: 'workers' [18:41:53.186] - Field: 'packages' [18:41:53.186] - Field: 'gc' [18:41:53.187] - Field: 'conditions' [18:41:53.187] - Field: 'persistent' [18:41:53.187] - Field: 'expr' [18:41:53.187] - Field: 'uuid' [18:41:53.187] - Field: 'seed' [18:41:53.187] - Field: 'version' [18:41:53.188] - Field: 'result' [18:41:53.188] - Field: 'asynchronous' [18:41:53.188] - Field: 'calls' [18:41:53.188] - Field: 'globals' [18:41:53.188] - Field: 'stdout' [18:41:53.188] - Field: 'earlySignal' [18:41:53.189] - Field: 'lazy' [18:41:53.189] - Field: 'state' [18:41:53.189] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.189] - Launch lazy future ... [18:41:53.190] Packages needed by the future expression (n = 0): [18:41:53.190] Packages needed by future strategies (n = 0): [18:41:53.190] { [18:41:53.190] { [18:41:53.190] { [18:41:53.190] ...future.startTime <- base::Sys.time() [18:41:53.190] { [18:41:53.190] { [18:41:53.190] { [18:41:53.190] { [18:41:53.190] base::local({ [18:41:53.190] has_future <- base::requireNamespace("future", [18:41:53.190] quietly = TRUE) [18:41:53.190] if (has_future) { [18:41:53.190] ns <- base::getNamespace("future") [18:41:53.190] version <- ns[[".package"]][["version"]] [18:41:53.190] if (is.null(version)) [18:41:53.190] version <- utils::packageVersion("future") [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] version <- NULL [18:41:53.190] } [18:41:53.190] if (!has_future || version < "1.8.0") { [18:41:53.190] info <- base::c(r_version = base::gsub("R version ", [18:41:53.190] "", base::R.version$version.string), [18:41:53.190] platform = base::sprintf("%s (%s-bit)", [18:41:53.190] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.190] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.190] "release", "version")], collapse = " "), [18:41:53.190] hostname = base::Sys.info()[["nodename"]]) [18:41:53.190] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.190] info) [18:41:53.190] info <- base::paste(info, collapse = "; ") [18:41:53.190] if (!has_future) { [18:41:53.190] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.190] info) [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.190] info, version) [18:41:53.190] } [18:41:53.190] base::stop(msg) [18:41:53.190] } [18:41:53.190] }) [18:41:53.190] } [18:41:53.190] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.190] base::options(mc.cores = 1L) [18:41:53.190] } [18:41:53.190] ...future.strategy.old <- future::plan("list") [18:41:53.190] options(future.plan = NULL) [18:41:53.190] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.190] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.190] } [18:41:53.190] ...future.workdir <- getwd() [18:41:53.190] } [18:41:53.190] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.190] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.190] } [18:41:53.190] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.190] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.190] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.190] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.190] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.190] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.190] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.190] base::names(...future.oldOptions)) [18:41:53.190] } [18:41:53.190] if (FALSE) { [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] if (TRUE) { [18:41:53.190] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.190] open = "w") [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.190] windows = "NUL", "/dev/null"), open = "w") [18:41:53.190] } [18:41:53.190] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.190] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.190] base::sink(type = "output", split = FALSE) [18:41:53.190] base::close(...future.stdout) [18:41:53.190] }, add = TRUE) [18:41:53.190] } [18:41:53.190] ...future.frame <- base::sys.nframe() [18:41:53.190] ...future.conditions <- base::list() [18:41:53.190] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.190] if (FALSE) { [18:41:53.190] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.190] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.190] } [18:41:53.190] ...future.result <- base::tryCatch({ [18:41:53.190] base::withCallingHandlers({ [18:41:53.190] ...future.value <- base::withVisible(base::local({ [18:41:53.190] ...future.makeSendCondition <- base::local({ [18:41:53.190] sendCondition <- NULL [18:41:53.190] function(frame = 1L) { [18:41:53.190] if (is.function(sendCondition)) [18:41:53.190] return(sendCondition) [18:41:53.190] ns <- getNamespace("parallel") [18:41:53.190] if (exists("sendData", mode = "function", [18:41:53.190] envir = ns)) { [18:41:53.190] parallel_sendData <- get("sendData", mode = "function", [18:41:53.190] envir = ns) [18:41:53.190] envir <- sys.frame(frame) [18:41:53.190] master <- NULL [18:41:53.190] while (!identical(envir, .GlobalEnv) && [18:41:53.190] !identical(envir, emptyenv())) { [18:41:53.190] if (exists("master", mode = "list", envir = envir, [18:41:53.190] inherits = FALSE)) { [18:41:53.190] master <- get("master", mode = "list", [18:41:53.190] envir = envir, inherits = FALSE) [18:41:53.190] if (inherits(master, c("SOCKnode", [18:41:53.190] "SOCK0node"))) { [18:41:53.190] sendCondition <<- function(cond) { [18:41:53.190] data <- list(type = "VALUE", value = cond, [18:41:53.190] success = TRUE) [18:41:53.190] parallel_sendData(master, data) [18:41:53.190] } [18:41:53.190] return(sendCondition) [18:41:53.190] } [18:41:53.190] } [18:41:53.190] frame <- frame + 1L [18:41:53.190] envir <- sys.frame(frame) [18:41:53.190] } [18:41:53.190] } [18:41:53.190] sendCondition <<- function(cond) NULL [18:41:53.190] } [18:41:53.190] }) [18:41:53.190] withCallingHandlers({ [18:41:53.190] { [18:41:53.190] do.call(function(...) { [18:41:53.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.190] if (!identical(...future.globals.maxSize.org, [18:41:53.190] ...future.globals.maxSize)) { [18:41:53.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.190] on.exit(options(oopts), add = TRUE) [18:41:53.190] } [18:41:53.190] { [18:41:53.190] lapply(seq_along(...future.elements_ii), [18:41:53.190] FUN = function(jj) { [18:41:53.190] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.190] ...future.FUN(...future.X_jj, ...) [18:41:53.190] }) [18:41:53.190] } [18:41:53.190] }, args = future.call.arguments) [18:41:53.190] } [18:41:53.190] }, immediateCondition = function(cond) { [18:41:53.190] sendCondition <- ...future.makeSendCondition() [18:41:53.190] sendCondition(cond) [18:41:53.190] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.190] { [18:41:53.190] inherits <- base::inherits [18:41:53.190] invokeRestart <- base::invokeRestart [18:41:53.190] is.null <- base::is.null [18:41:53.190] muffled <- FALSE [18:41:53.190] if (inherits(cond, "message")) { [18:41:53.190] muffled <- grepl(pattern, "muffleMessage") [18:41:53.190] if (muffled) [18:41:53.190] invokeRestart("muffleMessage") [18:41:53.190] } [18:41:53.190] else if (inherits(cond, "warning")) { [18:41:53.190] muffled <- grepl(pattern, "muffleWarning") [18:41:53.190] if (muffled) [18:41:53.190] invokeRestart("muffleWarning") [18:41:53.190] } [18:41:53.190] else if (inherits(cond, "condition")) { [18:41:53.190] if (!is.null(pattern)) { [18:41:53.190] computeRestarts <- base::computeRestarts [18:41:53.190] grepl <- base::grepl [18:41:53.190] restarts <- computeRestarts(cond) [18:41:53.190] for (restart in restarts) { [18:41:53.190] name <- restart$name [18:41:53.190] if (is.null(name)) [18:41:53.190] next [18:41:53.190] if (!grepl(pattern, name)) [18:41:53.190] next [18:41:53.190] invokeRestart(restart) [18:41:53.190] muffled <- TRUE [18:41:53.190] break [18:41:53.190] } [18:41:53.190] } [18:41:53.190] } [18:41:53.190] invisible(muffled) [18:41:53.190] } [18:41:53.190] muffleCondition(cond) [18:41:53.190] }) [18:41:53.190] })) [18:41:53.190] future::FutureResult(value = ...future.value$value, [18:41:53.190] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.190] ...future.rng), globalenv = if (FALSE) [18:41:53.190] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.190] ...future.globalenv.names)) [18:41:53.190] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.190] }, condition = base::local({ [18:41:53.190] c <- base::c [18:41:53.190] inherits <- base::inherits [18:41:53.190] invokeRestart <- base::invokeRestart [18:41:53.190] length <- base::length [18:41:53.190] list <- base::list [18:41:53.190] seq.int <- base::seq.int [18:41:53.190] signalCondition <- base::signalCondition [18:41:53.190] sys.calls <- base::sys.calls [18:41:53.190] `[[` <- base::`[[` [18:41:53.190] `+` <- base::`+` [18:41:53.190] `<<-` <- base::`<<-` [18:41:53.190] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.190] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.190] 3L)] [18:41:53.190] } [18:41:53.190] function(cond) { [18:41:53.190] is_error <- inherits(cond, "error") [18:41:53.190] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.190] NULL) [18:41:53.190] if (is_error) { [18:41:53.190] sessionInformation <- function() { [18:41:53.190] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.190] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.190] search = base::search(), system = base::Sys.info()) [18:41:53.190] } [18:41:53.190] ...future.conditions[[length(...future.conditions) + [18:41:53.190] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.190] cond$call), session = sessionInformation(), [18:41:53.190] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.190] signalCondition(cond) [18:41:53.190] } [18:41:53.190] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.190] "immediateCondition"))) { [18:41:53.190] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.190] ...future.conditions[[length(...future.conditions) + [18:41:53.190] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.190] if (TRUE && !signal) { [18:41:53.190] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.190] { [18:41:53.190] inherits <- base::inherits [18:41:53.190] invokeRestart <- base::invokeRestart [18:41:53.190] is.null <- base::is.null [18:41:53.190] muffled <- FALSE [18:41:53.190] if (inherits(cond, "message")) { [18:41:53.190] muffled <- grepl(pattern, "muffleMessage") [18:41:53.190] if (muffled) [18:41:53.190] invokeRestart("muffleMessage") [18:41:53.190] } [18:41:53.190] else if (inherits(cond, "warning")) { [18:41:53.190] muffled <- grepl(pattern, "muffleWarning") [18:41:53.190] if (muffled) [18:41:53.190] invokeRestart("muffleWarning") [18:41:53.190] } [18:41:53.190] else if (inherits(cond, "condition")) { [18:41:53.190] if (!is.null(pattern)) { [18:41:53.190] computeRestarts <- base::computeRestarts [18:41:53.190] grepl <- base::grepl [18:41:53.190] restarts <- computeRestarts(cond) [18:41:53.190] for (restart in restarts) { [18:41:53.190] name <- restart$name [18:41:53.190] if (is.null(name)) [18:41:53.190] next [18:41:53.190] if (!grepl(pattern, name)) [18:41:53.190] next [18:41:53.190] invokeRestart(restart) [18:41:53.190] muffled <- TRUE [18:41:53.190] break [18:41:53.190] } [18:41:53.190] } [18:41:53.190] } [18:41:53.190] invisible(muffled) [18:41:53.190] } [18:41:53.190] muffleCondition(cond, pattern = "^muffle") [18:41:53.190] } [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] if (TRUE) { [18:41:53.190] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.190] { [18:41:53.190] inherits <- base::inherits [18:41:53.190] invokeRestart <- base::invokeRestart [18:41:53.190] is.null <- base::is.null [18:41:53.190] muffled <- FALSE [18:41:53.190] if (inherits(cond, "message")) { [18:41:53.190] muffled <- grepl(pattern, "muffleMessage") [18:41:53.190] if (muffled) [18:41:53.190] invokeRestart("muffleMessage") [18:41:53.190] } [18:41:53.190] else if (inherits(cond, "warning")) { [18:41:53.190] muffled <- grepl(pattern, "muffleWarning") [18:41:53.190] if (muffled) [18:41:53.190] invokeRestart("muffleWarning") [18:41:53.190] } [18:41:53.190] else if (inherits(cond, "condition")) { [18:41:53.190] if (!is.null(pattern)) { [18:41:53.190] computeRestarts <- base::computeRestarts [18:41:53.190] grepl <- base::grepl [18:41:53.190] restarts <- computeRestarts(cond) [18:41:53.190] for (restart in restarts) { [18:41:53.190] name <- restart$name [18:41:53.190] if (is.null(name)) [18:41:53.190] next [18:41:53.190] if (!grepl(pattern, name)) [18:41:53.190] next [18:41:53.190] invokeRestart(restart) [18:41:53.190] muffled <- TRUE [18:41:53.190] break [18:41:53.190] } [18:41:53.190] } [18:41:53.190] } [18:41:53.190] invisible(muffled) [18:41:53.190] } [18:41:53.190] muffleCondition(cond, pattern = "^muffle") [18:41:53.190] } [18:41:53.190] } [18:41:53.190] } [18:41:53.190] })) [18:41:53.190] }, error = function(ex) { [18:41:53.190] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.190] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.190] ...future.rng), started = ...future.startTime, [18:41:53.190] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.190] version = "1.8"), class = "FutureResult") [18:41:53.190] }, finally = { [18:41:53.190] if (!identical(...future.workdir, getwd())) [18:41:53.190] setwd(...future.workdir) [18:41:53.190] { [18:41:53.190] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.190] ...future.oldOptions$nwarnings <- NULL [18:41:53.190] } [18:41:53.190] base::options(...future.oldOptions) [18:41:53.190] if (.Platform$OS.type == "windows") { [18:41:53.190] old_names <- names(...future.oldEnvVars) [18:41:53.190] envs <- base::Sys.getenv() [18:41:53.190] names <- names(envs) [18:41:53.190] common <- intersect(names, old_names) [18:41:53.190] added <- setdiff(names, old_names) [18:41:53.190] removed <- setdiff(old_names, names) [18:41:53.190] changed <- common[...future.oldEnvVars[common] != [18:41:53.190] envs[common]] [18:41:53.190] NAMES <- toupper(changed) [18:41:53.190] args <- list() [18:41:53.190] for (kk in seq_along(NAMES)) { [18:41:53.190] name <- changed[[kk]] [18:41:53.190] NAME <- NAMES[[kk]] [18:41:53.190] if (name != NAME && is.element(NAME, old_names)) [18:41:53.190] next [18:41:53.190] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.190] } [18:41:53.190] NAMES <- toupper(added) [18:41:53.190] for (kk in seq_along(NAMES)) { [18:41:53.190] name <- added[[kk]] [18:41:53.190] NAME <- NAMES[[kk]] [18:41:53.190] if (name != NAME && is.element(NAME, old_names)) [18:41:53.190] next [18:41:53.190] args[[name]] <- "" [18:41:53.190] } [18:41:53.190] NAMES <- toupper(removed) [18:41:53.190] for (kk in seq_along(NAMES)) { [18:41:53.190] name <- removed[[kk]] [18:41:53.190] NAME <- NAMES[[kk]] [18:41:53.190] if (name != NAME && is.element(NAME, old_names)) [18:41:53.190] next [18:41:53.190] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.190] } [18:41:53.190] if (length(args) > 0) [18:41:53.190] base::do.call(base::Sys.setenv, args = args) [18:41:53.190] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.190] } [18:41:53.190] { [18:41:53.190] if (base::length(...future.futureOptionsAdded) > [18:41:53.190] 0L) { [18:41:53.190] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.190] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.190] base::options(opts) [18:41:53.190] } [18:41:53.190] { [18:41:53.190] { [18:41:53.190] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.190] NULL [18:41:53.190] } [18:41:53.190] options(future.plan = NULL) [18:41:53.190] if (is.na(NA_character_)) [18:41:53.190] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.190] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.190] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.190] .init = FALSE) [18:41:53.190] } [18:41:53.190] } [18:41:53.190] } [18:41:53.190] }) [18:41:53.190] if (TRUE) { [18:41:53.190] base::sink(type = "output", split = FALSE) [18:41:53.190] if (TRUE) { [18:41:53.190] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.190] } [18:41:53.190] else { [18:41:53.190] ...future.result["stdout"] <- base::list(NULL) [18:41:53.190] } [18:41:53.190] base::close(...future.stdout) [18:41:53.190] ...future.stdout <- NULL [18:41:53.190] } [18:41:53.190] ...future.result$conditions <- ...future.conditions [18:41:53.190] ...future.result$finished <- base::Sys.time() [18:41:53.190] ...future.result [18:41:53.190] } [18:41:53.196] Exporting 5 global objects (940 bytes) to cluster node #1 ... [18:41:53.196] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:53.197] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:53.197] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.197] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.197] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.198] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.198] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.198] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.199] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.199] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.199] Exporting 5 global objects (940 bytes) to cluster node #1 ... DONE [18:41:53.200] MultisessionFuture started [18:41:53.200] - Launch lazy future ... done [18:41:53.200] run() for 'MultisessionFuture' ... done [18:41:53.200] Created future: [18:41:53.214] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.214] - Validating connection of MultisessionFuture [18:41:53.215] - received message: FutureResult [18:41:53.215] - Received FutureResult [18:41:53.215] - Erased future from FutureRegistry [18:41:53.215] result() for ClusterFuture ... [18:41:53.216] - result already collected: FutureResult [18:41:53.216] result() for ClusterFuture ... done [18:41:53.216] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.201] MultisessionFuture: [18:41:53.201] Label: 'future_sapply-1' [18:41:53.201] Expression: [18:41:53.201] { [18:41:53.201] do.call(function(...) { [18:41:53.201] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.201] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.201] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.201] on.exit(options(oopts), add = TRUE) [18:41:53.201] } [18:41:53.201] { [18:41:53.201] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.201] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.201] ...future.FUN(...future.X_jj, ...) [18:41:53.201] }) [18:41:53.201] } [18:41:53.201] }, args = future.call.arguments) [18:41:53.201] } [18:41:53.201] Lazy evaluation: FALSE [18:41:53.201] Asynchronous evaluation: TRUE [18:41:53.201] Local evaluation: TRUE [18:41:53.201] Environment: R_GlobalEnv [18:41:53.201] Capture standard output: TRUE [18:41:53.201] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.201] Globals: 5 objects totaling 477 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.201] Packages: [18:41:53.201] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.201] Resolved: TRUE [18:41:53.201] Value: [18:41:53.201] Conditions captured: [18:41:53.201] Early signaling: FALSE [18:41:53.201] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.201] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.216] Chunk #1 of 2 ... DONE [18:41:53.216] Chunk #2 of 2 ... [18:41:53.217] - Finding globals in 'X' for chunk #2 ... [18:41:53.217] getGlobalsAndPackages() ... [18:41:53.217] Searching for globals... [18:41:53.217] [18:41:53.218] Searching for globals ... DONE [18:41:53.218] - globals: [0] [18:41:53.218] getGlobalsAndPackages() ... DONE [18:41:53.218] + additional globals found: [n=0] [18:41:53.218] + additional namespaces needed: [n=0] [18:41:53.218] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.218] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.219] - seeds: [18:41:53.219] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.219] getGlobalsAndPackages() ... [18:41:53.219] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.219] Resolving globals: FALSE [18:41:53.220] Tweak future expression to call with '...' arguments ... [18:41:53.220] { [18:41:53.220] do.call(function(...) { [18:41:53.220] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.220] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.220] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.220] on.exit(options(oopts), add = TRUE) [18:41:53.220] } [18:41:53.220] { [18:41:53.220] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.220] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.220] ...future.FUN(...future.X_jj, ...) [18:41:53.220] }) [18:41:53.220] } [18:41:53.220] }, args = future.call.arguments) [18:41:53.220] } [18:41:53.220] Tweak future expression to call with '...' arguments ... DONE [18:41:53.221] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.221] [18:41:53.221] getGlobalsAndPackages() ... DONE [18:41:53.221] run() for 'Future' ... [18:41:53.222] - state: 'created' [18:41:53.222] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.237] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.237] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.238] - Field: 'node' [18:41:53.238] - Field: 'label' [18:41:53.238] - Field: 'local' [18:41:53.238] - Field: 'owner' [18:41:53.238] - Field: 'envir' [18:41:53.238] - Field: 'workers' [18:41:53.239] - Field: 'packages' [18:41:53.239] - Field: 'gc' [18:41:53.239] - Field: 'conditions' [18:41:53.239] - Field: 'persistent' [18:41:53.239] - Field: 'expr' [18:41:53.240] - Field: 'uuid' [18:41:53.240] - Field: 'seed' [18:41:53.240] - Field: 'version' [18:41:53.240] - Field: 'result' [18:41:53.240] - Field: 'asynchronous' [18:41:53.240] - Field: 'calls' [18:41:53.241] - Field: 'globals' [18:41:53.241] - Field: 'stdout' [18:41:53.241] - Field: 'earlySignal' [18:41:53.241] - Field: 'lazy' [18:41:53.241] - Field: 'state' [18:41:53.242] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.242] - Launch lazy future ... [18:41:53.242] Packages needed by the future expression (n = 0): [18:41:53.242] Packages needed by future strategies (n = 0): [18:41:53.243] { [18:41:53.243] { [18:41:53.243] { [18:41:53.243] ...future.startTime <- base::Sys.time() [18:41:53.243] { [18:41:53.243] { [18:41:53.243] { [18:41:53.243] { [18:41:53.243] base::local({ [18:41:53.243] has_future <- base::requireNamespace("future", [18:41:53.243] quietly = TRUE) [18:41:53.243] if (has_future) { [18:41:53.243] ns <- base::getNamespace("future") [18:41:53.243] version <- ns[[".package"]][["version"]] [18:41:53.243] if (is.null(version)) [18:41:53.243] version <- utils::packageVersion("future") [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] version <- NULL [18:41:53.243] } [18:41:53.243] if (!has_future || version < "1.8.0") { [18:41:53.243] info <- base::c(r_version = base::gsub("R version ", [18:41:53.243] "", base::R.version$version.string), [18:41:53.243] platform = base::sprintf("%s (%s-bit)", [18:41:53.243] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.243] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.243] "release", "version")], collapse = " "), [18:41:53.243] hostname = base::Sys.info()[["nodename"]]) [18:41:53.243] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.243] info) [18:41:53.243] info <- base::paste(info, collapse = "; ") [18:41:53.243] if (!has_future) { [18:41:53.243] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.243] info) [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.243] info, version) [18:41:53.243] } [18:41:53.243] base::stop(msg) [18:41:53.243] } [18:41:53.243] }) [18:41:53.243] } [18:41:53.243] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.243] base::options(mc.cores = 1L) [18:41:53.243] } [18:41:53.243] ...future.strategy.old <- future::plan("list") [18:41:53.243] options(future.plan = NULL) [18:41:53.243] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.243] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.243] } [18:41:53.243] ...future.workdir <- getwd() [18:41:53.243] } [18:41:53.243] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.243] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.243] } [18:41:53.243] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.243] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.243] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.243] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.243] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.243] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.243] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.243] base::names(...future.oldOptions)) [18:41:53.243] } [18:41:53.243] if (FALSE) { [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] if (TRUE) { [18:41:53.243] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.243] open = "w") [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.243] windows = "NUL", "/dev/null"), open = "w") [18:41:53.243] } [18:41:53.243] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.243] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.243] base::sink(type = "output", split = FALSE) [18:41:53.243] base::close(...future.stdout) [18:41:53.243] }, add = TRUE) [18:41:53.243] } [18:41:53.243] ...future.frame <- base::sys.nframe() [18:41:53.243] ...future.conditions <- base::list() [18:41:53.243] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.243] if (FALSE) { [18:41:53.243] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.243] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.243] } [18:41:53.243] ...future.result <- base::tryCatch({ [18:41:53.243] base::withCallingHandlers({ [18:41:53.243] ...future.value <- base::withVisible(base::local({ [18:41:53.243] ...future.makeSendCondition <- base::local({ [18:41:53.243] sendCondition <- NULL [18:41:53.243] function(frame = 1L) { [18:41:53.243] if (is.function(sendCondition)) [18:41:53.243] return(sendCondition) [18:41:53.243] ns <- getNamespace("parallel") [18:41:53.243] if (exists("sendData", mode = "function", [18:41:53.243] envir = ns)) { [18:41:53.243] parallel_sendData <- get("sendData", mode = "function", [18:41:53.243] envir = ns) [18:41:53.243] envir <- sys.frame(frame) [18:41:53.243] master <- NULL [18:41:53.243] while (!identical(envir, .GlobalEnv) && [18:41:53.243] !identical(envir, emptyenv())) { [18:41:53.243] if (exists("master", mode = "list", envir = envir, [18:41:53.243] inherits = FALSE)) { [18:41:53.243] master <- get("master", mode = "list", [18:41:53.243] envir = envir, inherits = FALSE) [18:41:53.243] if (inherits(master, c("SOCKnode", [18:41:53.243] "SOCK0node"))) { [18:41:53.243] sendCondition <<- function(cond) { [18:41:53.243] data <- list(type = "VALUE", value = cond, [18:41:53.243] success = TRUE) [18:41:53.243] parallel_sendData(master, data) [18:41:53.243] } [18:41:53.243] return(sendCondition) [18:41:53.243] } [18:41:53.243] } [18:41:53.243] frame <- frame + 1L [18:41:53.243] envir <- sys.frame(frame) [18:41:53.243] } [18:41:53.243] } [18:41:53.243] sendCondition <<- function(cond) NULL [18:41:53.243] } [18:41:53.243] }) [18:41:53.243] withCallingHandlers({ [18:41:53.243] { [18:41:53.243] do.call(function(...) { [18:41:53.243] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.243] if (!identical(...future.globals.maxSize.org, [18:41:53.243] ...future.globals.maxSize)) { [18:41:53.243] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.243] on.exit(options(oopts), add = TRUE) [18:41:53.243] } [18:41:53.243] { [18:41:53.243] lapply(seq_along(...future.elements_ii), [18:41:53.243] FUN = function(jj) { [18:41:53.243] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.243] ...future.FUN(...future.X_jj, ...) [18:41:53.243] }) [18:41:53.243] } [18:41:53.243] }, args = future.call.arguments) [18:41:53.243] } [18:41:53.243] }, immediateCondition = function(cond) { [18:41:53.243] sendCondition <- ...future.makeSendCondition() [18:41:53.243] sendCondition(cond) [18:41:53.243] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.243] { [18:41:53.243] inherits <- base::inherits [18:41:53.243] invokeRestart <- base::invokeRestart [18:41:53.243] is.null <- base::is.null [18:41:53.243] muffled <- FALSE [18:41:53.243] if (inherits(cond, "message")) { [18:41:53.243] muffled <- grepl(pattern, "muffleMessage") [18:41:53.243] if (muffled) [18:41:53.243] invokeRestart("muffleMessage") [18:41:53.243] } [18:41:53.243] else if (inherits(cond, "warning")) { [18:41:53.243] muffled <- grepl(pattern, "muffleWarning") [18:41:53.243] if (muffled) [18:41:53.243] invokeRestart("muffleWarning") [18:41:53.243] } [18:41:53.243] else if (inherits(cond, "condition")) { [18:41:53.243] if (!is.null(pattern)) { [18:41:53.243] computeRestarts <- base::computeRestarts [18:41:53.243] grepl <- base::grepl [18:41:53.243] restarts <- computeRestarts(cond) [18:41:53.243] for (restart in restarts) { [18:41:53.243] name <- restart$name [18:41:53.243] if (is.null(name)) [18:41:53.243] next [18:41:53.243] if (!grepl(pattern, name)) [18:41:53.243] next [18:41:53.243] invokeRestart(restart) [18:41:53.243] muffled <- TRUE [18:41:53.243] break [18:41:53.243] } [18:41:53.243] } [18:41:53.243] } [18:41:53.243] invisible(muffled) [18:41:53.243] } [18:41:53.243] muffleCondition(cond) [18:41:53.243] }) [18:41:53.243] })) [18:41:53.243] future::FutureResult(value = ...future.value$value, [18:41:53.243] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.243] ...future.rng), globalenv = if (FALSE) [18:41:53.243] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.243] ...future.globalenv.names)) [18:41:53.243] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.243] }, condition = base::local({ [18:41:53.243] c <- base::c [18:41:53.243] inherits <- base::inherits [18:41:53.243] invokeRestart <- base::invokeRestart [18:41:53.243] length <- base::length [18:41:53.243] list <- base::list [18:41:53.243] seq.int <- base::seq.int [18:41:53.243] signalCondition <- base::signalCondition [18:41:53.243] sys.calls <- base::sys.calls [18:41:53.243] `[[` <- base::`[[` [18:41:53.243] `+` <- base::`+` [18:41:53.243] `<<-` <- base::`<<-` [18:41:53.243] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.243] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.243] 3L)] [18:41:53.243] } [18:41:53.243] function(cond) { [18:41:53.243] is_error <- inherits(cond, "error") [18:41:53.243] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.243] NULL) [18:41:53.243] if (is_error) { [18:41:53.243] sessionInformation <- function() { [18:41:53.243] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.243] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.243] search = base::search(), system = base::Sys.info()) [18:41:53.243] } [18:41:53.243] ...future.conditions[[length(...future.conditions) + [18:41:53.243] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.243] cond$call), session = sessionInformation(), [18:41:53.243] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.243] signalCondition(cond) [18:41:53.243] } [18:41:53.243] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.243] "immediateCondition"))) { [18:41:53.243] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.243] ...future.conditions[[length(...future.conditions) + [18:41:53.243] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.243] if (TRUE && !signal) { [18:41:53.243] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.243] { [18:41:53.243] inherits <- base::inherits [18:41:53.243] invokeRestart <- base::invokeRestart [18:41:53.243] is.null <- base::is.null [18:41:53.243] muffled <- FALSE [18:41:53.243] if (inherits(cond, "message")) { [18:41:53.243] muffled <- grepl(pattern, "muffleMessage") [18:41:53.243] if (muffled) [18:41:53.243] invokeRestart("muffleMessage") [18:41:53.243] } [18:41:53.243] else if (inherits(cond, "warning")) { [18:41:53.243] muffled <- grepl(pattern, "muffleWarning") [18:41:53.243] if (muffled) [18:41:53.243] invokeRestart("muffleWarning") [18:41:53.243] } [18:41:53.243] else if (inherits(cond, "condition")) { [18:41:53.243] if (!is.null(pattern)) { [18:41:53.243] computeRestarts <- base::computeRestarts [18:41:53.243] grepl <- base::grepl [18:41:53.243] restarts <- computeRestarts(cond) [18:41:53.243] for (restart in restarts) { [18:41:53.243] name <- restart$name [18:41:53.243] if (is.null(name)) [18:41:53.243] next [18:41:53.243] if (!grepl(pattern, name)) [18:41:53.243] next [18:41:53.243] invokeRestart(restart) [18:41:53.243] muffled <- TRUE [18:41:53.243] break [18:41:53.243] } [18:41:53.243] } [18:41:53.243] } [18:41:53.243] invisible(muffled) [18:41:53.243] } [18:41:53.243] muffleCondition(cond, pattern = "^muffle") [18:41:53.243] } [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] if (TRUE) { [18:41:53.243] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.243] { [18:41:53.243] inherits <- base::inherits [18:41:53.243] invokeRestart <- base::invokeRestart [18:41:53.243] is.null <- base::is.null [18:41:53.243] muffled <- FALSE [18:41:53.243] if (inherits(cond, "message")) { [18:41:53.243] muffled <- grepl(pattern, "muffleMessage") [18:41:53.243] if (muffled) [18:41:53.243] invokeRestart("muffleMessage") [18:41:53.243] } [18:41:53.243] else if (inherits(cond, "warning")) { [18:41:53.243] muffled <- grepl(pattern, "muffleWarning") [18:41:53.243] if (muffled) [18:41:53.243] invokeRestart("muffleWarning") [18:41:53.243] } [18:41:53.243] else if (inherits(cond, "condition")) { [18:41:53.243] if (!is.null(pattern)) { [18:41:53.243] computeRestarts <- base::computeRestarts [18:41:53.243] grepl <- base::grepl [18:41:53.243] restarts <- computeRestarts(cond) [18:41:53.243] for (restart in restarts) { [18:41:53.243] name <- restart$name [18:41:53.243] if (is.null(name)) [18:41:53.243] next [18:41:53.243] if (!grepl(pattern, name)) [18:41:53.243] next [18:41:53.243] invokeRestart(restart) [18:41:53.243] muffled <- TRUE [18:41:53.243] break [18:41:53.243] } [18:41:53.243] } [18:41:53.243] } [18:41:53.243] invisible(muffled) [18:41:53.243] } [18:41:53.243] muffleCondition(cond, pattern = "^muffle") [18:41:53.243] } [18:41:53.243] } [18:41:53.243] } [18:41:53.243] })) [18:41:53.243] }, error = function(ex) { [18:41:53.243] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.243] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.243] ...future.rng), started = ...future.startTime, [18:41:53.243] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.243] version = "1.8"), class = "FutureResult") [18:41:53.243] }, finally = { [18:41:53.243] if (!identical(...future.workdir, getwd())) [18:41:53.243] setwd(...future.workdir) [18:41:53.243] { [18:41:53.243] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.243] ...future.oldOptions$nwarnings <- NULL [18:41:53.243] } [18:41:53.243] base::options(...future.oldOptions) [18:41:53.243] if (.Platform$OS.type == "windows") { [18:41:53.243] old_names <- names(...future.oldEnvVars) [18:41:53.243] envs <- base::Sys.getenv() [18:41:53.243] names <- names(envs) [18:41:53.243] common <- intersect(names, old_names) [18:41:53.243] added <- setdiff(names, old_names) [18:41:53.243] removed <- setdiff(old_names, names) [18:41:53.243] changed <- common[...future.oldEnvVars[common] != [18:41:53.243] envs[common]] [18:41:53.243] NAMES <- toupper(changed) [18:41:53.243] args <- list() [18:41:53.243] for (kk in seq_along(NAMES)) { [18:41:53.243] name <- changed[[kk]] [18:41:53.243] NAME <- NAMES[[kk]] [18:41:53.243] if (name != NAME && is.element(NAME, old_names)) [18:41:53.243] next [18:41:53.243] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.243] } [18:41:53.243] NAMES <- toupper(added) [18:41:53.243] for (kk in seq_along(NAMES)) { [18:41:53.243] name <- added[[kk]] [18:41:53.243] NAME <- NAMES[[kk]] [18:41:53.243] if (name != NAME && is.element(NAME, old_names)) [18:41:53.243] next [18:41:53.243] args[[name]] <- "" [18:41:53.243] } [18:41:53.243] NAMES <- toupper(removed) [18:41:53.243] for (kk in seq_along(NAMES)) { [18:41:53.243] name <- removed[[kk]] [18:41:53.243] NAME <- NAMES[[kk]] [18:41:53.243] if (name != NAME && is.element(NAME, old_names)) [18:41:53.243] next [18:41:53.243] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.243] } [18:41:53.243] if (length(args) > 0) [18:41:53.243] base::do.call(base::Sys.setenv, args = args) [18:41:53.243] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.243] } [18:41:53.243] { [18:41:53.243] if (base::length(...future.futureOptionsAdded) > [18:41:53.243] 0L) { [18:41:53.243] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.243] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.243] base::options(opts) [18:41:53.243] } [18:41:53.243] { [18:41:53.243] { [18:41:53.243] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.243] NULL [18:41:53.243] } [18:41:53.243] options(future.plan = NULL) [18:41:53.243] if (is.na(NA_character_)) [18:41:53.243] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.243] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.243] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.243] .init = FALSE) [18:41:53.243] } [18:41:53.243] } [18:41:53.243] } [18:41:53.243] }) [18:41:53.243] if (TRUE) { [18:41:53.243] base::sink(type = "output", split = FALSE) [18:41:53.243] if (TRUE) { [18:41:53.243] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.243] } [18:41:53.243] else { [18:41:53.243] ...future.result["stdout"] <- base::list(NULL) [18:41:53.243] } [18:41:53.243] base::close(...future.stdout) [18:41:53.243] ...future.stdout <- NULL [18:41:53.243] } [18:41:53.243] ...future.result$conditions <- ...future.conditions [18:41:53.243] ...future.result$finished <- base::Sys.time() [18:41:53.243] ...future.result [18:41:53.243] } [18:41:53.248] Exporting 5 global objects (957 bytes) to cluster node #1 ... [18:41:53.248] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:53.249] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:53.249] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.249] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.250] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:53.250] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:53.250] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.251] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.251] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.251] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.251] Exporting 5 global objects (957 bytes) to cluster node #1 ... DONE [18:41:53.252] MultisessionFuture started [18:41:53.252] - Launch lazy future ... done [18:41:53.252] run() for 'MultisessionFuture' ... done [18:41:53.253] Created future: [18:41:53.266] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.266] - Validating connection of MultisessionFuture [18:41:53.267] - received message: FutureResult [18:41:53.267] - Received FutureResult [18:41:53.267] - Erased future from FutureRegistry [18:41:53.267] result() for ClusterFuture ... [18:41:53.267] - result already collected: FutureResult [18:41:53.268] result() for ClusterFuture ... done [18:41:53.268] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.253] MultisessionFuture: [18:41:53.253] Label: 'future_sapply-2' [18:41:53.253] Expression: [18:41:53.253] { [18:41:53.253] do.call(function(...) { [18:41:53.253] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.253] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.253] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.253] on.exit(options(oopts), add = TRUE) [18:41:53.253] } [18:41:53.253] { [18:41:53.253] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.253] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.253] ...future.FUN(...future.X_jj, ...) [18:41:53.253] }) [18:41:53.253] } [18:41:53.253] }, args = future.call.arguments) [18:41:53.253] } [18:41:53.253] Lazy evaluation: FALSE [18:41:53.253] Asynchronous evaluation: TRUE [18:41:53.253] Local evaluation: TRUE [18:41:53.253] Environment: R_GlobalEnv [18:41:53.253] Capture standard output: TRUE [18:41:53.253] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.253] Globals: 5 objects totaling 494 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.253] Packages: [18:41:53.253] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.253] Resolved: TRUE [18:41:53.253] Value: [18:41:53.253] Conditions captured: [18:41:53.253] Early signaling: FALSE [18:41:53.253] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.253] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.268] Chunk #2 of 2 ... DONE [18:41:53.268] Launching 2 futures (chunks) ... DONE [18:41:53.268] Resolving 2 futures (chunks) ... [18:41:53.269] resolve() on list ... [18:41:53.269] recursive: 0 [18:41:53.269] length: 2 [18:41:53.269] [18:41:53.269] Future #1 [18:41:53.269] result() for ClusterFuture ... [18:41:53.270] - result already collected: FutureResult [18:41:53.270] result() for ClusterFuture ... done [18:41:53.270] result() for ClusterFuture ... [18:41:53.270] - result already collected: FutureResult [18:41:53.270] result() for ClusterFuture ... done [18:41:53.271] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:53.271] - nx: 2 [18:41:53.271] - relay: TRUE [18:41:53.271] - stdout: TRUE [18:41:53.271] - signal: TRUE [18:41:53.271] - resignal: FALSE [18:41:53.271] - force: TRUE [18:41:53.272] - relayed: [n=2] FALSE, FALSE [18:41:53.272] - queued futures: [n=2] FALSE, FALSE [18:41:53.272] - until=1 [18:41:53.272] - relaying element #1 [18:41:53.272] result() for ClusterFuture ... [18:41:53.272] - result already collected: FutureResult [18:41:53.273] result() for ClusterFuture ... done [18:41:53.273] result() for ClusterFuture ... [18:41:53.273] - result already collected: FutureResult [18:41:53.273] result() for ClusterFuture ... done [18:41:53.273] result() for ClusterFuture ... [18:41:53.273] - result already collected: FutureResult [18:41:53.274] result() for ClusterFuture ... done [18:41:53.274] result() for ClusterFuture ... [18:41:53.274] - result already collected: FutureResult [18:41:53.274] result() for ClusterFuture ... done [18:41:53.274] - relayed: [n=2] TRUE, FALSE [18:41:53.274] - queued futures: [n=2] TRUE, FALSE [18:41:53.275] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:53.275] length: 1 (resolved future 1) [18:41:53.275] Future #2 [18:41:53.275] result() for ClusterFuture ... [18:41:53.275] - result already collected: FutureResult [18:41:53.275] result() for ClusterFuture ... done [18:41:53.276] result() for ClusterFuture ... [18:41:53.276] - result already collected: FutureResult [18:41:53.276] result() for ClusterFuture ... done [18:41:53.276] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:53.276] - nx: 2 [18:41:53.276] - relay: TRUE [18:41:53.277] - stdout: TRUE [18:41:53.277] - signal: TRUE [18:41:53.277] - resignal: FALSE [18:41:53.277] - force: TRUE [18:41:53.277] - relayed: [n=2] TRUE, FALSE [18:41:53.277] - queued futures: [n=2] TRUE, FALSE [18:41:53.277] - until=2 [18:41:53.278] - relaying element #2 [18:41:53.278] result() for ClusterFuture ... [18:41:53.278] - result already collected: FutureResult [18:41:53.278] result() for ClusterFuture ... done [18:41:53.278] result() for ClusterFuture ... [18:41:53.278] - result already collected: FutureResult [18:41:53.279] result() for ClusterFuture ... done [18:41:53.279] result() for ClusterFuture ... [18:41:53.279] - result already collected: FutureResult [18:41:53.279] result() for ClusterFuture ... done [18:41:53.279] result() for ClusterFuture ... [18:41:53.279] - result already collected: FutureResult [18:41:53.280] result() for ClusterFuture ... done [18:41:53.280] - relayed: [n=2] TRUE, TRUE [18:41:53.280] - queued futures: [n=2] TRUE, TRUE [18:41:53.280] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:53.280] length: 0 (resolved future 2) [18:41:53.280] Relaying remaining futures [18:41:53.281] signalConditionsASAP(NULL, pos=0) ... [18:41:53.281] - nx: 2 [18:41:53.281] - relay: TRUE [18:41:53.281] - stdout: TRUE [18:41:53.281] - signal: TRUE [18:41:53.281] - resignal: FALSE [18:41:53.281] - force: TRUE [18:41:53.282] - relayed: [n=2] TRUE, TRUE [18:41:53.282] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:53.282] - relayed: [n=2] TRUE, TRUE [18:41:53.282] - queued futures: [n=2] TRUE, TRUE [18:41:53.282] signalConditionsASAP(NULL, pos=0) ... done [18:41:53.282] resolve() on list ... DONE [18:41:53.283] result() for ClusterFuture ... [18:41:53.283] - result already collected: FutureResult [18:41:53.283] result() for ClusterFuture ... done [18:41:53.283] result() for ClusterFuture ... [18:41:53.283] - result already collected: FutureResult [18:41:53.283] result() for ClusterFuture ... done [18:41:53.284] result() for ClusterFuture ... [18:41:53.284] - result already collected: FutureResult [18:41:53.284] result() for ClusterFuture ... done [18:41:53.284] result() for ClusterFuture ... [18:41:53.284] - result already collected: FutureResult [18:41:53.284] result() for ClusterFuture ... done [18:41:53.285] - Number of value chunks collected: 2 [18:41:53.285] Resolving 2 futures (chunks) ... DONE [18:41:53.285] Reducing values from 2 chunks ... [18:41:53.285] - Number of values collected after concatenation: 3 [18:41:53.285] - Number of values expected: 3 [18:41:53.285] Reducing values from 2 chunks ... DONE [18:41:53.286] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" $ y1:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" List of 2 $ y0:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" $ y2:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" [18:41:53.292] future_lapply() ... [18:41:53.298] Number of chunks: 2 [18:41:53.298] getGlobalsAndPackagesXApply() ... [18:41:53.299] - future.globals: TRUE [18:41:53.299] getGlobalsAndPackages() ... [18:41:53.299] Searching for globals... [18:41:53.300] - globals found: [1] 'FUN' [18:41:53.301] Searching for globals ... DONE [18:41:53.301] Resolving globals: FALSE [18:41:53.301] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:53.302] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:53.302] - globals: [1] 'FUN' [18:41:53.302] [18:41:53.302] getGlobalsAndPackages() ... DONE [18:41:53.302] - globals found/used: [n=1] 'FUN' [18:41:53.303] - needed namespaces: [n=0] [18:41:53.303] Finding globals ... DONE [18:41:53.303] - use_args: TRUE [18:41:53.303] - Getting '...' globals ... [18:41:53.303] resolve() on list ... [18:41:53.304] recursive: 0 [18:41:53.304] length: 1 [18:41:53.304] elements: '...' [18:41:53.304] length: 0 (resolved future 1) [18:41:53.304] resolve() on list ... DONE [18:41:53.305] - '...' content: [n=0] [18:41:53.305] List of 1 [18:41:53.305] $ ...: list() [18:41:53.305] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.305] - attr(*, "where")=List of 1 [18:41:53.305] ..$ ...: [18:41:53.305] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.305] - attr(*, "resolved")= logi TRUE [18:41:53.305] - attr(*, "total_size")= num NA [18:41:53.308] - Getting '...' globals ... DONE [18:41:53.308] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.308] List of 2 [18:41:53.308] $ ...future.FUN:function (x) [18:41:53.308] $ ... : list() [18:41:53.308] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.308] - attr(*, "where")=List of 2 [18:41:53.308] ..$ ...future.FUN: [18:41:53.308] ..$ ... : [18:41:53.308] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.308] - attr(*, "resolved")= logi FALSE [18:41:53.308] - attr(*, "total_size")= int 4788 [18:41:53.311] Packages to be attached in all futures: [n=0] [18:41:53.312] getGlobalsAndPackagesXApply() ... DONE [18:41:53.312] Number of futures (= number of chunks): 2 [18:41:53.312] Launching 2 futures (chunks) ... [18:41:53.312] Chunk #1 of 2 ... [18:41:53.312] - Finding globals in 'X' for chunk #1 ... [18:41:53.313] getGlobalsAndPackages() ... [18:41:53.313] Searching for globals... [18:41:53.313] [18:41:53.313] Searching for globals ... DONE [18:41:53.313] - globals: [0] [18:41:53.314] getGlobalsAndPackages() ... DONE [18:41:53.314] + additional globals found: [n=0] [18:41:53.314] + additional namespaces needed: [n=0] [18:41:53.314] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.314] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.314] - seeds: [18:41:53.315] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.315] getGlobalsAndPackages() ... [18:41:53.315] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.315] Resolving globals: FALSE [18:41:53.315] Tweak future expression to call with '...' arguments ... [18:41:53.315] { [18:41:53.315] do.call(function(...) { [18:41:53.315] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.315] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.315] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.315] on.exit(options(oopts), add = TRUE) [18:41:53.315] } [18:41:53.315] { [18:41:53.315] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.315] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.315] ...future.FUN(...future.X_jj, ...) [18:41:53.315] }) [18:41:53.315] } [18:41:53.315] }, args = future.call.arguments) [18:41:53.315] } [18:41:53.316] Tweak future expression to call with '...' arguments ... DONE [18:41:53.316] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.317] [18:41:53.317] getGlobalsAndPackages() ... DONE [18:41:53.317] run() for 'Future' ... [18:41:53.317] - state: 'created' [18:41:53.318] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.333] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.333] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.334] - Field: 'node' [18:41:53.334] - Field: 'label' [18:41:53.334] - Field: 'local' [18:41:53.334] - Field: 'owner' [18:41:53.334] - Field: 'envir' [18:41:53.335] - Field: 'workers' [18:41:53.335] - Field: 'packages' [18:41:53.335] - Field: 'gc' [18:41:53.335] - Field: 'conditions' [18:41:53.335] - Field: 'persistent' [18:41:53.335] - Field: 'expr' [18:41:53.336] - Field: 'uuid' [18:41:53.336] - Field: 'seed' [18:41:53.336] - Field: 'version' [18:41:53.336] - Field: 'result' [18:41:53.336] - Field: 'asynchronous' [18:41:53.336] - Field: 'calls' [18:41:53.337] - Field: 'globals' [18:41:53.337] - Field: 'stdout' [18:41:53.337] - Field: 'earlySignal' [18:41:53.337] - Field: 'lazy' [18:41:53.337] - Field: 'state' [18:41:53.337] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.338] - Launch lazy future ... [18:41:53.338] Packages needed by the future expression (n = 0): [18:41:53.338] Packages needed by future strategies (n = 0): [18:41:53.339] { [18:41:53.339] { [18:41:53.339] { [18:41:53.339] ...future.startTime <- base::Sys.time() [18:41:53.339] { [18:41:53.339] { [18:41:53.339] { [18:41:53.339] { [18:41:53.339] base::local({ [18:41:53.339] has_future <- base::requireNamespace("future", [18:41:53.339] quietly = TRUE) [18:41:53.339] if (has_future) { [18:41:53.339] ns <- base::getNamespace("future") [18:41:53.339] version <- ns[[".package"]][["version"]] [18:41:53.339] if (is.null(version)) [18:41:53.339] version <- utils::packageVersion("future") [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] version <- NULL [18:41:53.339] } [18:41:53.339] if (!has_future || version < "1.8.0") { [18:41:53.339] info <- base::c(r_version = base::gsub("R version ", [18:41:53.339] "", base::R.version$version.string), [18:41:53.339] platform = base::sprintf("%s (%s-bit)", [18:41:53.339] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.339] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.339] "release", "version")], collapse = " "), [18:41:53.339] hostname = base::Sys.info()[["nodename"]]) [18:41:53.339] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.339] info) [18:41:53.339] info <- base::paste(info, collapse = "; ") [18:41:53.339] if (!has_future) { [18:41:53.339] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.339] info) [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.339] info, version) [18:41:53.339] } [18:41:53.339] base::stop(msg) [18:41:53.339] } [18:41:53.339] }) [18:41:53.339] } [18:41:53.339] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.339] base::options(mc.cores = 1L) [18:41:53.339] } [18:41:53.339] ...future.strategy.old <- future::plan("list") [18:41:53.339] options(future.plan = NULL) [18:41:53.339] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.339] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.339] } [18:41:53.339] ...future.workdir <- getwd() [18:41:53.339] } [18:41:53.339] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.339] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.339] } [18:41:53.339] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.339] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.339] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.339] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.339] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.339] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.339] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.339] base::names(...future.oldOptions)) [18:41:53.339] } [18:41:53.339] if (FALSE) { [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] if (TRUE) { [18:41:53.339] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.339] open = "w") [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.339] windows = "NUL", "/dev/null"), open = "w") [18:41:53.339] } [18:41:53.339] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.339] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.339] base::sink(type = "output", split = FALSE) [18:41:53.339] base::close(...future.stdout) [18:41:53.339] }, add = TRUE) [18:41:53.339] } [18:41:53.339] ...future.frame <- base::sys.nframe() [18:41:53.339] ...future.conditions <- base::list() [18:41:53.339] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.339] if (FALSE) { [18:41:53.339] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.339] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.339] } [18:41:53.339] ...future.result <- base::tryCatch({ [18:41:53.339] base::withCallingHandlers({ [18:41:53.339] ...future.value <- base::withVisible(base::local({ [18:41:53.339] ...future.makeSendCondition <- base::local({ [18:41:53.339] sendCondition <- NULL [18:41:53.339] function(frame = 1L) { [18:41:53.339] if (is.function(sendCondition)) [18:41:53.339] return(sendCondition) [18:41:53.339] ns <- getNamespace("parallel") [18:41:53.339] if (exists("sendData", mode = "function", [18:41:53.339] envir = ns)) { [18:41:53.339] parallel_sendData <- get("sendData", mode = "function", [18:41:53.339] envir = ns) [18:41:53.339] envir <- sys.frame(frame) [18:41:53.339] master <- NULL [18:41:53.339] while (!identical(envir, .GlobalEnv) && [18:41:53.339] !identical(envir, emptyenv())) { [18:41:53.339] if (exists("master", mode = "list", envir = envir, [18:41:53.339] inherits = FALSE)) { [18:41:53.339] master <- get("master", mode = "list", [18:41:53.339] envir = envir, inherits = FALSE) [18:41:53.339] if (inherits(master, c("SOCKnode", [18:41:53.339] "SOCK0node"))) { [18:41:53.339] sendCondition <<- function(cond) { [18:41:53.339] data <- list(type = "VALUE", value = cond, [18:41:53.339] success = TRUE) [18:41:53.339] parallel_sendData(master, data) [18:41:53.339] } [18:41:53.339] return(sendCondition) [18:41:53.339] } [18:41:53.339] } [18:41:53.339] frame <- frame + 1L [18:41:53.339] envir <- sys.frame(frame) [18:41:53.339] } [18:41:53.339] } [18:41:53.339] sendCondition <<- function(cond) NULL [18:41:53.339] } [18:41:53.339] }) [18:41:53.339] withCallingHandlers({ [18:41:53.339] { [18:41:53.339] do.call(function(...) { [18:41:53.339] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.339] if (!identical(...future.globals.maxSize.org, [18:41:53.339] ...future.globals.maxSize)) { [18:41:53.339] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.339] on.exit(options(oopts), add = TRUE) [18:41:53.339] } [18:41:53.339] { [18:41:53.339] lapply(seq_along(...future.elements_ii), [18:41:53.339] FUN = function(jj) { [18:41:53.339] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.339] ...future.FUN(...future.X_jj, ...) [18:41:53.339] }) [18:41:53.339] } [18:41:53.339] }, args = future.call.arguments) [18:41:53.339] } [18:41:53.339] }, immediateCondition = function(cond) { [18:41:53.339] sendCondition <- ...future.makeSendCondition() [18:41:53.339] sendCondition(cond) [18:41:53.339] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.339] { [18:41:53.339] inherits <- base::inherits [18:41:53.339] invokeRestart <- base::invokeRestart [18:41:53.339] is.null <- base::is.null [18:41:53.339] muffled <- FALSE [18:41:53.339] if (inherits(cond, "message")) { [18:41:53.339] muffled <- grepl(pattern, "muffleMessage") [18:41:53.339] if (muffled) [18:41:53.339] invokeRestart("muffleMessage") [18:41:53.339] } [18:41:53.339] else if (inherits(cond, "warning")) { [18:41:53.339] muffled <- grepl(pattern, "muffleWarning") [18:41:53.339] if (muffled) [18:41:53.339] invokeRestart("muffleWarning") [18:41:53.339] } [18:41:53.339] else if (inherits(cond, "condition")) { [18:41:53.339] if (!is.null(pattern)) { [18:41:53.339] computeRestarts <- base::computeRestarts [18:41:53.339] grepl <- base::grepl [18:41:53.339] restarts <- computeRestarts(cond) [18:41:53.339] for (restart in restarts) { [18:41:53.339] name <- restart$name [18:41:53.339] if (is.null(name)) [18:41:53.339] next [18:41:53.339] if (!grepl(pattern, name)) [18:41:53.339] next [18:41:53.339] invokeRestart(restart) [18:41:53.339] muffled <- TRUE [18:41:53.339] break [18:41:53.339] } [18:41:53.339] } [18:41:53.339] } [18:41:53.339] invisible(muffled) [18:41:53.339] } [18:41:53.339] muffleCondition(cond) [18:41:53.339] }) [18:41:53.339] })) [18:41:53.339] future::FutureResult(value = ...future.value$value, [18:41:53.339] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.339] ...future.rng), globalenv = if (FALSE) [18:41:53.339] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.339] ...future.globalenv.names)) [18:41:53.339] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.339] }, condition = base::local({ [18:41:53.339] c <- base::c [18:41:53.339] inherits <- base::inherits [18:41:53.339] invokeRestart <- base::invokeRestart [18:41:53.339] length <- base::length [18:41:53.339] list <- base::list [18:41:53.339] seq.int <- base::seq.int [18:41:53.339] signalCondition <- base::signalCondition [18:41:53.339] sys.calls <- base::sys.calls [18:41:53.339] `[[` <- base::`[[` [18:41:53.339] `+` <- base::`+` [18:41:53.339] `<<-` <- base::`<<-` [18:41:53.339] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.339] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.339] 3L)] [18:41:53.339] } [18:41:53.339] function(cond) { [18:41:53.339] is_error <- inherits(cond, "error") [18:41:53.339] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.339] NULL) [18:41:53.339] if (is_error) { [18:41:53.339] sessionInformation <- function() { [18:41:53.339] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.339] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.339] search = base::search(), system = base::Sys.info()) [18:41:53.339] } [18:41:53.339] ...future.conditions[[length(...future.conditions) + [18:41:53.339] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.339] cond$call), session = sessionInformation(), [18:41:53.339] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.339] signalCondition(cond) [18:41:53.339] } [18:41:53.339] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.339] "immediateCondition"))) { [18:41:53.339] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.339] ...future.conditions[[length(...future.conditions) + [18:41:53.339] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.339] if (TRUE && !signal) { [18:41:53.339] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.339] { [18:41:53.339] inherits <- base::inherits [18:41:53.339] invokeRestart <- base::invokeRestart [18:41:53.339] is.null <- base::is.null [18:41:53.339] muffled <- FALSE [18:41:53.339] if (inherits(cond, "message")) { [18:41:53.339] muffled <- grepl(pattern, "muffleMessage") [18:41:53.339] if (muffled) [18:41:53.339] invokeRestart("muffleMessage") [18:41:53.339] } [18:41:53.339] else if (inherits(cond, "warning")) { [18:41:53.339] muffled <- grepl(pattern, "muffleWarning") [18:41:53.339] if (muffled) [18:41:53.339] invokeRestart("muffleWarning") [18:41:53.339] } [18:41:53.339] else if (inherits(cond, "condition")) { [18:41:53.339] if (!is.null(pattern)) { [18:41:53.339] computeRestarts <- base::computeRestarts [18:41:53.339] grepl <- base::grepl [18:41:53.339] restarts <- computeRestarts(cond) [18:41:53.339] for (restart in restarts) { [18:41:53.339] name <- restart$name [18:41:53.339] if (is.null(name)) [18:41:53.339] next [18:41:53.339] if (!grepl(pattern, name)) [18:41:53.339] next [18:41:53.339] invokeRestart(restart) [18:41:53.339] muffled <- TRUE [18:41:53.339] break [18:41:53.339] } [18:41:53.339] } [18:41:53.339] } [18:41:53.339] invisible(muffled) [18:41:53.339] } [18:41:53.339] muffleCondition(cond, pattern = "^muffle") [18:41:53.339] } [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] if (TRUE) { [18:41:53.339] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.339] { [18:41:53.339] inherits <- base::inherits [18:41:53.339] invokeRestart <- base::invokeRestart [18:41:53.339] is.null <- base::is.null [18:41:53.339] muffled <- FALSE [18:41:53.339] if (inherits(cond, "message")) { [18:41:53.339] muffled <- grepl(pattern, "muffleMessage") [18:41:53.339] if (muffled) [18:41:53.339] invokeRestart("muffleMessage") [18:41:53.339] } [18:41:53.339] else if (inherits(cond, "warning")) { [18:41:53.339] muffled <- grepl(pattern, "muffleWarning") [18:41:53.339] if (muffled) [18:41:53.339] invokeRestart("muffleWarning") [18:41:53.339] } [18:41:53.339] else if (inherits(cond, "condition")) { [18:41:53.339] if (!is.null(pattern)) { [18:41:53.339] computeRestarts <- base::computeRestarts [18:41:53.339] grepl <- base::grepl [18:41:53.339] restarts <- computeRestarts(cond) [18:41:53.339] for (restart in restarts) { [18:41:53.339] name <- restart$name [18:41:53.339] if (is.null(name)) [18:41:53.339] next [18:41:53.339] if (!grepl(pattern, name)) [18:41:53.339] next [18:41:53.339] invokeRestart(restart) [18:41:53.339] muffled <- TRUE [18:41:53.339] break [18:41:53.339] } [18:41:53.339] } [18:41:53.339] } [18:41:53.339] invisible(muffled) [18:41:53.339] } [18:41:53.339] muffleCondition(cond, pattern = "^muffle") [18:41:53.339] } [18:41:53.339] } [18:41:53.339] } [18:41:53.339] })) [18:41:53.339] }, error = function(ex) { [18:41:53.339] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.339] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.339] ...future.rng), started = ...future.startTime, [18:41:53.339] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.339] version = "1.8"), class = "FutureResult") [18:41:53.339] }, finally = { [18:41:53.339] if (!identical(...future.workdir, getwd())) [18:41:53.339] setwd(...future.workdir) [18:41:53.339] { [18:41:53.339] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.339] ...future.oldOptions$nwarnings <- NULL [18:41:53.339] } [18:41:53.339] base::options(...future.oldOptions) [18:41:53.339] if (.Platform$OS.type == "windows") { [18:41:53.339] old_names <- names(...future.oldEnvVars) [18:41:53.339] envs <- base::Sys.getenv() [18:41:53.339] names <- names(envs) [18:41:53.339] common <- intersect(names, old_names) [18:41:53.339] added <- setdiff(names, old_names) [18:41:53.339] removed <- setdiff(old_names, names) [18:41:53.339] changed <- common[...future.oldEnvVars[common] != [18:41:53.339] envs[common]] [18:41:53.339] NAMES <- toupper(changed) [18:41:53.339] args <- list() [18:41:53.339] for (kk in seq_along(NAMES)) { [18:41:53.339] name <- changed[[kk]] [18:41:53.339] NAME <- NAMES[[kk]] [18:41:53.339] if (name != NAME && is.element(NAME, old_names)) [18:41:53.339] next [18:41:53.339] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.339] } [18:41:53.339] NAMES <- toupper(added) [18:41:53.339] for (kk in seq_along(NAMES)) { [18:41:53.339] name <- added[[kk]] [18:41:53.339] NAME <- NAMES[[kk]] [18:41:53.339] if (name != NAME && is.element(NAME, old_names)) [18:41:53.339] next [18:41:53.339] args[[name]] <- "" [18:41:53.339] } [18:41:53.339] NAMES <- toupper(removed) [18:41:53.339] for (kk in seq_along(NAMES)) { [18:41:53.339] name <- removed[[kk]] [18:41:53.339] NAME <- NAMES[[kk]] [18:41:53.339] if (name != NAME && is.element(NAME, old_names)) [18:41:53.339] next [18:41:53.339] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.339] } [18:41:53.339] if (length(args) > 0) [18:41:53.339] base::do.call(base::Sys.setenv, args = args) [18:41:53.339] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.339] } [18:41:53.339] { [18:41:53.339] if (base::length(...future.futureOptionsAdded) > [18:41:53.339] 0L) { [18:41:53.339] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.339] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.339] base::options(opts) [18:41:53.339] } [18:41:53.339] { [18:41:53.339] { [18:41:53.339] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.339] NULL [18:41:53.339] } [18:41:53.339] options(future.plan = NULL) [18:41:53.339] if (is.na(NA_character_)) [18:41:53.339] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.339] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.339] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.339] .init = FALSE) [18:41:53.339] } [18:41:53.339] } [18:41:53.339] } [18:41:53.339] }) [18:41:53.339] if (TRUE) { [18:41:53.339] base::sink(type = "output", split = FALSE) [18:41:53.339] if (TRUE) { [18:41:53.339] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.339] } [18:41:53.339] else { [18:41:53.339] ...future.result["stdout"] <- base::list(NULL) [18:41:53.339] } [18:41:53.339] base::close(...future.stdout) [18:41:53.339] ...future.stdout <- NULL [18:41:53.339] } [18:41:53.339] ...future.result$conditions <- ...future.conditions [18:41:53.339] ...future.result$finished <- base::Sys.time() [18:41:53.339] ...future.result [18:41:53.339] } [18:41:53.344] Exporting 5 global objects (847 bytes) to cluster node #1 ... [18:41:53.344] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.345] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.345] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.345] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.346] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.346] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.346] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.347] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.347] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.347] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.347] Exporting 5 global objects (847 bytes) to cluster node #1 ... DONE [18:41:53.348] MultisessionFuture started [18:41:53.348] - Launch lazy future ... done [18:41:53.348] run() for 'MultisessionFuture' ... done [18:41:53.349] Created future: [18:41:53.362] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.362] - Validating connection of MultisessionFuture [18:41:53.363] - received message: FutureResult [18:41:53.363] - Received FutureResult [18:41:53.363] - Erased future from FutureRegistry [18:41:53.363] result() for ClusterFuture ... [18:41:53.364] - result already collected: FutureResult [18:41:53.364] result() for ClusterFuture ... done [18:41:53.364] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.349] MultisessionFuture: [18:41:53.349] Label: 'future_sapply-1' [18:41:53.349] Expression: [18:41:53.349] { [18:41:53.349] do.call(function(...) { [18:41:53.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.349] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.349] on.exit(options(oopts), add = TRUE) [18:41:53.349] } [18:41:53.349] { [18:41:53.349] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.349] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.349] ...future.FUN(...future.X_jj, ...) [18:41:53.349] }) [18:41:53.349] } [18:41:53.349] }, args = future.call.arguments) [18:41:53.349] } [18:41:53.349] Lazy evaluation: FALSE [18:41:53.349] Asynchronous evaluation: TRUE [18:41:53.349] Local evaluation: TRUE [18:41:53.349] Environment: R_GlobalEnv [18:41:53.349] Capture standard output: TRUE [18:41:53.349] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.349] Globals: 5 objects totaling 384 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.349] Packages: [18:41:53.349] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.349] Resolved: TRUE [18:41:53.349] Value: [18:41:53.349] Conditions captured: [18:41:53.349] Early signaling: FALSE [18:41:53.349] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.349] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.364] Chunk #1 of 2 ... DONE [18:41:53.365] Chunk #2 of 2 ... [18:41:53.365] - Finding globals in 'X' for chunk #2 ... [18:41:53.365] getGlobalsAndPackages() ... [18:41:53.365] Searching for globals... [18:41:53.366] [18:41:53.366] Searching for globals ... DONE [18:41:53.366] - globals: [0] [18:41:53.366] getGlobalsAndPackages() ... DONE [18:41:53.366] + additional globals found: [n=0] [18:41:53.367] + additional namespaces needed: [n=0] [18:41:53.367] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.367] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.367] - seeds: [18:41:53.367] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.368] getGlobalsAndPackages() ... [18:41:53.368] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.368] Resolving globals: FALSE [18:41:53.368] Tweak future expression to call with '...' arguments ... [18:41:53.368] { [18:41:53.368] do.call(function(...) { [18:41:53.368] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.368] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.368] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.368] on.exit(options(oopts), add = TRUE) [18:41:53.368] } [18:41:53.368] { [18:41:53.368] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.368] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.368] ...future.FUN(...future.X_jj, ...) [18:41:53.368] }) [18:41:53.368] } [18:41:53.368] }, args = future.call.arguments) [18:41:53.368] } [18:41:53.369] Tweak future expression to call with '...' arguments ... DONE [18:41:53.370] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.370] [18:41:53.370] getGlobalsAndPackages() ... DONE [18:41:53.370] run() for 'Future' ... [18:41:53.371] - state: 'created' [18:41:53.371] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.389] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.390] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.390] - Field: 'node' [18:41:53.390] - Field: 'label' [18:41:53.390] - Field: 'local' [18:41:53.390] - Field: 'owner' [18:41:53.391] - Field: 'envir' [18:41:53.391] - Field: 'workers' [18:41:53.391] - Field: 'packages' [18:41:53.391] - Field: 'gc' [18:41:53.391] - Field: 'conditions' [18:41:53.392] - Field: 'persistent' [18:41:53.392] - Field: 'expr' [18:41:53.392] - Field: 'uuid' [18:41:53.392] - Field: 'seed' [18:41:53.392] - Field: 'version' [18:41:53.393] - Field: 'result' [18:41:53.393] - Field: 'asynchronous' [18:41:53.393] - Field: 'calls' [18:41:53.393] - Field: 'globals' [18:41:53.394] - Field: 'stdout' [18:41:53.394] - Field: 'earlySignal' [18:41:53.394] - Field: 'lazy' [18:41:53.394] - Field: 'state' [18:41:53.394] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.395] - Launch lazy future ... [18:41:53.395] Packages needed by the future expression (n = 0): [18:41:53.395] Packages needed by future strategies (n = 0): [18:41:53.396] { [18:41:53.396] { [18:41:53.396] { [18:41:53.396] ...future.startTime <- base::Sys.time() [18:41:53.396] { [18:41:53.396] { [18:41:53.396] { [18:41:53.396] { [18:41:53.396] base::local({ [18:41:53.396] has_future <- base::requireNamespace("future", [18:41:53.396] quietly = TRUE) [18:41:53.396] if (has_future) { [18:41:53.396] ns <- base::getNamespace("future") [18:41:53.396] version <- ns[[".package"]][["version"]] [18:41:53.396] if (is.null(version)) [18:41:53.396] version <- utils::packageVersion("future") [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] version <- NULL [18:41:53.396] } [18:41:53.396] if (!has_future || version < "1.8.0") { [18:41:53.396] info <- base::c(r_version = base::gsub("R version ", [18:41:53.396] "", base::R.version$version.string), [18:41:53.396] platform = base::sprintf("%s (%s-bit)", [18:41:53.396] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.396] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.396] "release", "version")], collapse = " "), [18:41:53.396] hostname = base::Sys.info()[["nodename"]]) [18:41:53.396] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.396] info) [18:41:53.396] info <- base::paste(info, collapse = "; ") [18:41:53.396] if (!has_future) { [18:41:53.396] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.396] info) [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.396] info, version) [18:41:53.396] } [18:41:53.396] base::stop(msg) [18:41:53.396] } [18:41:53.396] }) [18:41:53.396] } [18:41:53.396] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.396] base::options(mc.cores = 1L) [18:41:53.396] } [18:41:53.396] ...future.strategy.old <- future::plan("list") [18:41:53.396] options(future.plan = NULL) [18:41:53.396] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.396] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.396] } [18:41:53.396] ...future.workdir <- getwd() [18:41:53.396] } [18:41:53.396] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.396] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.396] } [18:41:53.396] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.396] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.396] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.396] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.396] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.396] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.396] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.396] base::names(...future.oldOptions)) [18:41:53.396] } [18:41:53.396] if (FALSE) { [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] if (TRUE) { [18:41:53.396] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.396] open = "w") [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.396] windows = "NUL", "/dev/null"), open = "w") [18:41:53.396] } [18:41:53.396] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.396] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.396] base::sink(type = "output", split = FALSE) [18:41:53.396] base::close(...future.stdout) [18:41:53.396] }, add = TRUE) [18:41:53.396] } [18:41:53.396] ...future.frame <- base::sys.nframe() [18:41:53.396] ...future.conditions <- base::list() [18:41:53.396] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.396] if (FALSE) { [18:41:53.396] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.396] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.396] } [18:41:53.396] ...future.result <- base::tryCatch({ [18:41:53.396] base::withCallingHandlers({ [18:41:53.396] ...future.value <- base::withVisible(base::local({ [18:41:53.396] ...future.makeSendCondition <- base::local({ [18:41:53.396] sendCondition <- NULL [18:41:53.396] function(frame = 1L) { [18:41:53.396] if (is.function(sendCondition)) [18:41:53.396] return(sendCondition) [18:41:53.396] ns <- getNamespace("parallel") [18:41:53.396] if (exists("sendData", mode = "function", [18:41:53.396] envir = ns)) { [18:41:53.396] parallel_sendData <- get("sendData", mode = "function", [18:41:53.396] envir = ns) [18:41:53.396] envir <- sys.frame(frame) [18:41:53.396] master <- NULL [18:41:53.396] while (!identical(envir, .GlobalEnv) && [18:41:53.396] !identical(envir, emptyenv())) { [18:41:53.396] if (exists("master", mode = "list", envir = envir, [18:41:53.396] inherits = FALSE)) { [18:41:53.396] master <- get("master", mode = "list", [18:41:53.396] envir = envir, inherits = FALSE) [18:41:53.396] if (inherits(master, c("SOCKnode", [18:41:53.396] "SOCK0node"))) { [18:41:53.396] sendCondition <<- function(cond) { [18:41:53.396] data <- list(type = "VALUE", value = cond, [18:41:53.396] success = TRUE) [18:41:53.396] parallel_sendData(master, data) [18:41:53.396] } [18:41:53.396] return(sendCondition) [18:41:53.396] } [18:41:53.396] } [18:41:53.396] frame <- frame + 1L [18:41:53.396] envir <- sys.frame(frame) [18:41:53.396] } [18:41:53.396] } [18:41:53.396] sendCondition <<- function(cond) NULL [18:41:53.396] } [18:41:53.396] }) [18:41:53.396] withCallingHandlers({ [18:41:53.396] { [18:41:53.396] do.call(function(...) { [18:41:53.396] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.396] if (!identical(...future.globals.maxSize.org, [18:41:53.396] ...future.globals.maxSize)) { [18:41:53.396] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.396] on.exit(options(oopts), add = TRUE) [18:41:53.396] } [18:41:53.396] { [18:41:53.396] lapply(seq_along(...future.elements_ii), [18:41:53.396] FUN = function(jj) { [18:41:53.396] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.396] ...future.FUN(...future.X_jj, ...) [18:41:53.396] }) [18:41:53.396] } [18:41:53.396] }, args = future.call.arguments) [18:41:53.396] } [18:41:53.396] }, immediateCondition = function(cond) { [18:41:53.396] sendCondition <- ...future.makeSendCondition() [18:41:53.396] sendCondition(cond) [18:41:53.396] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.396] { [18:41:53.396] inherits <- base::inherits [18:41:53.396] invokeRestart <- base::invokeRestart [18:41:53.396] is.null <- base::is.null [18:41:53.396] muffled <- FALSE [18:41:53.396] if (inherits(cond, "message")) { [18:41:53.396] muffled <- grepl(pattern, "muffleMessage") [18:41:53.396] if (muffled) [18:41:53.396] invokeRestart("muffleMessage") [18:41:53.396] } [18:41:53.396] else if (inherits(cond, "warning")) { [18:41:53.396] muffled <- grepl(pattern, "muffleWarning") [18:41:53.396] if (muffled) [18:41:53.396] invokeRestart("muffleWarning") [18:41:53.396] } [18:41:53.396] else if (inherits(cond, "condition")) { [18:41:53.396] if (!is.null(pattern)) { [18:41:53.396] computeRestarts <- base::computeRestarts [18:41:53.396] grepl <- base::grepl [18:41:53.396] restarts <- computeRestarts(cond) [18:41:53.396] for (restart in restarts) { [18:41:53.396] name <- restart$name [18:41:53.396] if (is.null(name)) [18:41:53.396] next [18:41:53.396] if (!grepl(pattern, name)) [18:41:53.396] next [18:41:53.396] invokeRestart(restart) [18:41:53.396] muffled <- TRUE [18:41:53.396] break [18:41:53.396] } [18:41:53.396] } [18:41:53.396] } [18:41:53.396] invisible(muffled) [18:41:53.396] } [18:41:53.396] muffleCondition(cond) [18:41:53.396] }) [18:41:53.396] })) [18:41:53.396] future::FutureResult(value = ...future.value$value, [18:41:53.396] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.396] ...future.rng), globalenv = if (FALSE) [18:41:53.396] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.396] ...future.globalenv.names)) [18:41:53.396] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.396] }, condition = base::local({ [18:41:53.396] c <- base::c [18:41:53.396] inherits <- base::inherits [18:41:53.396] invokeRestart <- base::invokeRestart [18:41:53.396] length <- base::length [18:41:53.396] list <- base::list [18:41:53.396] seq.int <- base::seq.int [18:41:53.396] signalCondition <- base::signalCondition [18:41:53.396] sys.calls <- base::sys.calls [18:41:53.396] `[[` <- base::`[[` [18:41:53.396] `+` <- base::`+` [18:41:53.396] `<<-` <- base::`<<-` [18:41:53.396] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.396] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.396] 3L)] [18:41:53.396] } [18:41:53.396] function(cond) { [18:41:53.396] is_error <- inherits(cond, "error") [18:41:53.396] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.396] NULL) [18:41:53.396] if (is_error) { [18:41:53.396] sessionInformation <- function() { [18:41:53.396] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.396] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.396] search = base::search(), system = base::Sys.info()) [18:41:53.396] } [18:41:53.396] ...future.conditions[[length(...future.conditions) + [18:41:53.396] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.396] cond$call), session = sessionInformation(), [18:41:53.396] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.396] signalCondition(cond) [18:41:53.396] } [18:41:53.396] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.396] "immediateCondition"))) { [18:41:53.396] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.396] ...future.conditions[[length(...future.conditions) + [18:41:53.396] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.396] if (TRUE && !signal) { [18:41:53.396] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.396] { [18:41:53.396] inherits <- base::inherits [18:41:53.396] invokeRestart <- base::invokeRestart [18:41:53.396] is.null <- base::is.null [18:41:53.396] muffled <- FALSE [18:41:53.396] if (inherits(cond, "message")) { [18:41:53.396] muffled <- grepl(pattern, "muffleMessage") [18:41:53.396] if (muffled) [18:41:53.396] invokeRestart("muffleMessage") [18:41:53.396] } [18:41:53.396] else if (inherits(cond, "warning")) { [18:41:53.396] muffled <- grepl(pattern, "muffleWarning") [18:41:53.396] if (muffled) [18:41:53.396] invokeRestart("muffleWarning") [18:41:53.396] } [18:41:53.396] else if (inherits(cond, "condition")) { [18:41:53.396] if (!is.null(pattern)) { [18:41:53.396] computeRestarts <- base::computeRestarts [18:41:53.396] grepl <- base::grepl [18:41:53.396] restarts <- computeRestarts(cond) [18:41:53.396] for (restart in restarts) { [18:41:53.396] name <- restart$name [18:41:53.396] if (is.null(name)) [18:41:53.396] next [18:41:53.396] if (!grepl(pattern, name)) [18:41:53.396] next [18:41:53.396] invokeRestart(restart) [18:41:53.396] muffled <- TRUE [18:41:53.396] break [18:41:53.396] } [18:41:53.396] } [18:41:53.396] } [18:41:53.396] invisible(muffled) [18:41:53.396] } [18:41:53.396] muffleCondition(cond, pattern = "^muffle") [18:41:53.396] } [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] if (TRUE) { [18:41:53.396] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.396] { [18:41:53.396] inherits <- base::inherits [18:41:53.396] invokeRestart <- base::invokeRestart [18:41:53.396] is.null <- base::is.null [18:41:53.396] muffled <- FALSE [18:41:53.396] if (inherits(cond, "message")) { [18:41:53.396] muffled <- grepl(pattern, "muffleMessage") [18:41:53.396] if (muffled) [18:41:53.396] invokeRestart("muffleMessage") [18:41:53.396] } [18:41:53.396] else if (inherits(cond, "warning")) { [18:41:53.396] muffled <- grepl(pattern, "muffleWarning") [18:41:53.396] if (muffled) [18:41:53.396] invokeRestart("muffleWarning") [18:41:53.396] } [18:41:53.396] else if (inherits(cond, "condition")) { [18:41:53.396] if (!is.null(pattern)) { [18:41:53.396] computeRestarts <- base::computeRestarts [18:41:53.396] grepl <- base::grepl [18:41:53.396] restarts <- computeRestarts(cond) [18:41:53.396] for (restart in restarts) { [18:41:53.396] name <- restart$name [18:41:53.396] if (is.null(name)) [18:41:53.396] next [18:41:53.396] if (!grepl(pattern, name)) [18:41:53.396] next [18:41:53.396] invokeRestart(restart) [18:41:53.396] muffled <- TRUE [18:41:53.396] break [18:41:53.396] } [18:41:53.396] } [18:41:53.396] } [18:41:53.396] invisible(muffled) [18:41:53.396] } [18:41:53.396] muffleCondition(cond, pattern = "^muffle") [18:41:53.396] } [18:41:53.396] } [18:41:53.396] } [18:41:53.396] })) [18:41:53.396] }, error = function(ex) { [18:41:53.396] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.396] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.396] ...future.rng), started = ...future.startTime, [18:41:53.396] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.396] version = "1.8"), class = "FutureResult") [18:41:53.396] }, finally = { [18:41:53.396] if (!identical(...future.workdir, getwd())) [18:41:53.396] setwd(...future.workdir) [18:41:53.396] { [18:41:53.396] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.396] ...future.oldOptions$nwarnings <- NULL [18:41:53.396] } [18:41:53.396] base::options(...future.oldOptions) [18:41:53.396] if (.Platform$OS.type == "windows") { [18:41:53.396] old_names <- names(...future.oldEnvVars) [18:41:53.396] envs <- base::Sys.getenv() [18:41:53.396] names <- names(envs) [18:41:53.396] common <- intersect(names, old_names) [18:41:53.396] added <- setdiff(names, old_names) [18:41:53.396] removed <- setdiff(old_names, names) [18:41:53.396] changed <- common[...future.oldEnvVars[common] != [18:41:53.396] envs[common]] [18:41:53.396] NAMES <- toupper(changed) [18:41:53.396] args <- list() [18:41:53.396] for (kk in seq_along(NAMES)) { [18:41:53.396] name <- changed[[kk]] [18:41:53.396] NAME <- NAMES[[kk]] [18:41:53.396] if (name != NAME && is.element(NAME, old_names)) [18:41:53.396] next [18:41:53.396] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.396] } [18:41:53.396] NAMES <- toupper(added) [18:41:53.396] for (kk in seq_along(NAMES)) { [18:41:53.396] name <- added[[kk]] [18:41:53.396] NAME <- NAMES[[kk]] [18:41:53.396] if (name != NAME && is.element(NAME, old_names)) [18:41:53.396] next [18:41:53.396] args[[name]] <- "" [18:41:53.396] } [18:41:53.396] NAMES <- toupper(removed) [18:41:53.396] for (kk in seq_along(NAMES)) { [18:41:53.396] name <- removed[[kk]] [18:41:53.396] NAME <- NAMES[[kk]] [18:41:53.396] if (name != NAME && is.element(NAME, old_names)) [18:41:53.396] next [18:41:53.396] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.396] } [18:41:53.396] if (length(args) > 0) [18:41:53.396] base::do.call(base::Sys.setenv, args = args) [18:41:53.396] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.396] } [18:41:53.396] { [18:41:53.396] if (base::length(...future.futureOptionsAdded) > [18:41:53.396] 0L) { [18:41:53.396] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.396] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.396] base::options(opts) [18:41:53.396] } [18:41:53.396] { [18:41:53.396] { [18:41:53.396] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.396] NULL [18:41:53.396] } [18:41:53.396] options(future.plan = NULL) [18:41:53.396] if (is.na(NA_character_)) [18:41:53.396] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.396] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.396] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.396] .init = FALSE) [18:41:53.396] } [18:41:53.396] } [18:41:53.396] } [18:41:53.396] }) [18:41:53.396] if (TRUE) { [18:41:53.396] base::sink(type = "output", split = FALSE) [18:41:53.396] if (TRUE) { [18:41:53.396] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.396] } [18:41:53.396] else { [18:41:53.396] ...future.result["stdout"] <- base::list(NULL) [18:41:53.396] } [18:41:53.396] base::close(...future.stdout) [18:41:53.396] ...future.stdout <- NULL [18:41:53.396] } [18:41:53.396] ...future.result$conditions <- ...future.conditions [18:41:53.396] ...future.result$finished <- base::Sys.time() [18:41:53.396] ...future.result [18:41:53.396] } [18:41:53.403] Exporting 5 global objects (864 bytes) to cluster node #1 ... [18:41:53.404] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.404] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.404] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.405] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.405] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:53.405] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:53.406] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.406] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.406] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.407] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.407] Exporting 5 global objects (864 bytes) to cluster node #1 ... DONE [18:41:53.408] MultisessionFuture started [18:41:53.408] - Launch lazy future ... done [18:41:53.408] run() for 'MultisessionFuture' ... done [18:41:53.408] Created future: [18:41:53.422] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.422] - Validating connection of MultisessionFuture [18:41:53.422] - received message: FutureResult [18:41:53.423] - Received FutureResult [18:41:53.423] - Erased future from FutureRegistry [18:41:53.423] result() for ClusterFuture ... [18:41:53.423] - result already collected: FutureResult [18:41:53.423] result() for ClusterFuture ... done [18:41:53.424] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.409] MultisessionFuture: [18:41:53.409] Label: 'future_sapply-2' [18:41:53.409] Expression: [18:41:53.409] { [18:41:53.409] do.call(function(...) { [18:41:53.409] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.409] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.409] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.409] on.exit(options(oopts), add = TRUE) [18:41:53.409] } [18:41:53.409] { [18:41:53.409] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.409] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.409] ...future.FUN(...future.X_jj, ...) [18:41:53.409] }) [18:41:53.409] } [18:41:53.409] }, args = future.call.arguments) [18:41:53.409] } [18:41:53.409] Lazy evaluation: FALSE [18:41:53.409] Asynchronous evaluation: TRUE [18:41:53.409] Local evaluation: TRUE [18:41:53.409] Environment: R_GlobalEnv [18:41:53.409] Capture standard output: TRUE [18:41:53.409] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.409] Globals: 5 objects totaling 401 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.409] Packages: [18:41:53.409] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.409] Resolved: TRUE [18:41:53.409] Value: [18:41:53.409] Conditions captured: [18:41:53.409] Early signaling: FALSE [18:41:53.409] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.409] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.424] Chunk #2 of 2 ... DONE [18:41:53.424] Launching 2 futures (chunks) ... DONE [18:41:53.425] Resolving 2 futures (chunks) ... [18:41:53.425] resolve() on list ... [18:41:53.425] recursive: 0 [18:41:53.425] length: 2 [18:41:53.425] [18:41:53.426] Future #1 [18:41:53.426] result() for ClusterFuture ... [18:41:53.426] - result already collected: FutureResult [18:41:53.426] result() for ClusterFuture ... done [18:41:53.426] result() for ClusterFuture ... [18:41:53.426] - result already collected: FutureResult [18:41:53.427] result() for ClusterFuture ... done [18:41:53.427] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:53.427] - nx: 2 [18:41:53.427] - relay: TRUE [18:41:53.427] - stdout: TRUE [18:41:53.428] - signal: TRUE [18:41:53.428] - resignal: FALSE [18:41:53.428] - force: TRUE [18:41:53.428] - relayed: [n=2] FALSE, FALSE [18:41:53.428] - queued futures: [n=2] FALSE, FALSE [18:41:53.428] - until=1 [18:41:53.429] - relaying element #1 [18:41:53.429] result() for ClusterFuture ... [18:41:53.429] - result already collected: FutureResult [18:41:53.429] result() for ClusterFuture ... done [18:41:53.429] result() for ClusterFuture ... [18:41:53.430] - result already collected: FutureResult [18:41:53.430] result() for ClusterFuture ... done [18:41:53.430] result() for ClusterFuture ... [18:41:53.430] - result already collected: FutureResult [18:41:53.430] result() for ClusterFuture ... done [18:41:53.431] result() for ClusterFuture ... [18:41:53.431] - result already collected: FutureResult [18:41:53.431] result() for ClusterFuture ... done [18:41:53.431] - relayed: [n=2] TRUE, FALSE [18:41:53.431] - queued futures: [n=2] TRUE, FALSE [18:41:53.431] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:53.432] length: 1 (resolved future 1) [18:41:53.432] Future #2 [18:41:53.432] result() for ClusterFuture ... [18:41:53.432] - result already collected: FutureResult [18:41:53.432] result() for ClusterFuture ... done [18:41:53.433] result() for ClusterFuture ... [18:41:53.433] - result already collected: FutureResult [18:41:53.433] result() for ClusterFuture ... done [18:41:53.433] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:53.433] - nx: 2 [18:41:53.433] - relay: TRUE [18:41:53.434] - stdout: TRUE [18:41:53.434] - signal: TRUE [18:41:53.434] - resignal: FALSE [18:41:53.434] - force: TRUE [18:41:53.434] - relayed: [n=2] TRUE, FALSE [18:41:53.435] - queued futures: [n=2] TRUE, FALSE [18:41:53.435] - until=2 [18:41:53.435] - relaying element #2 [18:41:53.435] result() for ClusterFuture ... [18:41:53.435] - result already collected: FutureResult [18:41:53.435] result() for ClusterFuture ... done [18:41:53.436] result() for ClusterFuture ... [18:41:53.436] - result already collected: FutureResult [18:41:53.436] result() for ClusterFuture ... done [18:41:53.436] result() for ClusterFuture ... [18:41:53.436] - result already collected: FutureResult [18:41:53.437] result() for ClusterFuture ... done [18:41:53.437] result() for ClusterFuture ... [18:41:53.437] - result already collected: FutureResult [18:41:53.437] result() for ClusterFuture ... done [18:41:53.437] - relayed: [n=2] TRUE, TRUE [18:41:53.437] - queued futures: [n=2] TRUE, TRUE [18:41:53.438] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:53.438] length: 0 (resolved future 2) [18:41:53.438] Relaying remaining futures [18:41:53.438] signalConditionsASAP(NULL, pos=0) ... [18:41:53.438] - nx: 2 [18:41:53.439] - relay: TRUE [18:41:53.439] - stdout: TRUE [18:41:53.439] - signal: TRUE [18:41:53.439] - resignal: FALSE [18:41:53.439] - force: TRUE [18:41:53.439] - relayed: [n=2] TRUE, TRUE [18:41:53.440] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:53.440] - relayed: [n=2] TRUE, TRUE [18:41:53.440] - queued futures: [n=2] TRUE, TRUE [18:41:53.440] signalConditionsASAP(NULL, pos=0) ... done [18:41:53.440] resolve() on list ... DONE [18:41:53.441] result() for ClusterFuture ... [18:41:53.441] - result already collected: FutureResult [18:41:53.441] result() for ClusterFuture ... done [18:41:53.441] result() for ClusterFuture ... [18:41:53.441] - result already collected: FutureResult [18:41:53.441] result() for ClusterFuture ... done [18:41:53.442] result() for ClusterFuture ... [18:41:53.442] - result already collected: FutureResult [18:41:53.442] result() for ClusterFuture ... done [18:41:53.442] result() for ClusterFuture ... [18:41:53.442] - result already collected: FutureResult [18:41:53.443] result() for ClusterFuture ... done [18:41:53.443] - Number of value chunks collected: 2 [18:41:53.443] Resolving 2 futures (chunks) ... DONE [18:41:53.443] Reducing values from 2 chunks ... [18:41:53.443] - Number of values collected after concatenation: 3 [18:41:53.444] - Number of values expected: 3 [18:41:53.444] Reducing values from 2 chunks ... DONE [18:41:53.444] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:53.445] future_lapply() ... [18:41:53.449] Number of chunks: 2 [18:41:53.449] getGlobalsAndPackagesXApply() ... [18:41:53.449] - future.globals: TRUE [18:41:53.449] getGlobalsAndPackages() ... [18:41:53.450] Searching for globals... [18:41:53.451] - globals found: [2] 'FUN', 'UseMethod' [18:41:53.451] Searching for globals ... DONE [18:41:53.451] Resolving globals: FALSE [18:41:53.452] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:53.453] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:53.453] - globals: [1] 'FUN' [18:41:53.453] [18:41:53.453] getGlobalsAndPackages() ... DONE [18:41:53.453] - globals found/used: [n=1] 'FUN' [18:41:53.454] - needed namespaces: [n=0] [18:41:53.454] Finding globals ... DONE [18:41:53.454] - use_args: TRUE [18:41:53.454] - Getting '...' globals ... [18:41:53.455] resolve() on list ... [18:41:53.455] recursive: 0 [18:41:53.455] length: 1 [18:41:53.455] elements: '...' [18:41:53.455] length: 0 (resolved future 1) [18:41:53.456] resolve() on list ... DONE [18:41:53.456] - '...' content: [n=0] [18:41:53.456] List of 1 [18:41:53.456] $ ...: list() [18:41:53.456] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.456] - attr(*, "where")=List of 1 [18:41:53.456] ..$ ...: [18:41:53.456] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.456] - attr(*, "resolved")= logi TRUE [18:41:53.456] - attr(*, "total_size")= num NA [18:41:53.459] - Getting '...' globals ... DONE [18:41:53.460] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.460] List of 2 [18:41:53.460] $ ...future.FUN:function (x, ...) [18:41:53.460] $ ... : list() [18:41:53.460] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.460] - attr(*, "where")=List of 2 [18:41:53.460] ..$ ...future.FUN: [18:41:53.460] ..$ ... : [18:41:53.460] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.460] - attr(*, "resolved")= logi FALSE [18:41:53.460] - attr(*, "total_size")= int 5028 [18:41:53.464] Packages to be attached in all futures: [n=0] [18:41:53.464] getGlobalsAndPackagesXApply() ... DONE [18:41:53.464] Number of futures (= number of chunks): 2 [18:41:53.464] Launching 2 futures (chunks) ... [18:41:53.465] Chunk #1 of 2 ... [18:41:53.465] - Finding globals in 'X' for chunk #1 ... [18:41:53.465] getGlobalsAndPackages() ... [18:41:53.465] Searching for globals... [18:41:53.466] [18:41:53.466] Searching for globals ... DONE [18:41:53.466] - globals: [0] [18:41:53.466] getGlobalsAndPackages() ... DONE [18:41:53.466] + additional globals found: [n=0] [18:41:53.466] + additional namespaces needed: [n=0] [18:41:53.467] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.467] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.467] - seeds: [18:41:53.467] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.467] getGlobalsAndPackages() ... [18:41:53.468] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.468] Resolving globals: FALSE [18:41:53.468] Tweak future expression to call with '...' arguments ... [18:41:53.468] { [18:41:53.468] do.call(function(...) { [18:41:53.468] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.468] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.468] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.468] on.exit(options(oopts), add = TRUE) [18:41:53.468] } [18:41:53.468] { [18:41:53.468] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.468] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.468] ...future.FUN(...future.X_jj, ...) [18:41:53.468] }) [18:41:53.468] } [18:41:53.468] }, args = future.call.arguments) [18:41:53.468] } [18:41:53.469] Tweak future expression to call with '...' arguments ... DONE [18:41:53.469] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.470] [18:41:53.470] getGlobalsAndPackages() ... DONE [18:41:53.470] run() for 'Future' ... [18:41:53.474] - state: 'created' [18:41:53.475] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.494] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.495] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.495] - Field: 'node' [18:41:53.495] - Field: 'label' [18:41:53.495] - Field: 'local' [18:41:53.495] - Field: 'owner' [18:41:53.496] - Field: 'envir' [18:41:53.496] - Field: 'workers' [18:41:53.496] - Field: 'packages' [18:41:53.496] - Field: 'gc' [18:41:53.496] - Field: 'conditions' [18:41:53.497] - Field: 'persistent' [18:41:53.497] - Field: 'expr' [18:41:53.497] - Field: 'uuid' [18:41:53.497] - Field: 'seed' [18:41:53.497] - Field: 'version' [18:41:53.498] - Field: 'result' [18:41:53.498] - Field: 'asynchronous' [18:41:53.498] - Field: 'calls' [18:41:53.498] - Field: 'globals' [18:41:53.498] - Field: 'stdout' [18:41:53.499] - Field: 'earlySignal' [18:41:53.499] - Field: 'lazy' [18:41:53.499] - Field: 'state' [18:41:53.499] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.499] - Launch lazy future ... [18:41:53.500] Packages needed by the future expression (n = 0): [18:41:53.500] Packages needed by future strategies (n = 0): [18:41:53.501] { [18:41:53.501] { [18:41:53.501] { [18:41:53.501] ...future.startTime <- base::Sys.time() [18:41:53.501] { [18:41:53.501] { [18:41:53.501] { [18:41:53.501] { [18:41:53.501] base::local({ [18:41:53.501] has_future <- base::requireNamespace("future", [18:41:53.501] quietly = TRUE) [18:41:53.501] if (has_future) { [18:41:53.501] ns <- base::getNamespace("future") [18:41:53.501] version <- ns[[".package"]][["version"]] [18:41:53.501] if (is.null(version)) [18:41:53.501] version <- utils::packageVersion("future") [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] version <- NULL [18:41:53.501] } [18:41:53.501] if (!has_future || version < "1.8.0") { [18:41:53.501] info <- base::c(r_version = base::gsub("R version ", [18:41:53.501] "", base::R.version$version.string), [18:41:53.501] platform = base::sprintf("%s (%s-bit)", [18:41:53.501] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.501] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.501] "release", "version")], collapse = " "), [18:41:53.501] hostname = base::Sys.info()[["nodename"]]) [18:41:53.501] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.501] info) [18:41:53.501] info <- base::paste(info, collapse = "; ") [18:41:53.501] if (!has_future) { [18:41:53.501] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.501] info) [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.501] info, version) [18:41:53.501] } [18:41:53.501] base::stop(msg) [18:41:53.501] } [18:41:53.501] }) [18:41:53.501] } [18:41:53.501] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.501] base::options(mc.cores = 1L) [18:41:53.501] } [18:41:53.501] ...future.strategy.old <- future::plan("list") [18:41:53.501] options(future.plan = NULL) [18:41:53.501] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.501] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.501] } [18:41:53.501] ...future.workdir <- getwd() [18:41:53.501] } [18:41:53.501] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.501] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.501] } [18:41:53.501] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.501] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.501] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.501] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.501] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.501] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.501] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.501] base::names(...future.oldOptions)) [18:41:53.501] } [18:41:53.501] if (FALSE) { [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] if (TRUE) { [18:41:53.501] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.501] open = "w") [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.501] windows = "NUL", "/dev/null"), open = "w") [18:41:53.501] } [18:41:53.501] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.501] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.501] base::sink(type = "output", split = FALSE) [18:41:53.501] base::close(...future.stdout) [18:41:53.501] }, add = TRUE) [18:41:53.501] } [18:41:53.501] ...future.frame <- base::sys.nframe() [18:41:53.501] ...future.conditions <- base::list() [18:41:53.501] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.501] if (FALSE) { [18:41:53.501] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.501] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.501] } [18:41:53.501] ...future.result <- base::tryCatch({ [18:41:53.501] base::withCallingHandlers({ [18:41:53.501] ...future.value <- base::withVisible(base::local({ [18:41:53.501] ...future.makeSendCondition <- base::local({ [18:41:53.501] sendCondition <- NULL [18:41:53.501] function(frame = 1L) { [18:41:53.501] if (is.function(sendCondition)) [18:41:53.501] return(sendCondition) [18:41:53.501] ns <- getNamespace("parallel") [18:41:53.501] if (exists("sendData", mode = "function", [18:41:53.501] envir = ns)) { [18:41:53.501] parallel_sendData <- get("sendData", mode = "function", [18:41:53.501] envir = ns) [18:41:53.501] envir <- sys.frame(frame) [18:41:53.501] master <- NULL [18:41:53.501] while (!identical(envir, .GlobalEnv) && [18:41:53.501] !identical(envir, emptyenv())) { [18:41:53.501] if (exists("master", mode = "list", envir = envir, [18:41:53.501] inherits = FALSE)) { [18:41:53.501] master <- get("master", mode = "list", [18:41:53.501] envir = envir, inherits = FALSE) [18:41:53.501] if (inherits(master, c("SOCKnode", [18:41:53.501] "SOCK0node"))) { [18:41:53.501] sendCondition <<- function(cond) { [18:41:53.501] data <- list(type = "VALUE", value = cond, [18:41:53.501] success = TRUE) [18:41:53.501] parallel_sendData(master, data) [18:41:53.501] } [18:41:53.501] return(sendCondition) [18:41:53.501] } [18:41:53.501] } [18:41:53.501] frame <- frame + 1L [18:41:53.501] envir <- sys.frame(frame) [18:41:53.501] } [18:41:53.501] } [18:41:53.501] sendCondition <<- function(cond) NULL [18:41:53.501] } [18:41:53.501] }) [18:41:53.501] withCallingHandlers({ [18:41:53.501] { [18:41:53.501] do.call(function(...) { [18:41:53.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.501] if (!identical(...future.globals.maxSize.org, [18:41:53.501] ...future.globals.maxSize)) { [18:41:53.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.501] on.exit(options(oopts), add = TRUE) [18:41:53.501] } [18:41:53.501] { [18:41:53.501] lapply(seq_along(...future.elements_ii), [18:41:53.501] FUN = function(jj) { [18:41:53.501] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.501] ...future.FUN(...future.X_jj, ...) [18:41:53.501] }) [18:41:53.501] } [18:41:53.501] }, args = future.call.arguments) [18:41:53.501] } [18:41:53.501] }, immediateCondition = function(cond) { [18:41:53.501] sendCondition <- ...future.makeSendCondition() [18:41:53.501] sendCondition(cond) [18:41:53.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.501] { [18:41:53.501] inherits <- base::inherits [18:41:53.501] invokeRestart <- base::invokeRestart [18:41:53.501] is.null <- base::is.null [18:41:53.501] muffled <- FALSE [18:41:53.501] if (inherits(cond, "message")) { [18:41:53.501] muffled <- grepl(pattern, "muffleMessage") [18:41:53.501] if (muffled) [18:41:53.501] invokeRestart("muffleMessage") [18:41:53.501] } [18:41:53.501] else if (inherits(cond, "warning")) { [18:41:53.501] muffled <- grepl(pattern, "muffleWarning") [18:41:53.501] if (muffled) [18:41:53.501] invokeRestart("muffleWarning") [18:41:53.501] } [18:41:53.501] else if (inherits(cond, "condition")) { [18:41:53.501] if (!is.null(pattern)) { [18:41:53.501] computeRestarts <- base::computeRestarts [18:41:53.501] grepl <- base::grepl [18:41:53.501] restarts <- computeRestarts(cond) [18:41:53.501] for (restart in restarts) { [18:41:53.501] name <- restart$name [18:41:53.501] if (is.null(name)) [18:41:53.501] next [18:41:53.501] if (!grepl(pattern, name)) [18:41:53.501] next [18:41:53.501] invokeRestart(restart) [18:41:53.501] muffled <- TRUE [18:41:53.501] break [18:41:53.501] } [18:41:53.501] } [18:41:53.501] } [18:41:53.501] invisible(muffled) [18:41:53.501] } [18:41:53.501] muffleCondition(cond) [18:41:53.501] }) [18:41:53.501] })) [18:41:53.501] future::FutureResult(value = ...future.value$value, [18:41:53.501] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.501] ...future.rng), globalenv = if (FALSE) [18:41:53.501] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.501] ...future.globalenv.names)) [18:41:53.501] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.501] }, condition = base::local({ [18:41:53.501] c <- base::c [18:41:53.501] inherits <- base::inherits [18:41:53.501] invokeRestart <- base::invokeRestart [18:41:53.501] length <- base::length [18:41:53.501] list <- base::list [18:41:53.501] seq.int <- base::seq.int [18:41:53.501] signalCondition <- base::signalCondition [18:41:53.501] sys.calls <- base::sys.calls [18:41:53.501] `[[` <- base::`[[` [18:41:53.501] `+` <- base::`+` [18:41:53.501] `<<-` <- base::`<<-` [18:41:53.501] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.501] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.501] 3L)] [18:41:53.501] } [18:41:53.501] function(cond) { [18:41:53.501] is_error <- inherits(cond, "error") [18:41:53.501] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.501] NULL) [18:41:53.501] if (is_error) { [18:41:53.501] sessionInformation <- function() { [18:41:53.501] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.501] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.501] search = base::search(), system = base::Sys.info()) [18:41:53.501] } [18:41:53.501] ...future.conditions[[length(...future.conditions) + [18:41:53.501] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.501] cond$call), session = sessionInformation(), [18:41:53.501] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.501] signalCondition(cond) [18:41:53.501] } [18:41:53.501] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.501] "immediateCondition"))) { [18:41:53.501] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.501] ...future.conditions[[length(...future.conditions) + [18:41:53.501] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.501] if (TRUE && !signal) { [18:41:53.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.501] { [18:41:53.501] inherits <- base::inherits [18:41:53.501] invokeRestart <- base::invokeRestart [18:41:53.501] is.null <- base::is.null [18:41:53.501] muffled <- FALSE [18:41:53.501] if (inherits(cond, "message")) { [18:41:53.501] muffled <- grepl(pattern, "muffleMessage") [18:41:53.501] if (muffled) [18:41:53.501] invokeRestart("muffleMessage") [18:41:53.501] } [18:41:53.501] else if (inherits(cond, "warning")) { [18:41:53.501] muffled <- grepl(pattern, "muffleWarning") [18:41:53.501] if (muffled) [18:41:53.501] invokeRestart("muffleWarning") [18:41:53.501] } [18:41:53.501] else if (inherits(cond, "condition")) { [18:41:53.501] if (!is.null(pattern)) { [18:41:53.501] computeRestarts <- base::computeRestarts [18:41:53.501] grepl <- base::grepl [18:41:53.501] restarts <- computeRestarts(cond) [18:41:53.501] for (restart in restarts) { [18:41:53.501] name <- restart$name [18:41:53.501] if (is.null(name)) [18:41:53.501] next [18:41:53.501] if (!grepl(pattern, name)) [18:41:53.501] next [18:41:53.501] invokeRestart(restart) [18:41:53.501] muffled <- TRUE [18:41:53.501] break [18:41:53.501] } [18:41:53.501] } [18:41:53.501] } [18:41:53.501] invisible(muffled) [18:41:53.501] } [18:41:53.501] muffleCondition(cond, pattern = "^muffle") [18:41:53.501] } [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] if (TRUE) { [18:41:53.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.501] { [18:41:53.501] inherits <- base::inherits [18:41:53.501] invokeRestart <- base::invokeRestart [18:41:53.501] is.null <- base::is.null [18:41:53.501] muffled <- FALSE [18:41:53.501] if (inherits(cond, "message")) { [18:41:53.501] muffled <- grepl(pattern, "muffleMessage") [18:41:53.501] if (muffled) [18:41:53.501] invokeRestart("muffleMessage") [18:41:53.501] } [18:41:53.501] else if (inherits(cond, "warning")) { [18:41:53.501] muffled <- grepl(pattern, "muffleWarning") [18:41:53.501] if (muffled) [18:41:53.501] invokeRestart("muffleWarning") [18:41:53.501] } [18:41:53.501] else if (inherits(cond, "condition")) { [18:41:53.501] if (!is.null(pattern)) { [18:41:53.501] computeRestarts <- base::computeRestarts [18:41:53.501] grepl <- base::grepl [18:41:53.501] restarts <- computeRestarts(cond) [18:41:53.501] for (restart in restarts) { [18:41:53.501] name <- restart$name [18:41:53.501] if (is.null(name)) [18:41:53.501] next [18:41:53.501] if (!grepl(pattern, name)) [18:41:53.501] next [18:41:53.501] invokeRestart(restart) [18:41:53.501] muffled <- TRUE [18:41:53.501] break [18:41:53.501] } [18:41:53.501] } [18:41:53.501] } [18:41:53.501] invisible(muffled) [18:41:53.501] } [18:41:53.501] muffleCondition(cond, pattern = "^muffle") [18:41:53.501] } [18:41:53.501] } [18:41:53.501] } [18:41:53.501] })) [18:41:53.501] }, error = function(ex) { [18:41:53.501] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.501] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.501] ...future.rng), started = ...future.startTime, [18:41:53.501] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.501] version = "1.8"), class = "FutureResult") [18:41:53.501] }, finally = { [18:41:53.501] if (!identical(...future.workdir, getwd())) [18:41:53.501] setwd(...future.workdir) [18:41:53.501] { [18:41:53.501] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.501] ...future.oldOptions$nwarnings <- NULL [18:41:53.501] } [18:41:53.501] base::options(...future.oldOptions) [18:41:53.501] if (.Platform$OS.type == "windows") { [18:41:53.501] old_names <- names(...future.oldEnvVars) [18:41:53.501] envs <- base::Sys.getenv() [18:41:53.501] names <- names(envs) [18:41:53.501] common <- intersect(names, old_names) [18:41:53.501] added <- setdiff(names, old_names) [18:41:53.501] removed <- setdiff(old_names, names) [18:41:53.501] changed <- common[...future.oldEnvVars[common] != [18:41:53.501] envs[common]] [18:41:53.501] NAMES <- toupper(changed) [18:41:53.501] args <- list() [18:41:53.501] for (kk in seq_along(NAMES)) { [18:41:53.501] name <- changed[[kk]] [18:41:53.501] NAME <- NAMES[[kk]] [18:41:53.501] if (name != NAME && is.element(NAME, old_names)) [18:41:53.501] next [18:41:53.501] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.501] } [18:41:53.501] NAMES <- toupper(added) [18:41:53.501] for (kk in seq_along(NAMES)) { [18:41:53.501] name <- added[[kk]] [18:41:53.501] NAME <- NAMES[[kk]] [18:41:53.501] if (name != NAME && is.element(NAME, old_names)) [18:41:53.501] next [18:41:53.501] args[[name]] <- "" [18:41:53.501] } [18:41:53.501] NAMES <- toupper(removed) [18:41:53.501] for (kk in seq_along(NAMES)) { [18:41:53.501] name <- removed[[kk]] [18:41:53.501] NAME <- NAMES[[kk]] [18:41:53.501] if (name != NAME && is.element(NAME, old_names)) [18:41:53.501] next [18:41:53.501] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.501] } [18:41:53.501] if (length(args) > 0) [18:41:53.501] base::do.call(base::Sys.setenv, args = args) [18:41:53.501] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.501] } [18:41:53.501] { [18:41:53.501] if (base::length(...future.futureOptionsAdded) > [18:41:53.501] 0L) { [18:41:53.501] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.501] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.501] base::options(opts) [18:41:53.501] } [18:41:53.501] { [18:41:53.501] { [18:41:53.501] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.501] NULL [18:41:53.501] } [18:41:53.501] options(future.plan = NULL) [18:41:53.501] if (is.na(NA_character_)) [18:41:53.501] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.501] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.501] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.501] .init = FALSE) [18:41:53.501] } [18:41:53.501] } [18:41:53.501] } [18:41:53.501] }) [18:41:53.501] if (TRUE) { [18:41:53.501] base::sink(type = "output", split = FALSE) [18:41:53.501] if (TRUE) { [18:41:53.501] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.501] } [18:41:53.501] else { [18:41:53.501] ...future.result["stdout"] <- base::list(NULL) [18:41:53.501] } [18:41:53.501] base::close(...future.stdout) [18:41:53.501] ...future.stdout <- NULL [18:41:53.501] } [18:41:53.501] ...future.result$conditions <- ...future.conditions [18:41:53.501] ...future.result$finished <- base::Sys.time() [18:41:53.501] ...future.result [18:41:53.501] } [18:41:53.507] Exporting 5 global objects (940 bytes) to cluster node #1 ... [18:41:53.507] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:53.508] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:53.508] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.508] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.508] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.509] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.509] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.510] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.510] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.510] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.510] Exporting 5 global objects (940 bytes) to cluster node #1 ... DONE [18:41:53.511] MultisessionFuture started [18:41:53.511] - Launch lazy future ... done [18:41:53.512] run() for 'MultisessionFuture' ... done [18:41:53.512] Created future: [18:41:53.524] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.525] - Validating connection of MultisessionFuture [18:41:53.525] - received message: FutureResult [18:41:53.525] - Received FutureResult [18:41:53.526] - Erased future from FutureRegistry [18:41:53.526] result() for ClusterFuture ... [18:41:53.526] - result already collected: FutureResult [18:41:53.526] result() for ClusterFuture ... done [18:41:53.526] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.512] MultisessionFuture: [18:41:53.512] Label: 'future_sapply-1' [18:41:53.512] Expression: [18:41:53.512] { [18:41:53.512] do.call(function(...) { [18:41:53.512] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.512] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.512] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.512] on.exit(options(oopts), add = TRUE) [18:41:53.512] } [18:41:53.512] { [18:41:53.512] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.512] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.512] ...future.FUN(...future.X_jj, ...) [18:41:53.512] }) [18:41:53.512] } [18:41:53.512] }, args = future.call.arguments) [18:41:53.512] } [18:41:53.512] Lazy evaluation: FALSE [18:41:53.512] Asynchronous evaluation: TRUE [18:41:53.512] Local evaluation: TRUE [18:41:53.512] Environment: R_GlobalEnv [18:41:53.512] Capture standard output: TRUE [18:41:53.512] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.512] Globals: 5 objects totaling 477 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.512] Packages: [18:41:53.512] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.512] Resolved: TRUE [18:41:53.512] Value: [18:41:53.512] Conditions captured: [18:41:53.512] Early signaling: FALSE [18:41:53.512] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.512] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.527] Chunk #1 of 2 ... DONE [18:41:53.527] Chunk #2 of 2 ... [18:41:53.527] - Finding globals in 'X' for chunk #2 ... [18:41:53.528] getGlobalsAndPackages() ... [18:41:53.528] Searching for globals... [18:41:53.528] [18:41:53.528] Searching for globals ... DONE [18:41:53.528] - globals: [0] [18:41:53.529] getGlobalsAndPackages() ... DONE [18:41:53.529] + additional globals found: [n=0] [18:41:53.529] + additional namespaces needed: [n=0] [18:41:53.529] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.529] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.530] - seeds: [18:41:53.530] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.530] getGlobalsAndPackages() ... [18:41:53.530] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.530] Resolving globals: FALSE [18:41:53.531] Tweak future expression to call with '...' arguments ... [18:41:53.531] { [18:41:53.531] do.call(function(...) { [18:41:53.531] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.531] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.531] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.531] on.exit(options(oopts), add = TRUE) [18:41:53.531] } [18:41:53.531] { [18:41:53.531] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.531] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.531] ...future.FUN(...future.X_jj, ...) [18:41:53.531] }) [18:41:53.531] } [18:41:53.531] }, args = future.call.arguments) [18:41:53.531] } [18:41:53.531] Tweak future expression to call with '...' arguments ... DONE [18:41:53.532] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.532] [18:41:53.532] getGlobalsAndPackages() ... DONE [18:41:53.533] run() for 'Future' ... [18:41:53.533] - state: 'created' [18:41:53.533] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.551] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.552] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.552] - Field: 'node' [18:41:53.552] - Field: 'label' [18:41:53.552] - Field: 'local' [18:41:53.552] - Field: 'owner' [18:41:53.553] - Field: 'envir' [18:41:53.553] - Field: 'workers' [18:41:53.553] - Field: 'packages' [18:41:53.553] - Field: 'gc' [18:41:53.553] - Field: 'conditions' [18:41:53.554] - Field: 'persistent' [18:41:53.554] - Field: 'expr' [18:41:53.554] - Field: 'uuid' [18:41:53.554] - Field: 'seed' [18:41:53.554] - Field: 'version' [18:41:53.555] - Field: 'result' [18:41:53.555] - Field: 'asynchronous' [18:41:53.555] - Field: 'calls' [18:41:53.555] - Field: 'globals' [18:41:53.555] - Field: 'stdout' [18:41:53.555] - Field: 'earlySignal' [18:41:53.556] - Field: 'lazy' [18:41:53.556] - Field: 'state' [18:41:53.556] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.556] - Launch lazy future ... [18:41:53.557] Packages needed by the future expression (n = 0): [18:41:53.557] Packages needed by future strategies (n = 0): [18:41:53.557] { [18:41:53.557] { [18:41:53.557] { [18:41:53.557] ...future.startTime <- base::Sys.time() [18:41:53.557] { [18:41:53.557] { [18:41:53.557] { [18:41:53.557] { [18:41:53.557] base::local({ [18:41:53.557] has_future <- base::requireNamespace("future", [18:41:53.557] quietly = TRUE) [18:41:53.557] if (has_future) { [18:41:53.557] ns <- base::getNamespace("future") [18:41:53.557] version <- ns[[".package"]][["version"]] [18:41:53.557] if (is.null(version)) [18:41:53.557] version <- utils::packageVersion("future") [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] version <- NULL [18:41:53.557] } [18:41:53.557] if (!has_future || version < "1.8.0") { [18:41:53.557] info <- base::c(r_version = base::gsub("R version ", [18:41:53.557] "", base::R.version$version.string), [18:41:53.557] platform = base::sprintf("%s (%s-bit)", [18:41:53.557] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.557] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.557] "release", "version")], collapse = " "), [18:41:53.557] hostname = base::Sys.info()[["nodename"]]) [18:41:53.557] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.557] info) [18:41:53.557] info <- base::paste(info, collapse = "; ") [18:41:53.557] if (!has_future) { [18:41:53.557] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.557] info) [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.557] info, version) [18:41:53.557] } [18:41:53.557] base::stop(msg) [18:41:53.557] } [18:41:53.557] }) [18:41:53.557] } [18:41:53.557] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.557] base::options(mc.cores = 1L) [18:41:53.557] } [18:41:53.557] ...future.strategy.old <- future::plan("list") [18:41:53.557] options(future.plan = NULL) [18:41:53.557] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.557] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.557] } [18:41:53.557] ...future.workdir <- getwd() [18:41:53.557] } [18:41:53.557] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.557] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.557] } [18:41:53.557] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.557] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.557] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.557] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.557] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.557] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.557] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.557] base::names(...future.oldOptions)) [18:41:53.557] } [18:41:53.557] if (FALSE) { [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] if (TRUE) { [18:41:53.557] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.557] open = "w") [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.557] windows = "NUL", "/dev/null"), open = "w") [18:41:53.557] } [18:41:53.557] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.557] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.557] base::sink(type = "output", split = FALSE) [18:41:53.557] base::close(...future.stdout) [18:41:53.557] }, add = TRUE) [18:41:53.557] } [18:41:53.557] ...future.frame <- base::sys.nframe() [18:41:53.557] ...future.conditions <- base::list() [18:41:53.557] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.557] if (FALSE) { [18:41:53.557] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.557] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.557] } [18:41:53.557] ...future.result <- base::tryCatch({ [18:41:53.557] base::withCallingHandlers({ [18:41:53.557] ...future.value <- base::withVisible(base::local({ [18:41:53.557] ...future.makeSendCondition <- base::local({ [18:41:53.557] sendCondition <- NULL [18:41:53.557] function(frame = 1L) { [18:41:53.557] if (is.function(sendCondition)) [18:41:53.557] return(sendCondition) [18:41:53.557] ns <- getNamespace("parallel") [18:41:53.557] if (exists("sendData", mode = "function", [18:41:53.557] envir = ns)) { [18:41:53.557] parallel_sendData <- get("sendData", mode = "function", [18:41:53.557] envir = ns) [18:41:53.557] envir <- sys.frame(frame) [18:41:53.557] master <- NULL [18:41:53.557] while (!identical(envir, .GlobalEnv) && [18:41:53.557] !identical(envir, emptyenv())) { [18:41:53.557] if (exists("master", mode = "list", envir = envir, [18:41:53.557] inherits = FALSE)) { [18:41:53.557] master <- get("master", mode = "list", [18:41:53.557] envir = envir, inherits = FALSE) [18:41:53.557] if (inherits(master, c("SOCKnode", [18:41:53.557] "SOCK0node"))) { [18:41:53.557] sendCondition <<- function(cond) { [18:41:53.557] data <- list(type = "VALUE", value = cond, [18:41:53.557] success = TRUE) [18:41:53.557] parallel_sendData(master, data) [18:41:53.557] } [18:41:53.557] return(sendCondition) [18:41:53.557] } [18:41:53.557] } [18:41:53.557] frame <- frame + 1L [18:41:53.557] envir <- sys.frame(frame) [18:41:53.557] } [18:41:53.557] } [18:41:53.557] sendCondition <<- function(cond) NULL [18:41:53.557] } [18:41:53.557] }) [18:41:53.557] withCallingHandlers({ [18:41:53.557] { [18:41:53.557] do.call(function(...) { [18:41:53.557] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.557] if (!identical(...future.globals.maxSize.org, [18:41:53.557] ...future.globals.maxSize)) { [18:41:53.557] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.557] on.exit(options(oopts), add = TRUE) [18:41:53.557] } [18:41:53.557] { [18:41:53.557] lapply(seq_along(...future.elements_ii), [18:41:53.557] FUN = function(jj) { [18:41:53.557] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.557] ...future.FUN(...future.X_jj, ...) [18:41:53.557] }) [18:41:53.557] } [18:41:53.557] }, args = future.call.arguments) [18:41:53.557] } [18:41:53.557] }, immediateCondition = function(cond) { [18:41:53.557] sendCondition <- ...future.makeSendCondition() [18:41:53.557] sendCondition(cond) [18:41:53.557] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.557] { [18:41:53.557] inherits <- base::inherits [18:41:53.557] invokeRestart <- base::invokeRestart [18:41:53.557] is.null <- base::is.null [18:41:53.557] muffled <- FALSE [18:41:53.557] if (inherits(cond, "message")) { [18:41:53.557] muffled <- grepl(pattern, "muffleMessage") [18:41:53.557] if (muffled) [18:41:53.557] invokeRestart("muffleMessage") [18:41:53.557] } [18:41:53.557] else if (inherits(cond, "warning")) { [18:41:53.557] muffled <- grepl(pattern, "muffleWarning") [18:41:53.557] if (muffled) [18:41:53.557] invokeRestart("muffleWarning") [18:41:53.557] } [18:41:53.557] else if (inherits(cond, "condition")) { [18:41:53.557] if (!is.null(pattern)) { [18:41:53.557] computeRestarts <- base::computeRestarts [18:41:53.557] grepl <- base::grepl [18:41:53.557] restarts <- computeRestarts(cond) [18:41:53.557] for (restart in restarts) { [18:41:53.557] name <- restart$name [18:41:53.557] if (is.null(name)) [18:41:53.557] next [18:41:53.557] if (!grepl(pattern, name)) [18:41:53.557] next [18:41:53.557] invokeRestart(restart) [18:41:53.557] muffled <- TRUE [18:41:53.557] break [18:41:53.557] } [18:41:53.557] } [18:41:53.557] } [18:41:53.557] invisible(muffled) [18:41:53.557] } [18:41:53.557] muffleCondition(cond) [18:41:53.557] }) [18:41:53.557] })) [18:41:53.557] future::FutureResult(value = ...future.value$value, [18:41:53.557] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.557] ...future.rng), globalenv = if (FALSE) [18:41:53.557] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.557] ...future.globalenv.names)) [18:41:53.557] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.557] }, condition = base::local({ [18:41:53.557] c <- base::c [18:41:53.557] inherits <- base::inherits [18:41:53.557] invokeRestart <- base::invokeRestart [18:41:53.557] length <- base::length [18:41:53.557] list <- base::list [18:41:53.557] seq.int <- base::seq.int [18:41:53.557] signalCondition <- base::signalCondition [18:41:53.557] sys.calls <- base::sys.calls [18:41:53.557] `[[` <- base::`[[` [18:41:53.557] `+` <- base::`+` [18:41:53.557] `<<-` <- base::`<<-` [18:41:53.557] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.557] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.557] 3L)] [18:41:53.557] } [18:41:53.557] function(cond) { [18:41:53.557] is_error <- inherits(cond, "error") [18:41:53.557] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.557] NULL) [18:41:53.557] if (is_error) { [18:41:53.557] sessionInformation <- function() { [18:41:53.557] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.557] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.557] search = base::search(), system = base::Sys.info()) [18:41:53.557] } [18:41:53.557] ...future.conditions[[length(...future.conditions) + [18:41:53.557] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.557] cond$call), session = sessionInformation(), [18:41:53.557] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.557] signalCondition(cond) [18:41:53.557] } [18:41:53.557] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.557] "immediateCondition"))) { [18:41:53.557] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.557] ...future.conditions[[length(...future.conditions) + [18:41:53.557] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.557] if (TRUE && !signal) { [18:41:53.557] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.557] { [18:41:53.557] inherits <- base::inherits [18:41:53.557] invokeRestart <- base::invokeRestart [18:41:53.557] is.null <- base::is.null [18:41:53.557] muffled <- FALSE [18:41:53.557] if (inherits(cond, "message")) { [18:41:53.557] muffled <- grepl(pattern, "muffleMessage") [18:41:53.557] if (muffled) [18:41:53.557] invokeRestart("muffleMessage") [18:41:53.557] } [18:41:53.557] else if (inherits(cond, "warning")) { [18:41:53.557] muffled <- grepl(pattern, "muffleWarning") [18:41:53.557] if (muffled) [18:41:53.557] invokeRestart("muffleWarning") [18:41:53.557] } [18:41:53.557] else if (inherits(cond, "condition")) { [18:41:53.557] if (!is.null(pattern)) { [18:41:53.557] computeRestarts <- base::computeRestarts [18:41:53.557] grepl <- base::grepl [18:41:53.557] restarts <- computeRestarts(cond) [18:41:53.557] for (restart in restarts) { [18:41:53.557] name <- restart$name [18:41:53.557] if (is.null(name)) [18:41:53.557] next [18:41:53.557] if (!grepl(pattern, name)) [18:41:53.557] next [18:41:53.557] invokeRestart(restart) [18:41:53.557] muffled <- TRUE [18:41:53.557] break [18:41:53.557] } [18:41:53.557] } [18:41:53.557] } [18:41:53.557] invisible(muffled) [18:41:53.557] } [18:41:53.557] muffleCondition(cond, pattern = "^muffle") [18:41:53.557] } [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] if (TRUE) { [18:41:53.557] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.557] { [18:41:53.557] inherits <- base::inherits [18:41:53.557] invokeRestart <- base::invokeRestart [18:41:53.557] is.null <- base::is.null [18:41:53.557] muffled <- FALSE [18:41:53.557] if (inherits(cond, "message")) { [18:41:53.557] muffled <- grepl(pattern, "muffleMessage") [18:41:53.557] if (muffled) [18:41:53.557] invokeRestart("muffleMessage") [18:41:53.557] } [18:41:53.557] else if (inherits(cond, "warning")) { [18:41:53.557] muffled <- grepl(pattern, "muffleWarning") [18:41:53.557] if (muffled) [18:41:53.557] invokeRestart("muffleWarning") [18:41:53.557] } [18:41:53.557] else if (inherits(cond, "condition")) { [18:41:53.557] if (!is.null(pattern)) { [18:41:53.557] computeRestarts <- base::computeRestarts [18:41:53.557] grepl <- base::grepl [18:41:53.557] restarts <- computeRestarts(cond) [18:41:53.557] for (restart in restarts) { [18:41:53.557] name <- restart$name [18:41:53.557] if (is.null(name)) [18:41:53.557] next [18:41:53.557] if (!grepl(pattern, name)) [18:41:53.557] next [18:41:53.557] invokeRestart(restart) [18:41:53.557] muffled <- TRUE [18:41:53.557] break [18:41:53.557] } [18:41:53.557] } [18:41:53.557] } [18:41:53.557] invisible(muffled) [18:41:53.557] } [18:41:53.557] muffleCondition(cond, pattern = "^muffle") [18:41:53.557] } [18:41:53.557] } [18:41:53.557] } [18:41:53.557] })) [18:41:53.557] }, error = function(ex) { [18:41:53.557] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.557] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.557] ...future.rng), started = ...future.startTime, [18:41:53.557] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.557] version = "1.8"), class = "FutureResult") [18:41:53.557] }, finally = { [18:41:53.557] if (!identical(...future.workdir, getwd())) [18:41:53.557] setwd(...future.workdir) [18:41:53.557] { [18:41:53.557] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.557] ...future.oldOptions$nwarnings <- NULL [18:41:53.557] } [18:41:53.557] base::options(...future.oldOptions) [18:41:53.557] if (.Platform$OS.type == "windows") { [18:41:53.557] old_names <- names(...future.oldEnvVars) [18:41:53.557] envs <- base::Sys.getenv() [18:41:53.557] names <- names(envs) [18:41:53.557] common <- intersect(names, old_names) [18:41:53.557] added <- setdiff(names, old_names) [18:41:53.557] removed <- setdiff(old_names, names) [18:41:53.557] changed <- common[...future.oldEnvVars[common] != [18:41:53.557] envs[common]] [18:41:53.557] NAMES <- toupper(changed) [18:41:53.557] args <- list() [18:41:53.557] for (kk in seq_along(NAMES)) { [18:41:53.557] name <- changed[[kk]] [18:41:53.557] NAME <- NAMES[[kk]] [18:41:53.557] if (name != NAME && is.element(NAME, old_names)) [18:41:53.557] next [18:41:53.557] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.557] } [18:41:53.557] NAMES <- toupper(added) [18:41:53.557] for (kk in seq_along(NAMES)) { [18:41:53.557] name <- added[[kk]] [18:41:53.557] NAME <- NAMES[[kk]] [18:41:53.557] if (name != NAME && is.element(NAME, old_names)) [18:41:53.557] next [18:41:53.557] args[[name]] <- "" [18:41:53.557] } [18:41:53.557] NAMES <- toupper(removed) [18:41:53.557] for (kk in seq_along(NAMES)) { [18:41:53.557] name <- removed[[kk]] [18:41:53.557] NAME <- NAMES[[kk]] [18:41:53.557] if (name != NAME && is.element(NAME, old_names)) [18:41:53.557] next [18:41:53.557] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.557] } [18:41:53.557] if (length(args) > 0) [18:41:53.557] base::do.call(base::Sys.setenv, args = args) [18:41:53.557] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.557] } [18:41:53.557] { [18:41:53.557] if (base::length(...future.futureOptionsAdded) > [18:41:53.557] 0L) { [18:41:53.557] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.557] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.557] base::options(opts) [18:41:53.557] } [18:41:53.557] { [18:41:53.557] { [18:41:53.557] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.557] NULL [18:41:53.557] } [18:41:53.557] options(future.plan = NULL) [18:41:53.557] if (is.na(NA_character_)) [18:41:53.557] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.557] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.557] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.557] .init = FALSE) [18:41:53.557] } [18:41:53.557] } [18:41:53.557] } [18:41:53.557] }) [18:41:53.557] if (TRUE) { [18:41:53.557] base::sink(type = "output", split = FALSE) [18:41:53.557] if (TRUE) { [18:41:53.557] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.557] } [18:41:53.557] else { [18:41:53.557] ...future.result["stdout"] <- base::list(NULL) [18:41:53.557] } [18:41:53.557] base::close(...future.stdout) [18:41:53.557] ...future.stdout <- NULL [18:41:53.557] } [18:41:53.557] ...future.result$conditions <- ...future.conditions [18:41:53.557] ...future.result$finished <- base::Sys.time() [18:41:53.557] ...future.result [18:41:53.557] } [18:41:53.563] Exporting 5 global objects (957 bytes) to cluster node #1 ... [18:41:53.564] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:53.564] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:53.564] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.565] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.565] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:53.565] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:53.566] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.566] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.566] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.567] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.567] Exporting 5 global objects (957 bytes) to cluster node #1 ... DONE [18:41:53.568] MultisessionFuture started [18:41:53.568] - Launch lazy future ... done [18:41:53.569] run() for 'MultisessionFuture' ... done [18:41:53.569] Created future: [18:41:53.582] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.583] - Validating connection of MultisessionFuture [18:41:53.583] - received message: FutureResult [18:41:53.583] - Received FutureResult [18:41:53.583] - Erased future from FutureRegistry [18:41:53.583] result() for ClusterFuture ... [18:41:53.584] - result already collected: FutureResult [18:41:53.584] result() for ClusterFuture ... done [18:41:53.584] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.569] MultisessionFuture: [18:41:53.569] Label: 'future_sapply-2' [18:41:53.569] Expression: [18:41:53.569] { [18:41:53.569] do.call(function(...) { [18:41:53.569] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.569] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.569] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.569] on.exit(options(oopts), add = TRUE) [18:41:53.569] } [18:41:53.569] { [18:41:53.569] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.569] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.569] ...future.FUN(...future.X_jj, ...) [18:41:53.569] }) [18:41:53.569] } [18:41:53.569] }, args = future.call.arguments) [18:41:53.569] } [18:41:53.569] Lazy evaluation: FALSE [18:41:53.569] Asynchronous evaluation: TRUE [18:41:53.569] Local evaluation: TRUE [18:41:53.569] Environment: R_GlobalEnv [18:41:53.569] Capture standard output: TRUE [18:41:53.569] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.569] Globals: 5 objects totaling 494 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.569] Packages: [18:41:53.569] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.569] Resolved: TRUE [18:41:53.569] Value: [18:41:53.569] Conditions captured: [18:41:53.569] Early signaling: FALSE [18:41:53.569] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.569] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.584] Chunk #2 of 2 ... DONE [18:41:53.585] Launching 2 futures (chunks) ... DONE [18:41:53.585] Resolving 2 futures (chunks) ... [18:41:53.585] resolve() on list ... [18:41:53.585] recursive: 0 [18:41:53.585] length: 2 [18:41:53.585] [18:41:53.586] Future #1 [18:41:53.586] result() for ClusterFuture ... [18:41:53.586] - result already collected: FutureResult [18:41:53.586] result() for ClusterFuture ... done [18:41:53.586] result() for ClusterFuture ... [18:41:53.587] - result already collected: FutureResult [18:41:53.587] result() for ClusterFuture ... done [18:41:53.587] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:53.587] - nx: 2 [18:41:53.587] - relay: TRUE [18:41:53.587] - stdout: TRUE [18:41:53.588] - signal: TRUE [18:41:53.588] - resignal: FALSE [18:41:53.588] - force: TRUE [18:41:53.588] - relayed: [n=2] FALSE, FALSE [18:41:53.588] - queued futures: [n=2] FALSE, FALSE [18:41:53.588] - until=1 [18:41:53.589] - relaying element #1 [18:41:53.589] result() for ClusterFuture ... [18:41:53.589] - result already collected: FutureResult [18:41:53.589] result() for ClusterFuture ... done [18:41:53.589] result() for ClusterFuture ... [18:41:53.589] - result already collected: FutureResult [18:41:53.590] result() for ClusterFuture ... done [18:41:53.590] result() for ClusterFuture ... [18:41:53.590] - result already collected: FutureResult [18:41:53.590] result() for ClusterFuture ... done [18:41:53.590] result() for ClusterFuture ... [18:41:53.591] - result already collected: FutureResult [18:41:53.591] result() for ClusterFuture ... done [18:41:53.591] - relayed: [n=2] TRUE, FALSE [18:41:53.591] - queued futures: [n=2] TRUE, FALSE [18:41:53.591] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:53.591] length: 1 (resolved future 1) [18:41:53.592] Future #2 [18:41:53.592] result() for ClusterFuture ... [18:41:53.592] - result already collected: FutureResult [18:41:53.592] result() for ClusterFuture ... done [18:41:53.592] result() for ClusterFuture ... [18:41:53.593] - result already collected: FutureResult [18:41:53.593] result() for ClusterFuture ... done [18:41:53.593] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:53.593] - nx: 2 [18:41:53.593] - relay: TRUE [18:41:53.593] - stdout: TRUE [18:41:53.594] - signal: TRUE [18:41:53.594] - resignal: FALSE [18:41:53.594] - force: TRUE [18:41:53.594] - relayed: [n=2] TRUE, FALSE [18:41:53.594] - queued futures: [n=2] TRUE, FALSE [18:41:53.594] - until=2 [18:41:53.595] - relaying element #2 [18:41:53.595] result() for ClusterFuture ... [18:41:53.595] - result already collected: FutureResult [18:41:53.595] result() for ClusterFuture ... done [18:41:53.595] result() for ClusterFuture ... [18:41:53.595] - result already collected: FutureResult [18:41:53.596] result() for ClusterFuture ... done [18:41:53.596] result() for ClusterFuture ... [18:41:53.596] - result already collected: FutureResult [18:41:53.596] result() for ClusterFuture ... done [18:41:53.596] result() for ClusterFuture ... [18:41:53.596] - result already collected: FutureResult [18:41:53.597] result() for ClusterFuture ... done [18:41:53.597] - relayed: [n=2] TRUE, TRUE [18:41:53.597] - queued futures: [n=2] TRUE, TRUE [18:41:53.597] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:53.597] length: 0 (resolved future 2) [18:41:53.597] Relaying remaining futures [18:41:53.598] signalConditionsASAP(NULL, pos=0) ... [18:41:53.598] - nx: 2 [18:41:53.598] - relay: TRUE [18:41:53.598] - stdout: TRUE [18:41:53.598] - signal: TRUE [18:41:53.598] - resignal: FALSE [18:41:53.599] - force: TRUE [18:41:53.599] - relayed: [n=2] TRUE, TRUE [18:41:53.599] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:53.599] - relayed: [n=2] TRUE, TRUE [18:41:53.599] - queued futures: [n=2] TRUE, TRUE [18:41:53.600] signalConditionsASAP(NULL, pos=0) ... done [18:41:53.600] resolve() on list ... DONE [18:41:53.600] result() for ClusterFuture ... [18:41:53.600] - result already collected: FutureResult [18:41:53.600] result() for ClusterFuture ... done [18:41:53.600] result() for ClusterFuture ... [18:41:53.601] - result already collected: FutureResult [18:41:53.601] result() for ClusterFuture ... done [18:41:53.601] result() for ClusterFuture ... [18:41:53.601] - result already collected: FutureResult [18:41:53.601] result() for ClusterFuture ... done [18:41:53.601] result() for ClusterFuture ... [18:41:53.602] - result already collected: FutureResult [18:41:53.602] result() for ClusterFuture ... done [18:41:53.602] - Number of value chunks collected: 2 [18:41:53.602] Resolving 2 futures (chunks) ... DONE [18:41:53.602] Reducing values from 2 chunks ... [18:41:53.602] - Number of values collected after concatenation: 3 [18:41:53.603] - Number of values expected: 3 [18:41:53.603] Reducing values from 2 chunks ... DONE [18:41:53.603] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:53.604] future_lapply() ... [18:41:53.607] Number of chunks: 2 [18:41:53.607] getGlobalsAndPackagesXApply() ... [18:41:53.608] - future.globals: TRUE [18:41:53.608] getGlobalsAndPackages() ... [18:41:53.608] Searching for globals... [18:41:53.609] - globals found: [1] 'FUN' [18:41:53.609] Searching for globals ... DONE [18:41:53.610] Resolving globals: FALSE [18:41:53.610] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:53.611] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:53.611] - globals: [1] 'FUN' [18:41:53.611] [18:41:53.611] getGlobalsAndPackages() ... DONE [18:41:53.611] - globals found/used: [n=1] 'FUN' [18:41:53.611] - needed namespaces: [n=0] [18:41:53.612] Finding globals ... DONE [18:41:53.612] - use_args: TRUE [18:41:53.612] - Getting '...' globals ... [18:41:53.612] resolve() on list ... [18:41:53.613] recursive: 0 [18:41:53.613] length: 1 [18:41:53.613] elements: '...' [18:41:53.613] length: 0 (resolved future 1) [18:41:53.613] resolve() on list ... DONE [18:41:53.613] - '...' content: [n=0] [18:41:53.614] List of 1 [18:41:53.614] $ ...: list() [18:41:53.614] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.614] - attr(*, "where")=List of 1 [18:41:53.614] ..$ ...: [18:41:53.614] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.614] - attr(*, "resolved")= logi TRUE [18:41:53.614] - attr(*, "total_size")= num NA [18:41:53.617] - Getting '...' globals ... DONE [18:41:53.617] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.617] List of 2 [18:41:53.617] $ ...future.FUN:function (x) [18:41:53.617] $ ... : list() [18:41:53.617] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.617] - attr(*, "where")=List of 2 [18:41:53.617] ..$ ...future.FUN: [18:41:53.617] ..$ ... : [18:41:53.617] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.617] - attr(*, "resolved")= logi FALSE [18:41:53.617] - attr(*, "total_size")= int 4788 [18:41:53.621] Packages to be attached in all futures: [n=0] [18:41:53.621] getGlobalsAndPackagesXApply() ... DONE [18:41:53.621] Number of futures (= number of chunks): 2 [18:41:53.621] Launching 2 futures (chunks) ... [18:41:53.621] Chunk #1 of 2 ... [18:41:53.622] - Finding globals in 'X' for chunk #1 ... [18:41:53.622] getGlobalsAndPackages() ... [18:41:53.622] Searching for globals... [18:41:53.622] [18:41:53.623] Searching for globals ... DONE [18:41:53.623] - globals: [0] [18:41:53.623] getGlobalsAndPackages() ... DONE [18:41:53.623] + additional globals found: [n=0] [18:41:53.623] + additional namespaces needed: [n=0] [18:41:53.623] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.624] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.624] - seeds: [18:41:53.624] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.624] getGlobalsAndPackages() ... [18:41:53.624] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.624] Resolving globals: FALSE [18:41:53.625] Tweak future expression to call with '...' arguments ... [18:41:53.625] { [18:41:53.625] do.call(function(...) { [18:41:53.625] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.625] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.625] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.625] on.exit(options(oopts), add = TRUE) [18:41:53.625] } [18:41:53.625] { [18:41:53.625] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.625] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.625] ...future.FUN(...future.X_jj, ...) [18:41:53.625] }) [18:41:53.625] } [18:41:53.625] }, args = future.call.arguments) [18:41:53.625] } [18:41:53.625] Tweak future expression to call with '...' arguments ... DONE [18:41:53.626] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.626] [18:41:53.626] getGlobalsAndPackages() ... DONE [18:41:53.627] run() for 'Future' ... [18:41:53.627] - state: 'created' [18:41:53.627] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.643] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.643] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.643] - Field: 'node' [18:41:53.644] - Field: 'label' [18:41:53.644] - Field: 'local' [18:41:53.644] - Field: 'owner' [18:41:53.644] - Field: 'envir' [18:41:53.644] - Field: 'workers' [18:41:53.644] - Field: 'packages' [18:41:53.645] - Field: 'gc' [18:41:53.645] - Field: 'conditions' [18:41:53.645] - Field: 'persistent' [18:41:53.645] - Field: 'expr' [18:41:53.645] - Field: 'uuid' [18:41:53.646] - Field: 'seed' [18:41:53.646] - Field: 'version' [18:41:53.646] - Field: 'result' [18:41:53.646] - Field: 'asynchronous' [18:41:53.646] - Field: 'calls' [18:41:53.646] - Field: 'globals' [18:41:53.647] - Field: 'stdout' [18:41:53.647] - Field: 'earlySignal' [18:41:53.647] - Field: 'lazy' [18:41:53.647] - Field: 'state' [18:41:53.647] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.648] - Launch lazy future ... [18:41:53.648] Packages needed by the future expression (n = 0): [18:41:53.648] Packages needed by future strategies (n = 0): [18:41:53.649] { [18:41:53.649] { [18:41:53.649] { [18:41:53.649] ...future.startTime <- base::Sys.time() [18:41:53.649] { [18:41:53.649] { [18:41:53.649] { [18:41:53.649] { [18:41:53.649] base::local({ [18:41:53.649] has_future <- base::requireNamespace("future", [18:41:53.649] quietly = TRUE) [18:41:53.649] if (has_future) { [18:41:53.649] ns <- base::getNamespace("future") [18:41:53.649] version <- ns[[".package"]][["version"]] [18:41:53.649] if (is.null(version)) [18:41:53.649] version <- utils::packageVersion("future") [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] version <- NULL [18:41:53.649] } [18:41:53.649] if (!has_future || version < "1.8.0") { [18:41:53.649] info <- base::c(r_version = base::gsub("R version ", [18:41:53.649] "", base::R.version$version.string), [18:41:53.649] platform = base::sprintf("%s (%s-bit)", [18:41:53.649] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.649] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.649] "release", "version")], collapse = " "), [18:41:53.649] hostname = base::Sys.info()[["nodename"]]) [18:41:53.649] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.649] info) [18:41:53.649] info <- base::paste(info, collapse = "; ") [18:41:53.649] if (!has_future) { [18:41:53.649] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.649] info) [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.649] info, version) [18:41:53.649] } [18:41:53.649] base::stop(msg) [18:41:53.649] } [18:41:53.649] }) [18:41:53.649] } [18:41:53.649] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.649] base::options(mc.cores = 1L) [18:41:53.649] } [18:41:53.649] ...future.strategy.old <- future::plan("list") [18:41:53.649] options(future.plan = NULL) [18:41:53.649] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.649] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.649] } [18:41:53.649] ...future.workdir <- getwd() [18:41:53.649] } [18:41:53.649] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.649] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.649] } [18:41:53.649] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.649] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.649] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.649] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.649] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.649] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.649] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.649] base::names(...future.oldOptions)) [18:41:53.649] } [18:41:53.649] if (FALSE) { [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] if (TRUE) { [18:41:53.649] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.649] open = "w") [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.649] windows = "NUL", "/dev/null"), open = "w") [18:41:53.649] } [18:41:53.649] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.649] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.649] base::sink(type = "output", split = FALSE) [18:41:53.649] base::close(...future.stdout) [18:41:53.649] }, add = TRUE) [18:41:53.649] } [18:41:53.649] ...future.frame <- base::sys.nframe() [18:41:53.649] ...future.conditions <- base::list() [18:41:53.649] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.649] if (FALSE) { [18:41:53.649] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.649] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.649] } [18:41:53.649] ...future.result <- base::tryCatch({ [18:41:53.649] base::withCallingHandlers({ [18:41:53.649] ...future.value <- base::withVisible(base::local({ [18:41:53.649] ...future.makeSendCondition <- base::local({ [18:41:53.649] sendCondition <- NULL [18:41:53.649] function(frame = 1L) { [18:41:53.649] if (is.function(sendCondition)) [18:41:53.649] return(sendCondition) [18:41:53.649] ns <- getNamespace("parallel") [18:41:53.649] if (exists("sendData", mode = "function", [18:41:53.649] envir = ns)) { [18:41:53.649] parallel_sendData <- get("sendData", mode = "function", [18:41:53.649] envir = ns) [18:41:53.649] envir <- sys.frame(frame) [18:41:53.649] master <- NULL [18:41:53.649] while (!identical(envir, .GlobalEnv) && [18:41:53.649] !identical(envir, emptyenv())) { [18:41:53.649] if (exists("master", mode = "list", envir = envir, [18:41:53.649] inherits = FALSE)) { [18:41:53.649] master <- get("master", mode = "list", [18:41:53.649] envir = envir, inherits = FALSE) [18:41:53.649] if (inherits(master, c("SOCKnode", [18:41:53.649] "SOCK0node"))) { [18:41:53.649] sendCondition <<- function(cond) { [18:41:53.649] data <- list(type = "VALUE", value = cond, [18:41:53.649] success = TRUE) [18:41:53.649] parallel_sendData(master, data) [18:41:53.649] } [18:41:53.649] return(sendCondition) [18:41:53.649] } [18:41:53.649] } [18:41:53.649] frame <- frame + 1L [18:41:53.649] envir <- sys.frame(frame) [18:41:53.649] } [18:41:53.649] } [18:41:53.649] sendCondition <<- function(cond) NULL [18:41:53.649] } [18:41:53.649] }) [18:41:53.649] withCallingHandlers({ [18:41:53.649] { [18:41:53.649] do.call(function(...) { [18:41:53.649] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.649] if (!identical(...future.globals.maxSize.org, [18:41:53.649] ...future.globals.maxSize)) { [18:41:53.649] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.649] on.exit(options(oopts), add = TRUE) [18:41:53.649] } [18:41:53.649] { [18:41:53.649] lapply(seq_along(...future.elements_ii), [18:41:53.649] FUN = function(jj) { [18:41:53.649] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.649] ...future.FUN(...future.X_jj, ...) [18:41:53.649] }) [18:41:53.649] } [18:41:53.649] }, args = future.call.arguments) [18:41:53.649] } [18:41:53.649] }, immediateCondition = function(cond) { [18:41:53.649] sendCondition <- ...future.makeSendCondition() [18:41:53.649] sendCondition(cond) [18:41:53.649] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.649] { [18:41:53.649] inherits <- base::inherits [18:41:53.649] invokeRestart <- base::invokeRestart [18:41:53.649] is.null <- base::is.null [18:41:53.649] muffled <- FALSE [18:41:53.649] if (inherits(cond, "message")) { [18:41:53.649] muffled <- grepl(pattern, "muffleMessage") [18:41:53.649] if (muffled) [18:41:53.649] invokeRestart("muffleMessage") [18:41:53.649] } [18:41:53.649] else if (inherits(cond, "warning")) { [18:41:53.649] muffled <- grepl(pattern, "muffleWarning") [18:41:53.649] if (muffled) [18:41:53.649] invokeRestart("muffleWarning") [18:41:53.649] } [18:41:53.649] else if (inherits(cond, "condition")) { [18:41:53.649] if (!is.null(pattern)) { [18:41:53.649] computeRestarts <- base::computeRestarts [18:41:53.649] grepl <- base::grepl [18:41:53.649] restarts <- computeRestarts(cond) [18:41:53.649] for (restart in restarts) { [18:41:53.649] name <- restart$name [18:41:53.649] if (is.null(name)) [18:41:53.649] next [18:41:53.649] if (!grepl(pattern, name)) [18:41:53.649] next [18:41:53.649] invokeRestart(restart) [18:41:53.649] muffled <- TRUE [18:41:53.649] break [18:41:53.649] } [18:41:53.649] } [18:41:53.649] } [18:41:53.649] invisible(muffled) [18:41:53.649] } [18:41:53.649] muffleCondition(cond) [18:41:53.649] }) [18:41:53.649] })) [18:41:53.649] future::FutureResult(value = ...future.value$value, [18:41:53.649] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.649] ...future.rng), globalenv = if (FALSE) [18:41:53.649] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.649] ...future.globalenv.names)) [18:41:53.649] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.649] }, condition = base::local({ [18:41:53.649] c <- base::c [18:41:53.649] inherits <- base::inherits [18:41:53.649] invokeRestart <- base::invokeRestart [18:41:53.649] length <- base::length [18:41:53.649] list <- base::list [18:41:53.649] seq.int <- base::seq.int [18:41:53.649] signalCondition <- base::signalCondition [18:41:53.649] sys.calls <- base::sys.calls [18:41:53.649] `[[` <- base::`[[` [18:41:53.649] `+` <- base::`+` [18:41:53.649] `<<-` <- base::`<<-` [18:41:53.649] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.649] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.649] 3L)] [18:41:53.649] } [18:41:53.649] function(cond) { [18:41:53.649] is_error <- inherits(cond, "error") [18:41:53.649] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.649] NULL) [18:41:53.649] if (is_error) { [18:41:53.649] sessionInformation <- function() { [18:41:53.649] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.649] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.649] search = base::search(), system = base::Sys.info()) [18:41:53.649] } [18:41:53.649] ...future.conditions[[length(...future.conditions) + [18:41:53.649] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.649] cond$call), session = sessionInformation(), [18:41:53.649] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.649] signalCondition(cond) [18:41:53.649] } [18:41:53.649] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.649] "immediateCondition"))) { [18:41:53.649] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.649] ...future.conditions[[length(...future.conditions) + [18:41:53.649] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.649] if (TRUE && !signal) { [18:41:53.649] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.649] { [18:41:53.649] inherits <- base::inherits [18:41:53.649] invokeRestart <- base::invokeRestart [18:41:53.649] is.null <- base::is.null [18:41:53.649] muffled <- FALSE [18:41:53.649] if (inherits(cond, "message")) { [18:41:53.649] muffled <- grepl(pattern, "muffleMessage") [18:41:53.649] if (muffled) [18:41:53.649] invokeRestart("muffleMessage") [18:41:53.649] } [18:41:53.649] else if (inherits(cond, "warning")) { [18:41:53.649] muffled <- grepl(pattern, "muffleWarning") [18:41:53.649] if (muffled) [18:41:53.649] invokeRestart("muffleWarning") [18:41:53.649] } [18:41:53.649] else if (inherits(cond, "condition")) { [18:41:53.649] if (!is.null(pattern)) { [18:41:53.649] computeRestarts <- base::computeRestarts [18:41:53.649] grepl <- base::grepl [18:41:53.649] restarts <- computeRestarts(cond) [18:41:53.649] for (restart in restarts) { [18:41:53.649] name <- restart$name [18:41:53.649] if (is.null(name)) [18:41:53.649] next [18:41:53.649] if (!grepl(pattern, name)) [18:41:53.649] next [18:41:53.649] invokeRestart(restart) [18:41:53.649] muffled <- TRUE [18:41:53.649] break [18:41:53.649] } [18:41:53.649] } [18:41:53.649] } [18:41:53.649] invisible(muffled) [18:41:53.649] } [18:41:53.649] muffleCondition(cond, pattern = "^muffle") [18:41:53.649] } [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] if (TRUE) { [18:41:53.649] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.649] { [18:41:53.649] inherits <- base::inherits [18:41:53.649] invokeRestart <- base::invokeRestart [18:41:53.649] is.null <- base::is.null [18:41:53.649] muffled <- FALSE [18:41:53.649] if (inherits(cond, "message")) { [18:41:53.649] muffled <- grepl(pattern, "muffleMessage") [18:41:53.649] if (muffled) [18:41:53.649] invokeRestart("muffleMessage") [18:41:53.649] } [18:41:53.649] else if (inherits(cond, "warning")) { [18:41:53.649] muffled <- grepl(pattern, "muffleWarning") [18:41:53.649] if (muffled) [18:41:53.649] invokeRestart("muffleWarning") [18:41:53.649] } [18:41:53.649] else if (inherits(cond, "condition")) { [18:41:53.649] if (!is.null(pattern)) { [18:41:53.649] computeRestarts <- base::computeRestarts [18:41:53.649] grepl <- base::grepl [18:41:53.649] restarts <- computeRestarts(cond) [18:41:53.649] for (restart in restarts) { [18:41:53.649] name <- restart$name [18:41:53.649] if (is.null(name)) [18:41:53.649] next [18:41:53.649] if (!grepl(pattern, name)) [18:41:53.649] next [18:41:53.649] invokeRestart(restart) [18:41:53.649] muffled <- TRUE [18:41:53.649] break [18:41:53.649] } [18:41:53.649] } [18:41:53.649] } [18:41:53.649] invisible(muffled) [18:41:53.649] } [18:41:53.649] muffleCondition(cond, pattern = "^muffle") [18:41:53.649] } [18:41:53.649] } [18:41:53.649] } [18:41:53.649] })) [18:41:53.649] }, error = function(ex) { [18:41:53.649] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.649] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.649] ...future.rng), started = ...future.startTime, [18:41:53.649] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.649] version = "1.8"), class = "FutureResult") [18:41:53.649] }, finally = { [18:41:53.649] if (!identical(...future.workdir, getwd())) [18:41:53.649] setwd(...future.workdir) [18:41:53.649] { [18:41:53.649] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.649] ...future.oldOptions$nwarnings <- NULL [18:41:53.649] } [18:41:53.649] base::options(...future.oldOptions) [18:41:53.649] if (.Platform$OS.type == "windows") { [18:41:53.649] old_names <- names(...future.oldEnvVars) [18:41:53.649] envs <- base::Sys.getenv() [18:41:53.649] names <- names(envs) [18:41:53.649] common <- intersect(names, old_names) [18:41:53.649] added <- setdiff(names, old_names) [18:41:53.649] removed <- setdiff(old_names, names) [18:41:53.649] changed <- common[...future.oldEnvVars[common] != [18:41:53.649] envs[common]] [18:41:53.649] NAMES <- toupper(changed) [18:41:53.649] args <- list() [18:41:53.649] for (kk in seq_along(NAMES)) { [18:41:53.649] name <- changed[[kk]] [18:41:53.649] NAME <- NAMES[[kk]] [18:41:53.649] if (name != NAME && is.element(NAME, old_names)) [18:41:53.649] next [18:41:53.649] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.649] } [18:41:53.649] NAMES <- toupper(added) [18:41:53.649] for (kk in seq_along(NAMES)) { [18:41:53.649] name <- added[[kk]] [18:41:53.649] NAME <- NAMES[[kk]] [18:41:53.649] if (name != NAME && is.element(NAME, old_names)) [18:41:53.649] next [18:41:53.649] args[[name]] <- "" [18:41:53.649] } [18:41:53.649] NAMES <- toupper(removed) [18:41:53.649] for (kk in seq_along(NAMES)) { [18:41:53.649] name <- removed[[kk]] [18:41:53.649] NAME <- NAMES[[kk]] [18:41:53.649] if (name != NAME && is.element(NAME, old_names)) [18:41:53.649] next [18:41:53.649] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.649] } [18:41:53.649] if (length(args) > 0) [18:41:53.649] base::do.call(base::Sys.setenv, args = args) [18:41:53.649] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.649] } [18:41:53.649] { [18:41:53.649] if (base::length(...future.futureOptionsAdded) > [18:41:53.649] 0L) { [18:41:53.649] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.649] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.649] base::options(opts) [18:41:53.649] } [18:41:53.649] { [18:41:53.649] { [18:41:53.649] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.649] NULL [18:41:53.649] } [18:41:53.649] options(future.plan = NULL) [18:41:53.649] if (is.na(NA_character_)) [18:41:53.649] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.649] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.649] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.649] .init = FALSE) [18:41:53.649] } [18:41:53.649] } [18:41:53.649] } [18:41:53.649] }) [18:41:53.649] if (TRUE) { [18:41:53.649] base::sink(type = "output", split = FALSE) [18:41:53.649] if (TRUE) { [18:41:53.649] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.649] } [18:41:53.649] else { [18:41:53.649] ...future.result["stdout"] <- base::list(NULL) [18:41:53.649] } [18:41:53.649] base::close(...future.stdout) [18:41:53.649] ...future.stdout <- NULL [18:41:53.649] } [18:41:53.649] ...future.result$conditions <- ...future.conditions [18:41:53.649] ...future.result$finished <- base::Sys.time() [18:41:53.649] ...future.result [18:41:53.649] } [18:41:53.654] Exporting 5 global objects (847 bytes) to cluster node #1 ... [18:41:53.654] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.655] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.655] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.656] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.656] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.656] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.656] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.657] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.657] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.657] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.658] Exporting 5 global objects (847 bytes) to cluster node #1 ... DONE [18:41:53.658] MultisessionFuture started [18:41:53.659] - Launch lazy future ... done [18:41:53.659] run() for 'MultisessionFuture' ... done [18:41:53.659] Created future: [18:41:53.678] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.678] - Validating connection of MultisessionFuture [18:41:53.679] - received message: FutureResult [18:41:53.679] - Received FutureResult [18:41:53.679] - Erased future from FutureRegistry [18:41:53.679] result() for ClusterFuture ... [18:41:53.680] - result already collected: FutureResult [18:41:53.680] result() for ClusterFuture ... done [18:41:53.680] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.659] MultisessionFuture: [18:41:53.659] Label: 'future_sapply-1' [18:41:53.659] Expression: [18:41:53.659] { [18:41:53.659] do.call(function(...) { [18:41:53.659] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.659] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.659] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.659] on.exit(options(oopts), add = TRUE) [18:41:53.659] } [18:41:53.659] { [18:41:53.659] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.659] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.659] ...future.FUN(...future.X_jj, ...) [18:41:53.659] }) [18:41:53.659] } [18:41:53.659] }, args = future.call.arguments) [18:41:53.659] } [18:41:53.659] Lazy evaluation: FALSE [18:41:53.659] Asynchronous evaluation: TRUE [18:41:53.659] Local evaluation: TRUE [18:41:53.659] Environment: R_GlobalEnv [18:41:53.659] Capture standard output: TRUE [18:41:53.659] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.659] Globals: 5 objects totaling 384 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.659] Packages: [18:41:53.659] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.659] Resolved: TRUE [18:41:53.659] Value: [18:41:53.659] Conditions captured: [18:41:53.659] Early signaling: FALSE [18:41:53.659] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.659] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.680] Chunk #1 of 2 ... DONE [18:41:53.681] Chunk #2 of 2 ... [18:41:53.681] - Finding globals in 'X' for chunk #2 ... [18:41:53.681] getGlobalsAndPackages() ... [18:41:53.681] Searching for globals... [18:41:53.681] [18:41:53.682] Searching for globals ... DONE [18:41:53.682] - globals: [0] [18:41:53.682] getGlobalsAndPackages() ... DONE [18:41:53.682] + additional globals found: [n=0] [18:41:53.682] + additional namespaces needed: [n=0] [18:41:53.683] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.683] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.683] - seeds: [18:41:53.683] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.683] getGlobalsAndPackages() ... [18:41:53.683] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.684] Resolving globals: FALSE [18:41:53.684] Tweak future expression to call with '...' arguments ... [18:41:53.684] { [18:41:53.684] do.call(function(...) { [18:41:53.684] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.684] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.684] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.684] on.exit(options(oopts), add = TRUE) [18:41:53.684] } [18:41:53.684] { [18:41:53.684] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.684] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.684] ...future.FUN(...future.X_jj, ...) [18:41:53.684] }) [18:41:53.684] } [18:41:53.684] }, args = future.call.arguments) [18:41:53.684] } [18:41:53.684] Tweak future expression to call with '...' arguments ... DONE [18:41:53.685] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.685] [18:41:53.689] getGlobalsAndPackages() ... DONE [18:41:53.689] run() for 'Future' ... [18:41:53.689] - state: 'created' [18:41:53.690] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.705] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.706] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.706] - Field: 'node' [18:41:53.706] - Field: 'label' [18:41:53.706] - Field: 'local' [18:41:53.706] - Field: 'owner' [18:41:53.707] - Field: 'envir' [18:41:53.707] - Field: 'workers' [18:41:53.707] - Field: 'packages' [18:41:53.707] - Field: 'gc' [18:41:53.707] - Field: 'conditions' [18:41:53.707] - Field: 'persistent' [18:41:53.708] - Field: 'expr' [18:41:53.708] - Field: 'uuid' [18:41:53.708] - Field: 'seed' [18:41:53.708] - Field: 'version' [18:41:53.708] - Field: 'result' [18:41:53.708] - Field: 'asynchronous' [18:41:53.709] - Field: 'calls' [18:41:53.709] - Field: 'globals' [18:41:53.709] - Field: 'stdout' [18:41:53.709] - Field: 'earlySignal' [18:41:53.709] - Field: 'lazy' [18:41:53.709] - Field: 'state' [18:41:53.710] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.710] - Launch lazy future ... [18:41:53.710] Packages needed by the future expression (n = 0): [18:41:53.710] Packages needed by future strategies (n = 0): [18:41:53.711] { [18:41:53.711] { [18:41:53.711] { [18:41:53.711] ...future.startTime <- base::Sys.time() [18:41:53.711] { [18:41:53.711] { [18:41:53.711] { [18:41:53.711] { [18:41:53.711] base::local({ [18:41:53.711] has_future <- base::requireNamespace("future", [18:41:53.711] quietly = TRUE) [18:41:53.711] if (has_future) { [18:41:53.711] ns <- base::getNamespace("future") [18:41:53.711] version <- ns[[".package"]][["version"]] [18:41:53.711] if (is.null(version)) [18:41:53.711] version <- utils::packageVersion("future") [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] version <- NULL [18:41:53.711] } [18:41:53.711] if (!has_future || version < "1.8.0") { [18:41:53.711] info <- base::c(r_version = base::gsub("R version ", [18:41:53.711] "", base::R.version$version.string), [18:41:53.711] platform = base::sprintf("%s (%s-bit)", [18:41:53.711] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.711] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.711] "release", "version")], collapse = " "), [18:41:53.711] hostname = base::Sys.info()[["nodename"]]) [18:41:53.711] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.711] info) [18:41:53.711] info <- base::paste(info, collapse = "; ") [18:41:53.711] if (!has_future) { [18:41:53.711] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.711] info) [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.711] info, version) [18:41:53.711] } [18:41:53.711] base::stop(msg) [18:41:53.711] } [18:41:53.711] }) [18:41:53.711] } [18:41:53.711] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.711] base::options(mc.cores = 1L) [18:41:53.711] } [18:41:53.711] ...future.strategy.old <- future::plan("list") [18:41:53.711] options(future.plan = NULL) [18:41:53.711] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.711] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.711] } [18:41:53.711] ...future.workdir <- getwd() [18:41:53.711] } [18:41:53.711] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.711] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.711] } [18:41:53.711] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.711] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.711] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.711] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.711] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.711] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.711] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.711] base::names(...future.oldOptions)) [18:41:53.711] } [18:41:53.711] if (FALSE) { [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] if (TRUE) { [18:41:53.711] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.711] open = "w") [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.711] windows = "NUL", "/dev/null"), open = "w") [18:41:53.711] } [18:41:53.711] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.711] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.711] base::sink(type = "output", split = FALSE) [18:41:53.711] base::close(...future.stdout) [18:41:53.711] }, add = TRUE) [18:41:53.711] } [18:41:53.711] ...future.frame <- base::sys.nframe() [18:41:53.711] ...future.conditions <- base::list() [18:41:53.711] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.711] if (FALSE) { [18:41:53.711] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.711] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.711] } [18:41:53.711] ...future.result <- base::tryCatch({ [18:41:53.711] base::withCallingHandlers({ [18:41:53.711] ...future.value <- base::withVisible(base::local({ [18:41:53.711] ...future.makeSendCondition <- base::local({ [18:41:53.711] sendCondition <- NULL [18:41:53.711] function(frame = 1L) { [18:41:53.711] if (is.function(sendCondition)) [18:41:53.711] return(sendCondition) [18:41:53.711] ns <- getNamespace("parallel") [18:41:53.711] if (exists("sendData", mode = "function", [18:41:53.711] envir = ns)) { [18:41:53.711] parallel_sendData <- get("sendData", mode = "function", [18:41:53.711] envir = ns) [18:41:53.711] envir <- sys.frame(frame) [18:41:53.711] master <- NULL [18:41:53.711] while (!identical(envir, .GlobalEnv) && [18:41:53.711] !identical(envir, emptyenv())) { [18:41:53.711] if (exists("master", mode = "list", envir = envir, [18:41:53.711] inherits = FALSE)) { [18:41:53.711] master <- get("master", mode = "list", [18:41:53.711] envir = envir, inherits = FALSE) [18:41:53.711] if (inherits(master, c("SOCKnode", [18:41:53.711] "SOCK0node"))) { [18:41:53.711] sendCondition <<- function(cond) { [18:41:53.711] data <- list(type = "VALUE", value = cond, [18:41:53.711] success = TRUE) [18:41:53.711] parallel_sendData(master, data) [18:41:53.711] } [18:41:53.711] return(sendCondition) [18:41:53.711] } [18:41:53.711] } [18:41:53.711] frame <- frame + 1L [18:41:53.711] envir <- sys.frame(frame) [18:41:53.711] } [18:41:53.711] } [18:41:53.711] sendCondition <<- function(cond) NULL [18:41:53.711] } [18:41:53.711] }) [18:41:53.711] withCallingHandlers({ [18:41:53.711] { [18:41:53.711] do.call(function(...) { [18:41:53.711] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.711] if (!identical(...future.globals.maxSize.org, [18:41:53.711] ...future.globals.maxSize)) { [18:41:53.711] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.711] on.exit(options(oopts), add = TRUE) [18:41:53.711] } [18:41:53.711] { [18:41:53.711] lapply(seq_along(...future.elements_ii), [18:41:53.711] FUN = function(jj) { [18:41:53.711] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.711] ...future.FUN(...future.X_jj, ...) [18:41:53.711] }) [18:41:53.711] } [18:41:53.711] }, args = future.call.arguments) [18:41:53.711] } [18:41:53.711] }, immediateCondition = function(cond) { [18:41:53.711] sendCondition <- ...future.makeSendCondition() [18:41:53.711] sendCondition(cond) [18:41:53.711] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.711] { [18:41:53.711] inherits <- base::inherits [18:41:53.711] invokeRestart <- base::invokeRestart [18:41:53.711] is.null <- base::is.null [18:41:53.711] muffled <- FALSE [18:41:53.711] if (inherits(cond, "message")) { [18:41:53.711] muffled <- grepl(pattern, "muffleMessage") [18:41:53.711] if (muffled) [18:41:53.711] invokeRestart("muffleMessage") [18:41:53.711] } [18:41:53.711] else if (inherits(cond, "warning")) { [18:41:53.711] muffled <- grepl(pattern, "muffleWarning") [18:41:53.711] if (muffled) [18:41:53.711] invokeRestart("muffleWarning") [18:41:53.711] } [18:41:53.711] else if (inherits(cond, "condition")) { [18:41:53.711] if (!is.null(pattern)) { [18:41:53.711] computeRestarts <- base::computeRestarts [18:41:53.711] grepl <- base::grepl [18:41:53.711] restarts <- computeRestarts(cond) [18:41:53.711] for (restart in restarts) { [18:41:53.711] name <- restart$name [18:41:53.711] if (is.null(name)) [18:41:53.711] next [18:41:53.711] if (!grepl(pattern, name)) [18:41:53.711] next [18:41:53.711] invokeRestart(restart) [18:41:53.711] muffled <- TRUE [18:41:53.711] break [18:41:53.711] } [18:41:53.711] } [18:41:53.711] } [18:41:53.711] invisible(muffled) [18:41:53.711] } [18:41:53.711] muffleCondition(cond) [18:41:53.711] }) [18:41:53.711] })) [18:41:53.711] future::FutureResult(value = ...future.value$value, [18:41:53.711] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.711] ...future.rng), globalenv = if (FALSE) [18:41:53.711] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.711] ...future.globalenv.names)) [18:41:53.711] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.711] }, condition = base::local({ [18:41:53.711] c <- base::c [18:41:53.711] inherits <- base::inherits [18:41:53.711] invokeRestart <- base::invokeRestart [18:41:53.711] length <- base::length [18:41:53.711] list <- base::list [18:41:53.711] seq.int <- base::seq.int [18:41:53.711] signalCondition <- base::signalCondition [18:41:53.711] sys.calls <- base::sys.calls [18:41:53.711] `[[` <- base::`[[` [18:41:53.711] `+` <- base::`+` [18:41:53.711] `<<-` <- base::`<<-` [18:41:53.711] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.711] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.711] 3L)] [18:41:53.711] } [18:41:53.711] function(cond) { [18:41:53.711] is_error <- inherits(cond, "error") [18:41:53.711] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.711] NULL) [18:41:53.711] if (is_error) { [18:41:53.711] sessionInformation <- function() { [18:41:53.711] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.711] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.711] search = base::search(), system = base::Sys.info()) [18:41:53.711] } [18:41:53.711] ...future.conditions[[length(...future.conditions) + [18:41:53.711] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.711] cond$call), session = sessionInformation(), [18:41:53.711] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.711] signalCondition(cond) [18:41:53.711] } [18:41:53.711] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.711] "immediateCondition"))) { [18:41:53.711] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.711] ...future.conditions[[length(...future.conditions) + [18:41:53.711] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.711] if (TRUE && !signal) { [18:41:53.711] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.711] { [18:41:53.711] inherits <- base::inherits [18:41:53.711] invokeRestart <- base::invokeRestart [18:41:53.711] is.null <- base::is.null [18:41:53.711] muffled <- FALSE [18:41:53.711] if (inherits(cond, "message")) { [18:41:53.711] muffled <- grepl(pattern, "muffleMessage") [18:41:53.711] if (muffled) [18:41:53.711] invokeRestart("muffleMessage") [18:41:53.711] } [18:41:53.711] else if (inherits(cond, "warning")) { [18:41:53.711] muffled <- grepl(pattern, "muffleWarning") [18:41:53.711] if (muffled) [18:41:53.711] invokeRestart("muffleWarning") [18:41:53.711] } [18:41:53.711] else if (inherits(cond, "condition")) { [18:41:53.711] if (!is.null(pattern)) { [18:41:53.711] computeRestarts <- base::computeRestarts [18:41:53.711] grepl <- base::grepl [18:41:53.711] restarts <- computeRestarts(cond) [18:41:53.711] for (restart in restarts) { [18:41:53.711] name <- restart$name [18:41:53.711] if (is.null(name)) [18:41:53.711] next [18:41:53.711] if (!grepl(pattern, name)) [18:41:53.711] next [18:41:53.711] invokeRestart(restart) [18:41:53.711] muffled <- TRUE [18:41:53.711] break [18:41:53.711] } [18:41:53.711] } [18:41:53.711] } [18:41:53.711] invisible(muffled) [18:41:53.711] } [18:41:53.711] muffleCondition(cond, pattern = "^muffle") [18:41:53.711] } [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] if (TRUE) { [18:41:53.711] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.711] { [18:41:53.711] inherits <- base::inherits [18:41:53.711] invokeRestart <- base::invokeRestart [18:41:53.711] is.null <- base::is.null [18:41:53.711] muffled <- FALSE [18:41:53.711] if (inherits(cond, "message")) { [18:41:53.711] muffled <- grepl(pattern, "muffleMessage") [18:41:53.711] if (muffled) [18:41:53.711] invokeRestart("muffleMessage") [18:41:53.711] } [18:41:53.711] else if (inherits(cond, "warning")) { [18:41:53.711] muffled <- grepl(pattern, "muffleWarning") [18:41:53.711] if (muffled) [18:41:53.711] invokeRestart("muffleWarning") [18:41:53.711] } [18:41:53.711] else if (inherits(cond, "condition")) { [18:41:53.711] if (!is.null(pattern)) { [18:41:53.711] computeRestarts <- base::computeRestarts [18:41:53.711] grepl <- base::grepl [18:41:53.711] restarts <- computeRestarts(cond) [18:41:53.711] for (restart in restarts) { [18:41:53.711] name <- restart$name [18:41:53.711] if (is.null(name)) [18:41:53.711] next [18:41:53.711] if (!grepl(pattern, name)) [18:41:53.711] next [18:41:53.711] invokeRestart(restart) [18:41:53.711] muffled <- TRUE [18:41:53.711] break [18:41:53.711] } [18:41:53.711] } [18:41:53.711] } [18:41:53.711] invisible(muffled) [18:41:53.711] } [18:41:53.711] muffleCondition(cond, pattern = "^muffle") [18:41:53.711] } [18:41:53.711] } [18:41:53.711] } [18:41:53.711] })) [18:41:53.711] }, error = function(ex) { [18:41:53.711] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.711] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.711] ...future.rng), started = ...future.startTime, [18:41:53.711] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.711] version = "1.8"), class = "FutureResult") [18:41:53.711] }, finally = { [18:41:53.711] if (!identical(...future.workdir, getwd())) [18:41:53.711] setwd(...future.workdir) [18:41:53.711] { [18:41:53.711] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.711] ...future.oldOptions$nwarnings <- NULL [18:41:53.711] } [18:41:53.711] base::options(...future.oldOptions) [18:41:53.711] if (.Platform$OS.type == "windows") { [18:41:53.711] old_names <- names(...future.oldEnvVars) [18:41:53.711] envs <- base::Sys.getenv() [18:41:53.711] names <- names(envs) [18:41:53.711] common <- intersect(names, old_names) [18:41:53.711] added <- setdiff(names, old_names) [18:41:53.711] removed <- setdiff(old_names, names) [18:41:53.711] changed <- common[...future.oldEnvVars[common] != [18:41:53.711] envs[common]] [18:41:53.711] NAMES <- toupper(changed) [18:41:53.711] args <- list() [18:41:53.711] for (kk in seq_along(NAMES)) { [18:41:53.711] name <- changed[[kk]] [18:41:53.711] NAME <- NAMES[[kk]] [18:41:53.711] if (name != NAME && is.element(NAME, old_names)) [18:41:53.711] next [18:41:53.711] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.711] } [18:41:53.711] NAMES <- toupper(added) [18:41:53.711] for (kk in seq_along(NAMES)) { [18:41:53.711] name <- added[[kk]] [18:41:53.711] NAME <- NAMES[[kk]] [18:41:53.711] if (name != NAME && is.element(NAME, old_names)) [18:41:53.711] next [18:41:53.711] args[[name]] <- "" [18:41:53.711] } [18:41:53.711] NAMES <- toupper(removed) [18:41:53.711] for (kk in seq_along(NAMES)) { [18:41:53.711] name <- removed[[kk]] [18:41:53.711] NAME <- NAMES[[kk]] [18:41:53.711] if (name != NAME && is.element(NAME, old_names)) [18:41:53.711] next [18:41:53.711] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.711] } [18:41:53.711] if (length(args) > 0) [18:41:53.711] base::do.call(base::Sys.setenv, args = args) [18:41:53.711] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.711] } [18:41:53.711] { [18:41:53.711] if (base::length(...future.futureOptionsAdded) > [18:41:53.711] 0L) { [18:41:53.711] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.711] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.711] base::options(opts) [18:41:53.711] } [18:41:53.711] { [18:41:53.711] { [18:41:53.711] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.711] NULL [18:41:53.711] } [18:41:53.711] options(future.plan = NULL) [18:41:53.711] if (is.na(NA_character_)) [18:41:53.711] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.711] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.711] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.711] .init = FALSE) [18:41:53.711] } [18:41:53.711] } [18:41:53.711] } [18:41:53.711] }) [18:41:53.711] if (TRUE) { [18:41:53.711] base::sink(type = "output", split = FALSE) [18:41:53.711] if (TRUE) { [18:41:53.711] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.711] } [18:41:53.711] else { [18:41:53.711] ...future.result["stdout"] <- base::list(NULL) [18:41:53.711] } [18:41:53.711] base::close(...future.stdout) [18:41:53.711] ...future.stdout <- NULL [18:41:53.711] } [18:41:53.711] ...future.result$conditions <- ...future.conditions [18:41:53.711] ...future.result$finished <- base::Sys.time() [18:41:53.711] ...future.result [18:41:53.711] } [18:41:53.717] Exporting 5 global objects (864 bytes) to cluster node #1 ... [18:41:53.717] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.717] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.717] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.718] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.718] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:53.719] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:53.719] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.719] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.719] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.720] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.720] Exporting 5 global objects (864 bytes) to cluster node #1 ... DONE [18:41:53.721] MultisessionFuture started [18:41:53.721] - Launch lazy future ... done [18:41:53.721] run() for 'MultisessionFuture' ... done [18:41:53.721] Created future: [18:41:53.739] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.740] - Validating connection of MultisessionFuture [18:41:53.740] - received message: FutureResult [18:41:53.740] - Received FutureResult [18:41:53.740] - Erased future from FutureRegistry [18:41:53.740] result() for ClusterFuture ... [18:41:53.741] - result already collected: FutureResult [18:41:53.741] result() for ClusterFuture ... done [18:41:53.741] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.721] MultisessionFuture: [18:41:53.721] Label: 'future_sapply-2' [18:41:53.721] Expression: [18:41:53.721] { [18:41:53.721] do.call(function(...) { [18:41:53.721] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.721] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.721] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.721] on.exit(options(oopts), add = TRUE) [18:41:53.721] } [18:41:53.721] { [18:41:53.721] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.721] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.721] ...future.FUN(...future.X_jj, ...) [18:41:53.721] }) [18:41:53.721] } [18:41:53.721] }, args = future.call.arguments) [18:41:53.721] } [18:41:53.721] Lazy evaluation: FALSE [18:41:53.721] Asynchronous evaluation: TRUE [18:41:53.721] Local evaluation: TRUE [18:41:53.721] Environment: R_GlobalEnv [18:41:53.721] Capture standard output: TRUE [18:41:53.721] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.721] Globals: 5 objects totaling 401 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.721] Packages: [18:41:53.721] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.721] Resolved: TRUE [18:41:53.721] Value: [18:41:53.721] Conditions captured: [18:41:53.721] Early signaling: FALSE [18:41:53.721] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.721] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.741] Chunk #2 of 2 ... DONE [18:41:53.742] Launching 2 futures (chunks) ... DONE [18:41:53.742] Resolving 2 futures (chunks) ... [18:41:53.742] resolve() on list ... [18:41:53.742] recursive: 0 [18:41:53.742] length: 2 [18:41:53.742] [18:41:53.743] Future #1 [18:41:53.743] result() for ClusterFuture ... [18:41:53.743] - result already collected: FutureResult [18:41:53.743] result() for ClusterFuture ... done [18:41:53.743] result() for ClusterFuture ... [18:41:53.743] - result already collected: FutureResult [18:41:53.743] result() for ClusterFuture ... done [18:41:53.744] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:53.744] - nx: 2 [18:41:53.744] - relay: TRUE [18:41:53.744] - stdout: TRUE [18:41:53.744] - signal: TRUE [18:41:53.744] - resignal: FALSE [18:41:53.745] - force: TRUE [18:41:53.745] - relayed: [n=2] FALSE, FALSE [18:41:53.745] - queued futures: [n=2] FALSE, FALSE [18:41:53.745] - until=1 [18:41:53.745] - relaying element #1 [18:41:53.745] result() for ClusterFuture ... [18:41:53.746] - result already collected: FutureResult [18:41:53.746] result() for ClusterFuture ... done [18:41:53.746] result() for ClusterFuture ... [18:41:53.746] - result already collected: FutureResult [18:41:53.746] result() for ClusterFuture ... done [18:41:53.746] result() for ClusterFuture ... [18:41:53.746] - result already collected: FutureResult [18:41:53.747] result() for ClusterFuture ... done [18:41:53.747] result() for ClusterFuture ... [18:41:53.747] - result already collected: FutureResult [18:41:53.747] result() for ClusterFuture ... done [18:41:53.747] - relayed: [n=2] TRUE, FALSE [18:41:53.747] - queued futures: [n=2] TRUE, FALSE [18:41:53.748] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:53.748] length: 1 (resolved future 1) [18:41:53.748] Future #2 [18:41:53.748] result() for ClusterFuture ... [18:41:53.748] - result already collected: FutureResult [18:41:53.748] result() for ClusterFuture ... done [18:41:53.749] result() for ClusterFuture ... [18:41:53.749] - result already collected: FutureResult [18:41:53.749] result() for ClusterFuture ... done [18:41:53.749] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:53.749] - nx: 2 [18:41:53.749] - relay: TRUE [18:41:53.750] - stdout: TRUE [18:41:53.750] - signal: TRUE [18:41:53.750] - resignal: FALSE [18:41:53.750] - force: TRUE [18:41:53.750] - relayed: [n=2] TRUE, FALSE [18:41:53.750] - queued futures: [n=2] TRUE, FALSE [18:41:53.751] - until=2 [18:41:53.751] - relaying element #2 [18:41:53.751] result() for ClusterFuture ... [18:41:53.751] - result already collected: FutureResult [18:41:53.751] result() for ClusterFuture ... done [18:41:53.751] result() for ClusterFuture ... [18:41:53.751] - result already collected: FutureResult [18:41:53.752] result() for ClusterFuture ... done [18:41:53.752] result() for ClusterFuture ... [18:41:53.752] - result already collected: FutureResult [18:41:53.752] result() for ClusterFuture ... done [18:41:53.752] result() for ClusterFuture ... [18:41:53.752] - result already collected: FutureResult [18:41:53.753] result() for ClusterFuture ... done [18:41:53.753] - relayed: [n=2] TRUE, TRUE [18:41:53.753] - queued futures: [n=2] TRUE, TRUE [18:41:53.753] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:53.753] length: 0 (resolved future 2) [18:41:53.753] Relaying remaining futures [18:41:53.754] signalConditionsASAP(NULL, pos=0) ... [18:41:53.754] - nx: 2 [18:41:53.754] - relay: TRUE [18:41:53.754] - stdout: TRUE [18:41:53.754] - signal: TRUE [18:41:53.754] - resignal: FALSE [18:41:53.754] - force: TRUE [18:41:53.755] - relayed: [n=2] TRUE, TRUE [18:41:53.755] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:53.755] - relayed: [n=2] TRUE, TRUE [18:41:53.755] - queued futures: [n=2] TRUE, TRUE [18:41:53.755] signalConditionsASAP(NULL, pos=0) ... done [18:41:53.755] resolve() on list ... DONE [18:41:53.756] result() for ClusterFuture ... [18:41:53.756] - result already collected: FutureResult [18:41:53.756] result() for ClusterFuture ... done [18:41:53.756] result() for ClusterFuture ... [18:41:53.756] - result already collected: FutureResult [18:41:53.756] result() for ClusterFuture ... done [18:41:53.757] result() for ClusterFuture ... [18:41:53.757] - result already collected: FutureResult [18:41:53.757] result() for ClusterFuture ... done [18:41:53.757] result() for ClusterFuture ... [18:41:53.757] - result already collected: FutureResult [18:41:53.757] result() for ClusterFuture ... done [18:41:53.758] - Number of value chunks collected: 2 [18:41:53.758] Resolving 2 futures (chunks) ... DONE [18:41:53.758] Reducing values from 2 chunks ... [18:41:53.758] - Number of values collected after concatenation: 3 [18:41:53.758] - Number of values expected: 3 [18:41:53.758] Reducing values from 2 chunks ... DONE [18:41:53.759] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:53.760] future_lapply() ... [18:41:53.763] Number of chunks: 2 [18:41:53.763] getGlobalsAndPackagesXApply() ... [18:41:53.763] - future.globals: TRUE [18:41:53.763] getGlobalsAndPackages() ... [18:41:53.764] Searching for globals... [18:41:53.765] - globals found: [2] 'FUN', 'UseMethod' [18:41:53.765] Searching for globals ... DONE [18:41:53.765] Resolving globals: FALSE [18:41:53.766] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:53.766] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:53.767] - globals: [1] 'FUN' [18:41:53.767] [18:41:53.767] getGlobalsAndPackages() ... DONE [18:41:53.767] - globals found/used: [n=1] 'FUN' [18:41:53.767] - needed namespaces: [n=0] [18:41:53.768] Finding globals ... DONE [18:41:53.768] - use_args: TRUE [18:41:53.768] - Getting '...' globals ... [18:41:53.768] resolve() on list ... [18:41:53.769] recursive: 0 [18:41:53.769] length: 1 [18:41:53.769] elements: '...' [18:41:53.769] length: 0 (resolved future 1) [18:41:53.769] resolve() on list ... DONE [18:41:53.769] - '...' content: [n=0] [18:41:53.770] List of 1 [18:41:53.770] $ ...: list() [18:41:53.770] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.770] - attr(*, "where")=List of 1 [18:41:53.770] ..$ ...: [18:41:53.770] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.770] - attr(*, "resolved")= logi TRUE [18:41:53.770] - attr(*, "total_size")= num NA [18:41:53.773] - Getting '...' globals ... DONE [18:41:53.773] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.773] List of 2 [18:41:53.773] $ ...future.FUN:function (x, ...) [18:41:53.773] $ ... : list() [18:41:53.773] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.773] - attr(*, "where")=List of 2 [18:41:53.773] ..$ ...future.FUN: [18:41:53.773] ..$ ... : [18:41:53.773] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.773] - attr(*, "resolved")= logi FALSE [18:41:53.773] - attr(*, "total_size")= int 5028 [18:41:53.776] Packages to be attached in all futures: [n=0] [18:41:53.777] getGlobalsAndPackagesXApply() ... DONE [18:41:53.777] Number of futures (= number of chunks): 2 [18:41:53.777] Launching 2 futures (chunks) ... [18:41:53.777] Chunk #1 of 2 ... [18:41:53.777] - Finding globals in 'X' for chunk #1 ... [18:41:53.778] getGlobalsAndPackages() ... [18:41:53.778] Searching for globals... [18:41:53.778] [18:41:53.778] Searching for globals ... DONE [18:41:53.778] - globals: [0] [18:41:53.779] getGlobalsAndPackages() ... DONE [18:41:53.779] + additional globals found: [n=0] [18:41:53.779] + additional namespaces needed: [n=0] [18:41:53.779] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.779] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.779] - seeds: [18:41:53.780] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.780] getGlobalsAndPackages() ... [18:41:53.780] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.780] Resolving globals: FALSE [18:41:53.780] Tweak future expression to call with '...' arguments ... [18:41:53.781] { [18:41:53.781] do.call(function(...) { [18:41:53.781] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.781] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.781] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.781] on.exit(options(oopts), add = TRUE) [18:41:53.781] } [18:41:53.781] { [18:41:53.781] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.781] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.781] ...future.FUN(...future.X_jj, ...) [18:41:53.781] }) [18:41:53.781] } [18:41:53.781] }, args = future.call.arguments) [18:41:53.781] } [18:41:53.781] Tweak future expression to call with '...' arguments ... DONE [18:41:53.781] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.782] [18:41:53.782] getGlobalsAndPackages() ... DONE [18:41:53.782] run() for 'Future' ... [18:41:53.782] - state: 'created' [18:41:53.783] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.800] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.801] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.801] - Field: 'node' [18:41:53.801] - Field: 'label' [18:41:53.802] - Field: 'local' [18:41:53.802] - Field: 'owner' [18:41:53.802] - Field: 'envir' [18:41:53.802] - Field: 'workers' [18:41:53.802] - Field: 'packages' [18:41:53.803] - Field: 'gc' [18:41:53.803] - Field: 'conditions' [18:41:53.803] - Field: 'persistent' [18:41:53.804] - Field: 'expr' [18:41:53.804] - Field: 'uuid' [18:41:53.804] - Field: 'seed' [18:41:53.804] - Field: 'version' [18:41:53.804] - Field: 'result' [18:41:53.805] - Field: 'asynchronous' [18:41:53.805] - Field: 'calls' [18:41:53.805] - Field: 'globals' [18:41:53.805] - Field: 'stdout' [18:41:53.805] - Field: 'earlySignal' [18:41:53.805] - Field: 'lazy' [18:41:53.806] - Field: 'state' [18:41:53.806] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.806] - Launch lazy future ... [18:41:53.806] Packages needed by the future expression (n = 0): [18:41:53.807] Packages needed by future strategies (n = 0): [18:41:53.807] { [18:41:53.807] { [18:41:53.807] { [18:41:53.807] ...future.startTime <- base::Sys.time() [18:41:53.807] { [18:41:53.807] { [18:41:53.807] { [18:41:53.807] { [18:41:53.807] base::local({ [18:41:53.807] has_future <- base::requireNamespace("future", [18:41:53.807] quietly = TRUE) [18:41:53.807] if (has_future) { [18:41:53.807] ns <- base::getNamespace("future") [18:41:53.807] version <- ns[[".package"]][["version"]] [18:41:53.807] if (is.null(version)) [18:41:53.807] version <- utils::packageVersion("future") [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] version <- NULL [18:41:53.807] } [18:41:53.807] if (!has_future || version < "1.8.0") { [18:41:53.807] info <- base::c(r_version = base::gsub("R version ", [18:41:53.807] "", base::R.version$version.string), [18:41:53.807] platform = base::sprintf("%s (%s-bit)", [18:41:53.807] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.807] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.807] "release", "version")], collapse = " "), [18:41:53.807] hostname = base::Sys.info()[["nodename"]]) [18:41:53.807] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.807] info) [18:41:53.807] info <- base::paste(info, collapse = "; ") [18:41:53.807] if (!has_future) { [18:41:53.807] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.807] info) [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.807] info, version) [18:41:53.807] } [18:41:53.807] base::stop(msg) [18:41:53.807] } [18:41:53.807] }) [18:41:53.807] } [18:41:53.807] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.807] base::options(mc.cores = 1L) [18:41:53.807] } [18:41:53.807] ...future.strategy.old <- future::plan("list") [18:41:53.807] options(future.plan = NULL) [18:41:53.807] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.807] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.807] } [18:41:53.807] ...future.workdir <- getwd() [18:41:53.807] } [18:41:53.807] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.807] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.807] } [18:41:53.807] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.807] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.807] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.807] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.807] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.807] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.807] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.807] base::names(...future.oldOptions)) [18:41:53.807] } [18:41:53.807] if (FALSE) { [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] if (TRUE) { [18:41:53.807] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.807] open = "w") [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.807] windows = "NUL", "/dev/null"), open = "w") [18:41:53.807] } [18:41:53.807] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.807] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.807] base::sink(type = "output", split = FALSE) [18:41:53.807] base::close(...future.stdout) [18:41:53.807] }, add = TRUE) [18:41:53.807] } [18:41:53.807] ...future.frame <- base::sys.nframe() [18:41:53.807] ...future.conditions <- base::list() [18:41:53.807] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.807] if (FALSE) { [18:41:53.807] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.807] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.807] } [18:41:53.807] ...future.result <- base::tryCatch({ [18:41:53.807] base::withCallingHandlers({ [18:41:53.807] ...future.value <- base::withVisible(base::local({ [18:41:53.807] ...future.makeSendCondition <- base::local({ [18:41:53.807] sendCondition <- NULL [18:41:53.807] function(frame = 1L) { [18:41:53.807] if (is.function(sendCondition)) [18:41:53.807] return(sendCondition) [18:41:53.807] ns <- getNamespace("parallel") [18:41:53.807] if (exists("sendData", mode = "function", [18:41:53.807] envir = ns)) { [18:41:53.807] parallel_sendData <- get("sendData", mode = "function", [18:41:53.807] envir = ns) [18:41:53.807] envir <- sys.frame(frame) [18:41:53.807] master <- NULL [18:41:53.807] while (!identical(envir, .GlobalEnv) && [18:41:53.807] !identical(envir, emptyenv())) { [18:41:53.807] if (exists("master", mode = "list", envir = envir, [18:41:53.807] inherits = FALSE)) { [18:41:53.807] master <- get("master", mode = "list", [18:41:53.807] envir = envir, inherits = FALSE) [18:41:53.807] if (inherits(master, c("SOCKnode", [18:41:53.807] "SOCK0node"))) { [18:41:53.807] sendCondition <<- function(cond) { [18:41:53.807] data <- list(type = "VALUE", value = cond, [18:41:53.807] success = TRUE) [18:41:53.807] parallel_sendData(master, data) [18:41:53.807] } [18:41:53.807] return(sendCondition) [18:41:53.807] } [18:41:53.807] } [18:41:53.807] frame <- frame + 1L [18:41:53.807] envir <- sys.frame(frame) [18:41:53.807] } [18:41:53.807] } [18:41:53.807] sendCondition <<- function(cond) NULL [18:41:53.807] } [18:41:53.807] }) [18:41:53.807] withCallingHandlers({ [18:41:53.807] { [18:41:53.807] do.call(function(...) { [18:41:53.807] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.807] if (!identical(...future.globals.maxSize.org, [18:41:53.807] ...future.globals.maxSize)) { [18:41:53.807] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.807] on.exit(options(oopts), add = TRUE) [18:41:53.807] } [18:41:53.807] { [18:41:53.807] lapply(seq_along(...future.elements_ii), [18:41:53.807] FUN = function(jj) { [18:41:53.807] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.807] ...future.FUN(...future.X_jj, ...) [18:41:53.807] }) [18:41:53.807] } [18:41:53.807] }, args = future.call.arguments) [18:41:53.807] } [18:41:53.807] }, immediateCondition = function(cond) { [18:41:53.807] sendCondition <- ...future.makeSendCondition() [18:41:53.807] sendCondition(cond) [18:41:53.807] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.807] { [18:41:53.807] inherits <- base::inherits [18:41:53.807] invokeRestart <- base::invokeRestart [18:41:53.807] is.null <- base::is.null [18:41:53.807] muffled <- FALSE [18:41:53.807] if (inherits(cond, "message")) { [18:41:53.807] muffled <- grepl(pattern, "muffleMessage") [18:41:53.807] if (muffled) [18:41:53.807] invokeRestart("muffleMessage") [18:41:53.807] } [18:41:53.807] else if (inherits(cond, "warning")) { [18:41:53.807] muffled <- grepl(pattern, "muffleWarning") [18:41:53.807] if (muffled) [18:41:53.807] invokeRestart("muffleWarning") [18:41:53.807] } [18:41:53.807] else if (inherits(cond, "condition")) { [18:41:53.807] if (!is.null(pattern)) { [18:41:53.807] computeRestarts <- base::computeRestarts [18:41:53.807] grepl <- base::grepl [18:41:53.807] restarts <- computeRestarts(cond) [18:41:53.807] for (restart in restarts) { [18:41:53.807] name <- restart$name [18:41:53.807] if (is.null(name)) [18:41:53.807] next [18:41:53.807] if (!grepl(pattern, name)) [18:41:53.807] next [18:41:53.807] invokeRestart(restart) [18:41:53.807] muffled <- TRUE [18:41:53.807] break [18:41:53.807] } [18:41:53.807] } [18:41:53.807] } [18:41:53.807] invisible(muffled) [18:41:53.807] } [18:41:53.807] muffleCondition(cond) [18:41:53.807] }) [18:41:53.807] })) [18:41:53.807] future::FutureResult(value = ...future.value$value, [18:41:53.807] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.807] ...future.rng), globalenv = if (FALSE) [18:41:53.807] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.807] ...future.globalenv.names)) [18:41:53.807] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.807] }, condition = base::local({ [18:41:53.807] c <- base::c [18:41:53.807] inherits <- base::inherits [18:41:53.807] invokeRestart <- base::invokeRestart [18:41:53.807] length <- base::length [18:41:53.807] list <- base::list [18:41:53.807] seq.int <- base::seq.int [18:41:53.807] signalCondition <- base::signalCondition [18:41:53.807] sys.calls <- base::sys.calls [18:41:53.807] `[[` <- base::`[[` [18:41:53.807] `+` <- base::`+` [18:41:53.807] `<<-` <- base::`<<-` [18:41:53.807] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.807] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.807] 3L)] [18:41:53.807] } [18:41:53.807] function(cond) { [18:41:53.807] is_error <- inherits(cond, "error") [18:41:53.807] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.807] NULL) [18:41:53.807] if (is_error) { [18:41:53.807] sessionInformation <- function() { [18:41:53.807] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.807] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.807] search = base::search(), system = base::Sys.info()) [18:41:53.807] } [18:41:53.807] ...future.conditions[[length(...future.conditions) + [18:41:53.807] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.807] cond$call), session = sessionInformation(), [18:41:53.807] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.807] signalCondition(cond) [18:41:53.807] } [18:41:53.807] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.807] "immediateCondition"))) { [18:41:53.807] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.807] ...future.conditions[[length(...future.conditions) + [18:41:53.807] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.807] if (TRUE && !signal) { [18:41:53.807] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.807] { [18:41:53.807] inherits <- base::inherits [18:41:53.807] invokeRestart <- base::invokeRestart [18:41:53.807] is.null <- base::is.null [18:41:53.807] muffled <- FALSE [18:41:53.807] if (inherits(cond, "message")) { [18:41:53.807] muffled <- grepl(pattern, "muffleMessage") [18:41:53.807] if (muffled) [18:41:53.807] invokeRestart("muffleMessage") [18:41:53.807] } [18:41:53.807] else if (inherits(cond, "warning")) { [18:41:53.807] muffled <- grepl(pattern, "muffleWarning") [18:41:53.807] if (muffled) [18:41:53.807] invokeRestart("muffleWarning") [18:41:53.807] } [18:41:53.807] else if (inherits(cond, "condition")) { [18:41:53.807] if (!is.null(pattern)) { [18:41:53.807] computeRestarts <- base::computeRestarts [18:41:53.807] grepl <- base::grepl [18:41:53.807] restarts <- computeRestarts(cond) [18:41:53.807] for (restart in restarts) { [18:41:53.807] name <- restart$name [18:41:53.807] if (is.null(name)) [18:41:53.807] next [18:41:53.807] if (!grepl(pattern, name)) [18:41:53.807] next [18:41:53.807] invokeRestart(restart) [18:41:53.807] muffled <- TRUE [18:41:53.807] break [18:41:53.807] } [18:41:53.807] } [18:41:53.807] } [18:41:53.807] invisible(muffled) [18:41:53.807] } [18:41:53.807] muffleCondition(cond, pattern = "^muffle") [18:41:53.807] } [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] if (TRUE) { [18:41:53.807] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.807] { [18:41:53.807] inherits <- base::inherits [18:41:53.807] invokeRestart <- base::invokeRestart [18:41:53.807] is.null <- base::is.null [18:41:53.807] muffled <- FALSE [18:41:53.807] if (inherits(cond, "message")) { [18:41:53.807] muffled <- grepl(pattern, "muffleMessage") [18:41:53.807] if (muffled) [18:41:53.807] invokeRestart("muffleMessage") [18:41:53.807] } [18:41:53.807] else if (inherits(cond, "warning")) { [18:41:53.807] muffled <- grepl(pattern, "muffleWarning") [18:41:53.807] if (muffled) [18:41:53.807] invokeRestart("muffleWarning") [18:41:53.807] } [18:41:53.807] else if (inherits(cond, "condition")) { [18:41:53.807] if (!is.null(pattern)) { [18:41:53.807] computeRestarts <- base::computeRestarts [18:41:53.807] grepl <- base::grepl [18:41:53.807] restarts <- computeRestarts(cond) [18:41:53.807] for (restart in restarts) { [18:41:53.807] name <- restart$name [18:41:53.807] if (is.null(name)) [18:41:53.807] next [18:41:53.807] if (!grepl(pattern, name)) [18:41:53.807] next [18:41:53.807] invokeRestart(restart) [18:41:53.807] muffled <- TRUE [18:41:53.807] break [18:41:53.807] } [18:41:53.807] } [18:41:53.807] } [18:41:53.807] invisible(muffled) [18:41:53.807] } [18:41:53.807] muffleCondition(cond, pattern = "^muffle") [18:41:53.807] } [18:41:53.807] } [18:41:53.807] } [18:41:53.807] })) [18:41:53.807] }, error = function(ex) { [18:41:53.807] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.807] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.807] ...future.rng), started = ...future.startTime, [18:41:53.807] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.807] version = "1.8"), class = "FutureResult") [18:41:53.807] }, finally = { [18:41:53.807] if (!identical(...future.workdir, getwd())) [18:41:53.807] setwd(...future.workdir) [18:41:53.807] { [18:41:53.807] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.807] ...future.oldOptions$nwarnings <- NULL [18:41:53.807] } [18:41:53.807] base::options(...future.oldOptions) [18:41:53.807] if (.Platform$OS.type == "windows") { [18:41:53.807] old_names <- names(...future.oldEnvVars) [18:41:53.807] envs <- base::Sys.getenv() [18:41:53.807] names <- names(envs) [18:41:53.807] common <- intersect(names, old_names) [18:41:53.807] added <- setdiff(names, old_names) [18:41:53.807] removed <- setdiff(old_names, names) [18:41:53.807] changed <- common[...future.oldEnvVars[common] != [18:41:53.807] envs[common]] [18:41:53.807] NAMES <- toupper(changed) [18:41:53.807] args <- list() [18:41:53.807] for (kk in seq_along(NAMES)) { [18:41:53.807] name <- changed[[kk]] [18:41:53.807] NAME <- NAMES[[kk]] [18:41:53.807] if (name != NAME && is.element(NAME, old_names)) [18:41:53.807] next [18:41:53.807] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.807] } [18:41:53.807] NAMES <- toupper(added) [18:41:53.807] for (kk in seq_along(NAMES)) { [18:41:53.807] name <- added[[kk]] [18:41:53.807] NAME <- NAMES[[kk]] [18:41:53.807] if (name != NAME && is.element(NAME, old_names)) [18:41:53.807] next [18:41:53.807] args[[name]] <- "" [18:41:53.807] } [18:41:53.807] NAMES <- toupper(removed) [18:41:53.807] for (kk in seq_along(NAMES)) { [18:41:53.807] name <- removed[[kk]] [18:41:53.807] NAME <- NAMES[[kk]] [18:41:53.807] if (name != NAME && is.element(NAME, old_names)) [18:41:53.807] next [18:41:53.807] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.807] } [18:41:53.807] if (length(args) > 0) [18:41:53.807] base::do.call(base::Sys.setenv, args = args) [18:41:53.807] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.807] } [18:41:53.807] { [18:41:53.807] if (base::length(...future.futureOptionsAdded) > [18:41:53.807] 0L) { [18:41:53.807] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.807] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.807] base::options(opts) [18:41:53.807] } [18:41:53.807] { [18:41:53.807] { [18:41:53.807] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.807] NULL [18:41:53.807] } [18:41:53.807] options(future.plan = NULL) [18:41:53.807] if (is.na(NA_character_)) [18:41:53.807] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.807] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.807] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.807] .init = FALSE) [18:41:53.807] } [18:41:53.807] } [18:41:53.807] } [18:41:53.807] }) [18:41:53.807] if (TRUE) { [18:41:53.807] base::sink(type = "output", split = FALSE) [18:41:53.807] if (TRUE) { [18:41:53.807] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.807] } [18:41:53.807] else { [18:41:53.807] ...future.result["stdout"] <- base::list(NULL) [18:41:53.807] } [18:41:53.807] base::close(...future.stdout) [18:41:53.807] ...future.stdout <- NULL [18:41:53.807] } [18:41:53.807] ...future.result$conditions <- ...future.conditions [18:41:53.807] ...future.result$finished <- base::Sys.time() [18:41:53.807] ...future.result [18:41:53.807] } [18:41:53.813] Exporting 5 global objects (940 bytes) to cluster node #1 ... [18:41:53.813] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:53.813] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:53.813] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.814] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.814] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.814] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.815] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.815] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.815] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.816] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.816] Exporting 5 global objects (940 bytes) to cluster node #1 ... DONE [18:41:53.817] MultisessionFuture started [18:41:53.817] - Launch lazy future ... done [18:41:53.817] run() for 'MultisessionFuture' ... done [18:41:53.817] Created future: [18:41:53.837] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.837] - Validating connection of MultisessionFuture [18:41:53.837] - received message: FutureResult [18:41:53.838] - Received FutureResult [18:41:53.838] - Erased future from FutureRegistry [18:41:53.838] result() for ClusterFuture ... [18:41:53.838] - result already collected: FutureResult [18:41:53.838] result() for ClusterFuture ... done [18:41:53.839] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.817] MultisessionFuture: [18:41:53.817] Label: 'future_sapply-1' [18:41:53.817] Expression: [18:41:53.817] { [18:41:53.817] do.call(function(...) { [18:41:53.817] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.817] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.817] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.817] on.exit(options(oopts), add = TRUE) [18:41:53.817] } [18:41:53.817] { [18:41:53.817] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.817] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.817] ...future.FUN(...future.X_jj, ...) [18:41:53.817] }) [18:41:53.817] } [18:41:53.817] }, args = future.call.arguments) [18:41:53.817] } [18:41:53.817] Lazy evaluation: FALSE [18:41:53.817] Asynchronous evaluation: TRUE [18:41:53.817] Local evaluation: TRUE [18:41:53.817] Environment: R_GlobalEnv [18:41:53.817] Capture standard output: TRUE [18:41:53.817] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.817] Globals: 5 objects totaling 477 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.817] Packages: [18:41:53.817] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.817] Resolved: TRUE [18:41:53.817] Value: [18:41:53.817] Conditions captured: [18:41:53.817] Early signaling: FALSE [18:41:53.817] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.817] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.839] Chunk #1 of 2 ... DONE [18:41:53.839] Chunk #2 of 2 ... [18:41:53.839] - Finding globals in 'X' for chunk #2 ... [18:41:53.840] getGlobalsAndPackages() ... [18:41:53.840] Searching for globals... [18:41:53.840] [18:41:53.840] Searching for globals ... DONE [18:41:53.840] - globals: [0] [18:41:53.841] getGlobalsAndPackages() ... DONE [18:41:53.841] + additional globals found: [n=0] [18:41:53.841] + additional namespaces needed: [n=0] [18:41:53.841] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.841] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.841] - seeds: [18:41:53.842] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.842] getGlobalsAndPackages() ... [18:41:53.842] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.842] Resolving globals: FALSE [18:41:53.842] Tweak future expression to call with '...' arguments ... [18:41:53.842] { [18:41:53.842] do.call(function(...) { [18:41:53.842] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.842] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.842] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.842] on.exit(options(oopts), add = TRUE) [18:41:53.842] } [18:41:53.842] { [18:41:53.842] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.842] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.842] ...future.FUN(...future.X_jj, ...) [18:41:53.842] }) [18:41:53.842] } [18:41:53.842] }, args = future.call.arguments) [18:41:53.842] } [18:41:53.843] Tweak future expression to call with '...' arguments ... DONE [18:41:53.843] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.844] [18:41:53.844] getGlobalsAndPackages() ... DONE [18:41:53.844] run() for 'Future' ... [18:41:53.844] - state: 'created' [18:41:53.845] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.860] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.860] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.861] - Field: 'node' [18:41:53.861] - Field: 'label' [18:41:53.861] - Field: 'local' [18:41:53.861] - Field: 'owner' [18:41:53.861] - Field: 'envir' [18:41:53.861] - Field: 'workers' [18:41:53.862] - Field: 'packages' [18:41:53.862] - Field: 'gc' [18:41:53.862] - Field: 'conditions' [18:41:53.862] - Field: 'persistent' [18:41:53.862] - Field: 'expr' [18:41:53.863] - Field: 'uuid' [18:41:53.863] - Field: 'seed' [18:41:53.863] - Field: 'version' [18:41:53.863] - Field: 'result' [18:41:53.863] - Field: 'asynchronous' [18:41:53.864] - Field: 'calls' [18:41:53.864] - Field: 'globals' [18:41:53.864] - Field: 'stdout' [18:41:53.864] - Field: 'earlySignal' [18:41:53.864] - Field: 'lazy' [18:41:53.864] - Field: 'state' [18:41:53.865] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.865] - Launch lazy future ... [18:41:53.865] Packages needed by the future expression (n = 0): [18:41:53.865] Packages needed by future strategies (n = 0): [18:41:53.866] { [18:41:53.866] { [18:41:53.866] { [18:41:53.866] ...future.startTime <- base::Sys.time() [18:41:53.866] { [18:41:53.866] { [18:41:53.866] { [18:41:53.866] { [18:41:53.866] base::local({ [18:41:53.866] has_future <- base::requireNamespace("future", [18:41:53.866] quietly = TRUE) [18:41:53.866] if (has_future) { [18:41:53.866] ns <- base::getNamespace("future") [18:41:53.866] version <- ns[[".package"]][["version"]] [18:41:53.866] if (is.null(version)) [18:41:53.866] version <- utils::packageVersion("future") [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] version <- NULL [18:41:53.866] } [18:41:53.866] if (!has_future || version < "1.8.0") { [18:41:53.866] info <- base::c(r_version = base::gsub("R version ", [18:41:53.866] "", base::R.version$version.string), [18:41:53.866] platform = base::sprintf("%s (%s-bit)", [18:41:53.866] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.866] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.866] "release", "version")], collapse = " "), [18:41:53.866] hostname = base::Sys.info()[["nodename"]]) [18:41:53.866] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.866] info) [18:41:53.866] info <- base::paste(info, collapse = "; ") [18:41:53.866] if (!has_future) { [18:41:53.866] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.866] info) [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.866] info, version) [18:41:53.866] } [18:41:53.866] base::stop(msg) [18:41:53.866] } [18:41:53.866] }) [18:41:53.866] } [18:41:53.866] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.866] base::options(mc.cores = 1L) [18:41:53.866] } [18:41:53.866] ...future.strategy.old <- future::plan("list") [18:41:53.866] options(future.plan = NULL) [18:41:53.866] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.866] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.866] } [18:41:53.866] ...future.workdir <- getwd() [18:41:53.866] } [18:41:53.866] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.866] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.866] } [18:41:53.866] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.866] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.866] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.866] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.866] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.866] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.866] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.866] base::names(...future.oldOptions)) [18:41:53.866] } [18:41:53.866] if (FALSE) { [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] if (TRUE) { [18:41:53.866] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.866] open = "w") [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.866] windows = "NUL", "/dev/null"), open = "w") [18:41:53.866] } [18:41:53.866] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.866] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.866] base::sink(type = "output", split = FALSE) [18:41:53.866] base::close(...future.stdout) [18:41:53.866] }, add = TRUE) [18:41:53.866] } [18:41:53.866] ...future.frame <- base::sys.nframe() [18:41:53.866] ...future.conditions <- base::list() [18:41:53.866] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.866] if (FALSE) { [18:41:53.866] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.866] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.866] } [18:41:53.866] ...future.result <- base::tryCatch({ [18:41:53.866] base::withCallingHandlers({ [18:41:53.866] ...future.value <- base::withVisible(base::local({ [18:41:53.866] ...future.makeSendCondition <- base::local({ [18:41:53.866] sendCondition <- NULL [18:41:53.866] function(frame = 1L) { [18:41:53.866] if (is.function(sendCondition)) [18:41:53.866] return(sendCondition) [18:41:53.866] ns <- getNamespace("parallel") [18:41:53.866] if (exists("sendData", mode = "function", [18:41:53.866] envir = ns)) { [18:41:53.866] parallel_sendData <- get("sendData", mode = "function", [18:41:53.866] envir = ns) [18:41:53.866] envir <- sys.frame(frame) [18:41:53.866] master <- NULL [18:41:53.866] while (!identical(envir, .GlobalEnv) && [18:41:53.866] !identical(envir, emptyenv())) { [18:41:53.866] if (exists("master", mode = "list", envir = envir, [18:41:53.866] inherits = FALSE)) { [18:41:53.866] master <- get("master", mode = "list", [18:41:53.866] envir = envir, inherits = FALSE) [18:41:53.866] if (inherits(master, c("SOCKnode", [18:41:53.866] "SOCK0node"))) { [18:41:53.866] sendCondition <<- function(cond) { [18:41:53.866] data <- list(type = "VALUE", value = cond, [18:41:53.866] success = TRUE) [18:41:53.866] parallel_sendData(master, data) [18:41:53.866] } [18:41:53.866] return(sendCondition) [18:41:53.866] } [18:41:53.866] } [18:41:53.866] frame <- frame + 1L [18:41:53.866] envir <- sys.frame(frame) [18:41:53.866] } [18:41:53.866] } [18:41:53.866] sendCondition <<- function(cond) NULL [18:41:53.866] } [18:41:53.866] }) [18:41:53.866] withCallingHandlers({ [18:41:53.866] { [18:41:53.866] do.call(function(...) { [18:41:53.866] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.866] if (!identical(...future.globals.maxSize.org, [18:41:53.866] ...future.globals.maxSize)) { [18:41:53.866] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.866] on.exit(options(oopts), add = TRUE) [18:41:53.866] } [18:41:53.866] { [18:41:53.866] lapply(seq_along(...future.elements_ii), [18:41:53.866] FUN = function(jj) { [18:41:53.866] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.866] ...future.FUN(...future.X_jj, ...) [18:41:53.866] }) [18:41:53.866] } [18:41:53.866] }, args = future.call.arguments) [18:41:53.866] } [18:41:53.866] }, immediateCondition = function(cond) { [18:41:53.866] sendCondition <- ...future.makeSendCondition() [18:41:53.866] sendCondition(cond) [18:41:53.866] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.866] { [18:41:53.866] inherits <- base::inherits [18:41:53.866] invokeRestart <- base::invokeRestart [18:41:53.866] is.null <- base::is.null [18:41:53.866] muffled <- FALSE [18:41:53.866] if (inherits(cond, "message")) { [18:41:53.866] muffled <- grepl(pattern, "muffleMessage") [18:41:53.866] if (muffled) [18:41:53.866] invokeRestart("muffleMessage") [18:41:53.866] } [18:41:53.866] else if (inherits(cond, "warning")) { [18:41:53.866] muffled <- grepl(pattern, "muffleWarning") [18:41:53.866] if (muffled) [18:41:53.866] invokeRestart("muffleWarning") [18:41:53.866] } [18:41:53.866] else if (inherits(cond, "condition")) { [18:41:53.866] if (!is.null(pattern)) { [18:41:53.866] computeRestarts <- base::computeRestarts [18:41:53.866] grepl <- base::grepl [18:41:53.866] restarts <- computeRestarts(cond) [18:41:53.866] for (restart in restarts) { [18:41:53.866] name <- restart$name [18:41:53.866] if (is.null(name)) [18:41:53.866] next [18:41:53.866] if (!grepl(pattern, name)) [18:41:53.866] next [18:41:53.866] invokeRestart(restart) [18:41:53.866] muffled <- TRUE [18:41:53.866] break [18:41:53.866] } [18:41:53.866] } [18:41:53.866] } [18:41:53.866] invisible(muffled) [18:41:53.866] } [18:41:53.866] muffleCondition(cond) [18:41:53.866] }) [18:41:53.866] })) [18:41:53.866] future::FutureResult(value = ...future.value$value, [18:41:53.866] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.866] ...future.rng), globalenv = if (FALSE) [18:41:53.866] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.866] ...future.globalenv.names)) [18:41:53.866] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.866] }, condition = base::local({ [18:41:53.866] c <- base::c [18:41:53.866] inherits <- base::inherits [18:41:53.866] invokeRestart <- base::invokeRestart [18:41:53.866] length <- base::length [18:41:53.866] list <- base::list [18:41:53.866] seq.int <- base::seq.int [18:41:53.866] signalCondition <- base::signalCondition [18:41:53.866] sys.calls <- base::sys.calls [18:41:53.866] `[[` <- base::`[[` [18:41:53.866] `+` <- base::`+` [18:41:53.866] `<<-` <- base::`<<-` [18:41:53.866] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.866] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.866] 3L)] [18:41:53.866] } [18:41:53.866] function(cond) { [18:41:53.866] is_error <- inherits(cond, "error") [18:41:53.866] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.866] NULL) [18:41:53.866] if (is_error) { [18:41:53.866] sessionInformation <- function() { [18:41:53.866] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.866] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.866] search = base::search(), system = base::Sys.info()) [18:41:53.866] } [18:41:53.866] ...future.conditions[[length(...future.conditions) + [18:41:53.866] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.866] cond$call), session = sessionInformation(), [18:41:53.866] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.866] signalCondition(cond) [18:41:53.866] } [18:41:53.866] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.866] "immediateCondition"))) { [18:41:53.866] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.866] ...future.conditions[[length(...future.conditions) + [18:41:53.866] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.866] if (TRUE && !signal) { [18:41:53.866] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.866] { [18:41:53.866] inherits <- base::inherits [18:41:53.866] invokeRestart <- base::invokeRestart [18:41:53.866] is.null <- base::is.null [18:41:53.866] muffled <- FALSE [18:41:53.866] if (inherits(cond, "message")) { [18:41:53.866] muffled <- grepl(pattern, "muffleMessage") [18:41:53.866] if (muffled) [18:41:53.866] invokeRestart("muffleMessage") [18:41:53.866] } [18:41:53.866] else if (inherits(cond, "warning")) { [18:41:53.866] muffled <- grepl(pattern, "muffleWarning") [18:41:53.866] if (muffled) [18:41:53.866] invokeRestart("muffleWarning") [18:41:53.866] } [18:41:53.866] else if (inherits(cond, "condition")) { [18:41:53.866] if (!is.null(pattern)) { [18:41:53.866] computeRestarts <- base::computeRestarts [18:41:53.866] grepl <- base::grepl [18:41:53.866] restarts <- computeRestarts(cond) [18:41:53.866] for (restart in restarts) { [18:41:53.866] name <- restart$name [18:41:53.866] if (is.null(name)) [18:41:53.866] next [18:41:53.866] if (!grepl(pattern, name)) [18:41:53.866] next [18:41:53.866] invokeRestart(restart) [18:41:53.866] muffled <- TRUE [18:41:53.866] break [18:41:53.866] } [18:41:53.866] } [18:41:53.866] } [18:41:53.866] invisible(muffled) [18:41:53.866] } [18:41:53.866] muffleCondition(cond, pattern = "^muffle") [18:41:53.866] } [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] if (TRUE) { [18:41:53.866] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.866] { [18:41:53.866] inherits <- base::inherits [18:41:53.866] invokeRestart <- base::invokeRestart [18:41:53.866] is.null <- base::is.null [18:41:53.866] muffled <- FALSE [18:41:53.866] if (inherits(cond, "message")) { [18:41:53.866] muffled <- grepl(pattern, "muffleMessage") [18:41:53.866] if (muffled) [18:41:53.866] invokeRestart("muffleMessage") [18:41:53.866] } [18:41:53.866] else if (inherits(cond, "warning")) { [18:41:53.866] muffled <- grepl(pattern, "muffleWarning") [18:41:53.866] if (muffled) [18:41:53.866] invokeRestart("muffleWarning") [18:41:53.866] } [18:41:53.866] else if (inherits(cond, "condition")) { [18:41:53.866] if (!is.null(pattern)) { [18:41:53.866] computeRestarts <- base::computeRestarts [18:41:53.866] grepl <- base::grepl [18:41:53.866] restarts <- computeRestarts(cond) [18:41:53.866] for (restart in restarts) { [18:41:53.866] name <- restart$name [18:41:53.866] if (is.null(name)) [18:41:53.866] next [18:41:53.866] if (!grepl(pattern, name)) [18:41:53.866] next [18:41:53.866] invokeRestart(restart) [18:41:53.866] muffled <- TRUE [18:41:53.866] break [18:41:53.866] } [18:41:53.866] } [18:41:53.866] } [18:41:53.866] invisible(muffled) [18:41:53.866] } [18:41:53.866] muffleCondition(cond, pattern = "^muffle") [18:41:53.866] } [18:41:53.866] } [18:41:53.866] } [18:41:53.866] })) [18:41:53.866] }, error = function(ex) { [18:41:53.866] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.866] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.866] ...future.rng), started = ...future.startTime, [18:41:53.866] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.866] version = "1.8"), class = "FutureResult") [18:41:53.866] }, finally = { [18:41:53.866] if (!identical(...future.workdir, getwd())) [18:41:53.866] setwd(...future.workdir) [18:41:53.866] { [18:41:53.866] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.866] ...future.oldOptions$nwarnings <- NULL [18:41:53.866] } [18:41:53.866] base::options(...future.oldOptions) [18:41:53.866] if (.Platform$OS.type == "windows") { [18:41:53.866] old_names <- names(...future.oldEnvVars) [18:41:53.866] envs <- base::Sys.getenv() [18:41:53.866] names <- names(envs) [18:41:53.866] common <- intersect(names, old_names) [18:41:53.866] added <- setdiff(names, old_names) [18:41:53.866] removed <- setdiff(old_names, names) [18:41:53.866] changed <- common[...future.oldEnvVars[common] != [18:41:53.866] envs[common]] [18:41:53.866] NAMES <- toupper(changed) [18:41:53.866] args <- list() [18:41:53.866] for (kk in seq_along(NAMES)) { [18:41:53.866] name <- changed[[kk]] [18:41:53.866] NAME <- NAMES[[kk]] [18:41:53.866] if (name != NAME && is.element(NAME, old_names)) [18:41:53.866] next [18:41:53.866] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.866] } [18:41:53.866] NAMES <- toupper(added) [18:41:53.866] for (kk in seq_along(NAMES)) { [18:41:53.866] name <- added[[kk]] [18:41:53.866] NAME <- NAMES[[kk]] [18:41:53.866] if (name != NAME && is.element(NAME, old_names)) [18:41:53.866] next [18:41:53.866] args[[name]] <- "" [18:41:53.866] } [18:41:53.866] NAMES <- toupper(removed) [18:41:53.866] for (kk in seq_along(NAMES)) { [18:41:53.866] name <- removed[[kk]] [18:41:53.866] NAME <- NAMES[[kk]] [18:41:53.866] if (name != NAME && is.element(NAME, old_names)) [18:41:53.866] next [18:41:53.866] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.866] } [18:41:53.866] if (length(args) > 0) [18:41:53.866] base::do.call(base::Sys.setenv, args = args) [18:41:53.866] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.866] } [18:41:53.866] { [18:41:53.866] if (base::length(...future.futureOptionsAdded) > [18:41:53.866] 0L) { [18:41:53.866] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.866] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.866] base::options(opts) [18:41:53.866] } [18:41:53.866] { [18:41:53.866] { [18:41:53.866] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.866] NULL [18:41:53.866] } [18:41:53.866] options(future.plan = NULL) [18:41:53.866] if (is.na(NA_character_)) [18:41:53.866] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.866] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.866] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.866] .init = FALSE) [18:41:53.866] } [18:41:53.866] } [18:41:53.866] } [18:41:53.866] }) [18:41:53.866] if (TRUE) { [18:41:53.866] base::sink(type = "output", split = FALSE) [18:41:53.866] if (TRUE) { [18:41:53.866] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.866] } [18:41:53.866] else { [18:41:53.866] ...future.result["stdout"] <- base::list(NULL) [18:41:53.866] } [18:41:53.866] base::close(...future.stdout) [18:41:53.866] ...future.stdout <- NULL [18:41:53.866] } [18:41:53.866] ...future.result$conditions <- ...future.conditions [18:41:53.866] ...future.result$finished <- base::Sys.time() [18:41:53.866] ...future.result [18:41:53.866] } [18:41:53.871] Exporting 5 global objects (957 bytes) to cluster node #1 ... [18:41:53.872] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:53.872] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:53.872] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.873] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.873] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:53.873] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:53.874] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.874] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.874] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.875] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.875] Exporting 5 global objects (957 bytes) to cluster node #1 ... DONE [18:41:53.875] MultisessionFuture started [18:41:53.876] - Launch lazy future ... done [18:41:53.876] run() for 'MultisessionFuture' ... done [18:41:53.876] Created future: [18:41:53.891] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.891] - Validating connection of MultisessionFuture [18:41:53.892] - received message: FutureResult [18:41:53.892] - Received FutureResult [18:41:53.892] - Erased future from FutureRegistry [18:41:53.892] result() for ClusterFuture ... [18:41:53.892] - result already collected: FutureResult [18:41:53.892] result() for ClusterFuture ... done [18:41:53.893] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.876] MultisessionFuture: [18:41:53.876] Label: 'future_sapply-2' [18:41:53.876] Expression: [18:41:53.876] { [18:41:53.876] do.call(function(...) { [18:41:53.876] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.876] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.876] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.876] on.exit(options(oopts), add = TRUE) [18:41:53.876] } [18:41:53.876] { [18:41:53.876] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.876] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.876] ...future.FUN(...future.X_jj, ...) [18:41:53.876] }) [18:41:53.876] } [18:41:53.876] }, args = future.call.arguments) [18:41:53.876] } [18:41:53.876] Lazy evaluation: FALSE [18:41:53.876] Asynchronous evaluation: TRUE [18:41:53.876] Local evaluation: TRUE [18:41:53.876] Environment: R_GlobalEnv [18:41:53.876] Capture standard output: TRUE [18:41:53.876] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.876] Globals: 5 objects totaling 494 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.876] Packages: [18:41:53.876] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.876] Resolved: TRUE [18:41:53.876] Value: [18:41:53.876] Conditions captured: [18:41:53.876] Early signaling: FALSE [18:41:53.876] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.876] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.893] Chunk #2 of 2 ... DONE [18:41:53.893] Launching 2 futures (chunks) ... DONE [18:41:53.893] Resolving 2 futures (chunks) ... [18:41:53.894] resolve() on list ... [18:41:53.894] recursive: 0 [18:41:53.894] length: 2 [18:41:53.894] [18:41:53.894] Future #1 [18:41:53.895] result() for ClusterFuture ... [18:41:53.895] - result already collected: FutureResult [18:41:53.895] result() for ClusterFuture ... done [18:41:53.895] result() for ClusterFuture ... [18:41:53.895] - result already collected: FutureResult [18:41:53.895] result() for ClusterFuture ... done [18:41:53.896] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:53.896] - nx: 2 [18:41:53.896] - relay: TRUE [18:41:53.896] - stdout: TRUE [18:41:53.896] - signal: TRUE [18:41:53.900] - resignal: FALSE [18:41:53.900] - force: TRUE [18:41:53.900] - relayed: [n=2] FALSE, FALSE [18:41:53.900] - queued futures: [n=2] FALSE, FALSE [18:41:53.901] - until=1 [18:41:53.901] - relaying element #1 [18:41:53.901] result() for ClusterFuture ... [18:41:53.901] - result already collected: FutureResult [18:41:53.901] result() for ClusterFuture ... done [18:41:53.902] result() for ClusterFuture ... [18:41:53.902] - result already collected: FutureResult [18:41:53.902] result() for ClusterFuture ... done [18:41:53.902] result() for ClusterFuture ... [18:41:53.902] - result already collected: FutureResult [18:41:53.902] result() for ClusterFuture ... done [18:41:53.903] result() for ClusterFuture ... [18:41:53.903] - result already collected: FutureResult [18:41:53.903] result() for ClusterFuture ... done [18:41:53.903] - relayed: [n=2] TRUE, FALSE [18:41:53.903] - queued futures: [n=2] TRUE, FALSE [18:41:53.903] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:53.904] length: 1 (resolved future 1) [18:41:53.904] Future #2 [18:41:53.904] result() for ClusterFuture ... [18:41:53.904] - result already collected: FutureResult [18:41:53.904] result() for ClusterFuture ... done [18:41:53.904] result() for ClusterFuture ... [18:41:53.905] - result already collected: FutureResult [18:41:53.905] result() for ClusterFuture ... done [18:41:53.905] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:53.905] - nx: 2 [18:41:53.905] - relay: TRUE [18:41:53.905] - stdout: TRUE [18:41:53.905] - signal: TRUE [18:41:53.906] - resignal: FALSE [18:41:53.906] - force: TRUE [18:41:53.906] - relayed: [n=2] TRUE, FALSE [18:41:53.906] - queued futures: [n=2] TRUE, FALSE [18:41:53.906] - until=2 [18:41:53.906] - relaying element #2 [18:41:53.907] result() for ClusterFuture ... [18:41:53.907] - result already collected: FutureResult [18:41:53.907] result() for ClusterFuture ... done [18:41:53.907] result() for ClusterFuture ... [18:41:53.907] - result already collected: FutureResult [18:41:53.907] result() for ClusterFuture ... done [18:41:53.908] result() for ClusterFuture ... [18:41:53.908] - result already collected: FutureResult [18:41:53.908] result() for ClusterFuture ... done [18:41:53.908] result() for ClusterFuture ... [18:41:53.908] - result already collected: FutureResult [18:41:53.908] result() for ClusterFuture ... done [18:41:53.908] - relayed: [n=2] TRUE, TRUE [18:41:53.909] - queued futures: [n=2] TRUE, TRUE [18:41:53.909] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:53.909] length: 0 (resolved future 2) [18:41:53.909] Relaying remaining futures [18:41:53.909] signalConditionsASAP(NULL, pos=0) ... [18:41:53.909] - nx: 2 [18:41:53.910] - relay: TRUE [18:41:53.910] - stdout: TRUE [18:41:53.910] - signal: TRUE [18:41:53.910] - resignal: FALSE [18:41:53.910] - force: TRUE [18:41:53.910] - relayed: [n=2] TRUE, TRUE [18:41:53.910] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:53.911] - relayed: [n=2] TRUE, TRUE [18:41:53.911] - queued futures: [n=2] TRUE, TRUE [18:41:53.911] signalConditionsASAP(NULL, pos=0) ... done [18:41:53.911] resolve() on list ... DONE [18:41:53.911] result() for ClusterFuture ... [18:41:53.912] - result already collected: FutureResult [18:41:53.912] result() for ClusterFuture ... done [18:41:53.912] result() for ClusterFuture ... [18:41:53.912] - result already collected: FutureResult [18:41:53.912] result() for ClusterFuture ... done [18:41:53.912] result() for ClusterFuture ... [18:41:53.912] - result already collected: FutureResult [18:41:53.913] result() for ClusterFuture ... done [18:41:53.913] result() for ClusterFuture ... [18:41:53.913] - result already collected: FutureResult [18:41:53.913] result() for ClusterFuture ... done [18:41:53.913] - Number of value chunks collected: 2 [18:41:53.913] Resolving 2 futures (chunks) ... DONE [18:41:53.914] Reducing values from 2 chunks ... [18:41:53.914] - Number of values collected after concatenation: 3 [18:41:53.914] - Number of values expected: 3 [18:41:53.914] Reducing values from 2 chunks ... DONE [18:41:53.914] future_lapply() ... DONE List of 2 $ y0: chr [1:3] "a" "b" "c" $ y1: chr [1:3] "a" "b" "c" [18:41:53.915] future_lapply() ... [18:41:53.918] Number of chunks: 2 [18:41:53.919] getGlobalsAndPackagesXApply() ... [18:41:53.919] - future.globals: TRUE [18:41:53.919] getGlobalsAndPackages() ... [18:41:53.919] Searching for globals... [18:41:53.920] - globals found: [1] 'FUN' [18:41:53.921] Searching for globals ... DONE [18:41:53.921] Resolving globals: FALSE [18:41:53.921] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:53.922] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:53.922] - globals: [1] 'FUN' [18:41:53.922] [18:41:53.922] getGlobalsAndPackages() ... DONE [18:41:53.922] - globals found/used: [n=1] 'FUN' [18:41:53.922] - needed namespaces: [n=0] [18:41:53.923] Finding globals ... DONE [18:41:53.923] - use_args: TRUE [18:41:53.923] - Getting '...' globals ... [18:41:53.923] resolve() on list ... [18:41:53.924] recursive: 0 [18:41:53.924] length: 1 [18:41:53.924] elements: '...' [18:41:53.924] length: 0 (resolved future 1) [18:41:53.924] resolve() on list ... DONE [18:41:53.924] - '...' content: [n=0] [18:41:53.925] List of 1 [18:41:53.925] $ ...: list() [18:41:53.925] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.925] - attr(*, "where")=List of 1 [18:41:53.925] ..$ ...: [18:41:53.925] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.925] - attr(*, "resolved")= logi TRUE [18:41:53.925] - attr(*, "total_size")= num NA [18:41:53.928] - Getting '...' globals ... DONE [18:41:53.928] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:53.928] List of 2 [18:41:53.928] $ ...future.FUN:function (x) [18:41:53.928] $ ... : list() [18:41:53.928] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:53.928] - attr(*, "where")=List of 2 [18:41:53.928] ..$ ...future.FUN: [18:41:53.928] ..$ ... : [18:41:53.928] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:53.928] - attr(*, "resolved")= logi FALSE [18:41:53.928] - attr(*, "total_size")= int 4788 [18:41:53.931] Packages to be attached in all futures: [n=0] [18:41:53.932] getGlobalsAndPackagesXApply() ... DONE [18:41:53.932] Number of futures (= number of chunks): 2 [18:41:53.932] Launching 2 futures (chunks) ... [18:41:53.932] Chunk #1 of 2 ... [18:41:53.932] - Finding globals in 'X' for chunk #1 ... [18:41:53.933] getGlobalsAndPackages() ... [18:41:53.933] Searching for globals... [18:41:53.933] [18:41:53.933] Searching for globals ... DONE [18:41:53.933] - globals: [0] [18:41:53.934] getGlobalsAndPackages() ... DONE [18:41:53.934] + additional globals found: [n=0] [18:41:53.934] + additional namespaces needed: [n=0] [18:41:53.934] - Finding globals in 'X' for chunk #1 ... DONE [18:41:53.934] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.934] - seeds: [18:41:53.935] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.935] getGlobalsAndPackages() ... [18:41:53.935] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.935] Resolving globals: FALSE [18:41:53.935] Tweak future expression to call with '...' arguments ... [18:41:53.935] { [18:41:53.935] do.call(function(...) { [18:41:53.935] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.935] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.935] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.935] on.exit(options(oopts), add = TRUE) [18:41:53.935] } [18:41:53.935] { [18:41:53.935] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.935] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.935] ...future.FUN(...future.X_jj, ...) [18:41:53.935] }) [18:41:53.935] } [18:41:53.935] }, args = future.call.arguments) [18:41:53.935] } [18:41:53.936] Tweak future expression to call with '...' arguments ... DONE [18:41:53.936] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.937] [18:41:53.937] getGlobalsAndPackages() ... DONE [18:41:53.937] run() for 'Future' ... [18:41:53.937] - state: 'created' [18:41:53.938] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:53.954] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.954] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:53.954] - Field: 'node' [18:41:53.954] - Field: 'label' [18:41:53.954] - Field: 'local' [18:41:53.955] - Field: 'owner' [18:41:53.955] - Field: 'envir' [18:41:53.955] - Field: 'workers' [18:41:53.955] - Field: 'packages' [18:41:53.955] - Field: 'gc' [18:41:53.955] - Field: 'conditions' [18:41:53.956] - Field: 'persistent' [18:41:53.956] - Field: 'expr' [18:41:53.956] - Field: 'uuid' [18:41:53.956] - Field: 'seed' [18:41:53.956] - Field: 'version' [18:41:53.956] - Field: 'result' [18:41:53.957] - Field: 'asynchronous' [18:41:53.957] - Field: 'calls' [18:41:53.957] - Field: 'globals' [18:41:53.957] - Field: 'stdout' [18:41:53.957] - Field: 'earlySignal' [18:41:53.958] - Field: 'lazy' [18:41:53.958] - Field: 'state' [18:41:53.958] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:53.958] - Launch lazy future ... [18:41:53.958] Packages needed by the future expression (n = 0): [18:41:53.959] Packages needed by future strategies (n = 0): [18:41:53.959] { [18:41:53.959] { [18:41:53.959] { [18:41:53.959] ...future.startTime <- base::Sys.time() [18:41:53.959] { [18:41:53.959] { [18:41:53.959] { [18:41:53.959] { [18:41:53.959] base::local({ [18:41:53.959] has_future <- base::requireNamespace("future", [18:41:53.959] quietly = TRUE) [18:41:53.959] if (has_future) { [18:41:53.959] ns <- base::getNamespace("future") [18:41:53.959] version <- ns[[".package"]][["version"]] [18:41:53.959] if (is.null(version)) [18:41:53.959] version <- utils::packageVersion("future") [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] version <- NULL [18:41:53.959] } [18:41:53.959] if (!has_future || version < "1.8.0") { [18:41:53.959] info <- base::c(r_version = base::gsub("R version ", [18:41:53.959] "", base::R.version$version.string), [18:41:53.959] platform = base::sprintf("%s (%s-bit)", [18:41:53.959] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:53.959] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:53.959] "release", "version")], collapse = " "), [18:41:53.959] hostname = base::Sys.info()[["nodename"]]) [18:41:53.959] info <- base::sprintf("%s: %s", base::names(info), [18:41:53.959] info) [18:41:53.959] info <- base::paste(info, collapse = "; ") [18:41:53.959] if (!has_future) { [18:41:53.959] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:53.959] info) [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:53.959] info, version) [18:41:53.959] } [18:41:53.959] base::stop(msg) [18:41:53.959] } [18:41:53.959] }) [18:41:53.959] } [18:41:53.959] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:53.959] base::options(mc.cores = 1L) [18:41:53.959] } [18:41:53.959] ...future.strategy.old <- future::plan("list") [18:41:53.959] options(future.plan = NULL) [18:41:53.959] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.959] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:53.959] } [18:41:53.959] ...future.workdir <- getwd() [18:41:53.959] } [18:41:53.959] ...future.oldOptions <- base::as.list(base::.Options) [18:41:53.959] ...future.oldEnvVars <- base::Sys.getenv() [18:41:53.959] } [18:41:53.959] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:53.959] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:53.959] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:53.959] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:53.959] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:53.959] future.stdout.windows.reencode = NULL, width = 80L) [18:41:53.959] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:53.959] base::names(...future.oldOptions)) [18:41:53.959] } [18:41:53.959] if (FALSE) { [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] if (TRUE) { [18:41:53.959] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:53.959] open = "w") [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:53.959] windows = "NUL", "/dev/null"), open = "w") [18:41:53.959] } [18:41:53.959] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:53.959] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:53.959] base::sink(type = "output", split = FALSE) [18:41:53.959] base::close(...future.stdout) [18:41:53.959] }, add = TRUE) [18:41:53.959] } [18:41:53.959] ...future.frame <- base::sys.nframe() [18:41:53.959] ...future.conditions <- base::list() [18:41:53.959] ...future.rng <- base::globalenv()$.Random.seed [18:41:53.959] if (FALSE) { [18:41:53.959] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:53.959] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:53.959] } [18:41:53.959] ...future.result <- base::tryCatch({ [18:41:53.959] base::withCallingHandlers({ [18:41:53.959] ...future.value <- base::withVisible(base::local({ [18:41:53.959] ...future.makeSendCondition <- base::local({ [18:41:53.959] sendCondition <- NULL [18:41:53.959] function(frame = 1L) { [18:41:53.959] if (is.function(sendCondition)) [18:41:53.959] return(sendCondition) [18:41:53.959] ns <- getNamespace("parallel") [18:41:53.959] if (exists("sendData", mode = "function", [18:41:53.959] envir = ns)) { [18:41:53.959] parallel_sendData <- get("sendData", mode = "function", [18:41:53.959] envir = ns) [18:41:53.959] envir <- sys.frame(frame) [18:41:53.959] master <- NULL [18:41:53.959] while (!identical(envir, .GlobalEnv) && [18:41:53.959] !identical(envir, emptyenv())) { [18:41:53.959] if (exists("master", mode = "list", envir = envir, [18:41:53.959] inherits = FALSE)) { [18:41:53.959] master <- get("master", mode = "list", [18:41:53.959] envir = envir, inherits = FALSE) [18:41:53.959] if (inherits(master, c("SOCKnode", [18:41:53.959] "SOCK0node"))) { [18:41:53.959] sendCondition <<- function(cond) { [18:41:53.959] data <- list(type = "VALUE", value = cond, [18:41:53.959] success = TRUE) [18:41:53.959] parallel_sendData(master, data) [18:41:53.959] } [18:41:53.959] return(sendCondition) [18:41:53.959] } [18:41:53.959] } [18:41:53.959] frame <- frame + 1L [18:41:53.959] envir <- sys.frame(frame) [18:41:53.959] } [18:41:53.959] } [18:41:53.959] sendCondition <<- function(cond) NULL [18:41:53.959] } [18:41:53.959] }) [18:41:53.959] withCallingHandlers({ [18:41:53.959] { [18:41:53.959] do.call(function(...) { [18:41:53.959] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.959] if (!identical(...future.globals.maxSize.org, [18:41:53.959] ...future.globals.maxSize)) { [18:41:53.959] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.959] on.exit(options(oopts), add = TRUE) [18:41:53.959] } [18:41:53.959] { [18:41:53.959] lapply(seq_along(...future.elements_ii), [18:41:53.959] FUN = function(jj) { [18:41:53.959] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.959] ...future.FUN(...future.X_jj, ...) [18:41:53.959] }) [18:41:53.959] } [18:41:53.959] }, args = future.call.arguments) [18:41:53.959] } [18:41:53.959] }, immediateCondition = function(cond) { [18:41:53.959] sendCondition <- ...future.makeSendCondition() [18:41:53.959] sendCondition(cond) [18:41:53.959] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.959] { [18:41:53.959] inherits <- base::inherits [18:41:53.959] invokeRestart <- base::invokeRestart [18:41:53.959] is.null <- base::is.null [18:41:53.959] muffled <- FALSE [18:41:53.959] if (inherits(cond, "message")) { [18:41:53.959] muffled <- grepl(pattern, "muffleMessage") [18:41:53.959] if (muffled) [18:41:53.959] invokeRestart("muffleMessage") [18:41:53.959] } [18:41:53.959] else if (inherits(cond, "warning")) { [18:41:53.959] muffled <- grepl(pattern, "muffleWarning") [18:41:53.959] if (muffled) [18:41:53.959] invokeRestart("muffleWarning") [18:41:53.959] } [18:41:53.959] else if (inherits(cond, "condition")) { [18:41:53.959] if (!is.null(pattern)) { [18:41:53.959] computeRestarts <- base::computeRestarts [18:41:53.959] grepl <- base::grepl [18:41:53.959] restarts <- computeRestarts(cond) [18:41:53.959] for (restart in restarts) { [18:41:53.959] name <- restart$name [18:41:53.959] if (is.null(name)) [18:41:53.959] next [18:41:53.959] if (!grepl(pattern, name)) [18:41:53.959] next [18:41:53.959] invokeRestart(restart) [18:41:53.959] muffled <- TRUE [18:41:53.959] break [18:41:53.959] } [18:41:53.959] } [18:41:53.959] } [18:41:53.959] invisible(muffled) [18:41:53.959] } [18:41:53.959] muffleCondition(cond) [18:41:53.959] }) [18:41:53.959] })) [18:41:53.959] future::FutureResult(value = ...future.value$value, [18:41:53.959] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.959] ...future.rng), globalenv = if (FALSE) [18:41:53.959] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:53.959] ...future.globalenv.names)) [18:41:53.959] else NULL, started = ...future.startTime, version = "1.8") [18:41:53.959] }, condition = base::local({ [18:41:53.959] c <- base::c [18:41:53.959] inherits <- base::inherits [18:41:53.959] invokeRestart <- base::invokeRestart [18:41:53.959] length <- base::length [18:41:53.959] list <- base::list [18:41:53.959] seq.int <- base::seq.int [18:41:53.959] signalCondition <- base::signalCondition [18:41:53.959] sys.calls <- base::sys.calls [18:41:53.959] `[[` <- base::`[[` [18:41:53.959] `+` <- base::`+` [18:41:53.959] `<<-` <- base::`<<-` [18:41:53.959] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:53.959] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:53.959] 3L)] [18:41:53.959] } [18:41:53.959] function(cond) { [18:41:53.959] is_error <- inherits(cond, "error") [18:41:53.959] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:53.959] NULL) [18:41:53.959] if (is_error) { [18:41:53.959] sessionInformation <- function() { [18:41:53.959] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:53.959] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:53.959] search = base::search(), system = base::Sys.info()) [18:41:53.959] } [18:41:53.959] ...future.conditions[[length(...future.conditions) + [18:41:53.959] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:53.959] cond$call), session = sessionInformation(), [18:41:53.959] timestamp = base::Sys.time(), signaled = 0L) [18:41:53.959] signalCondition(cond) [18:41:53.959] } [18:41:53.959] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:53.959] "immediateCondition"))) { [18:41:53.959] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:53.959] ...future.conditions[[length(...future.conditions) + [18:41:53.959] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:53.959] if (TRUE && !signal) { [18:41:53.959] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.959] { [18:41:53.959] inherits <- base::inherits [18:41:53.959] invokeRestart <- base::invokeRestart [18:41:53.959] is.null <- base::is.null [18:41:53.959] muffled <- FALSE [18:41:53.959] if (inherits(cond, "message")) { [18:41:53.959] muffled <- grepl(pattern, "muffleMessage") [18:41:53.959] if (muffled) [18:41:53.959] invokeRestart("muffleMessage") [18:41:53.959] } [18:41:53.959] else if (inherits(cond, "warning")) { [18:41:53.959] muffled <- grepl(pattern, "muffleWarning") [18:41:53.959] if (muffled) [18:41:53.959] invokeRestart("muffleWarning") [18:41:53.959] } [18:41:53.959] else if (inherits(cond, "condition")) { [18:41:53.959] if (!is.null(pattern)) { [18:41:53.959] computeRestarts <- base::computeRestarts [18:41:53.959] grepl <- base::grepl [18:41:53.959] restarts <- computeRestarts(cond) [18:41:53.959] for (restart in restarts) { [18:41:53.959] name <- restart$name [18:41:53.959] if (is.null(name)) [18:41:53.959] next [18:41:53.959] if (!grepl(pattern, name)) [18:41:53.959] next [18:41:53.959] invokeRestart(restart) [18:41:53.959] muffled <- TRUE [18:41:53.959] break [18:41:53.959] } [18:41:53.959] } [18:41:53.959] } [18:41:53.959] invisible(muffled) [18:41:53.959] } [18:41:53.959] muffleCondition(cond, pattern = "^muffle") [18:41:53.959] } [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] if (TRUE) { [18:41:53.959] muffleCondition <- function (cond, pattern = "^muffle") [18:41:53.959] { [18:41:53.959] inherits <- base::inherits [18:41:53.959] invokeRestart <- base::invokeRestart [18:41:53.959] is.null <- base::is.null [18:41:53.959] muffled <- FALSE [18:41:53.959] if (inherits(cond, "message")) { [18:41:53.959] muffled <- grepl(pattern, "muffleMessage") [18:41:53.959] if (muffled) [18:41:53.959] invokeRestart("muffleMessage") [18:41:53.959] } [18:41:53.959] else if (inherits(cond, "warning")) { [18:41:53.959] muffled <- grepl(pattern, "muffleWarning") [18:41:53.959] if (muffled) [18:41:53.959] invokeRestart("muffleWarning") [18:41:53.959] } [18:41:53.959] else if (inherits(cond, "condition")) { [18:41:53.959] if (!is.null(pattern)) { [18:41:53.959] computeRestarts <- base::computeRestarts [18:41:53.959] grepl <- base::grepl [18:41:53.959] restarts <- computeRestarts(cond) [18:41:53.959] for (restart in restarts) { [18:41:53.959] name <- restart$name [18:41:53.959] if (is.null(name)) [18:41:53.959] next [18:41:53.959] if (!grepl(pattern, name)) [18:41:53.959] next [18:41:53.959] invokeRestart(restart) [18:41:53.959] muffled <- TRUE [18:41:53.959] break [18:41:53.959] } [18:41:53.959] } [18:41:53.959] } [18:41:53.959] invisible(muffled) [18:41:53.959] } [18:41:53.959] muffleCondition(cond, pattern = "^muffle") [18:41:53.959] } [18:41:53.959] } [18:41:53.959] } [18:41:53.959] })) [18:41:53.959] }, error = function(ex) { [18:41:53.959] base::structure(base::list(value = NULL, visible = NULL, [18:41:53.959] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:53.959] ...future.rng), started = ...future.startTime, [18:41:53.959] finished = Sys.time(), session_uuid = NA_character_, [18:41:53.959] version = "1.8"), class = "FutureResult") [18:41:53.959] }, finally = { [18:41:53.959] if (!identical(...future.workdir, getwd())) [18:41:53.959] setwd(...future.workdir) [18:41:53.959] { [18:41:53.959] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:53.959] ...future.oldOptions$nwarnings <- NULL [18:41:53.959] } [18:41:53.959] base::options(...future.oldOptions) [18:41:53.959] if (.Platform$OS.type == "windows") { [18:41:53.959] old_names <- names(...future.oldEnvVars) [18:41:53.959] envs <- base::Sys.getenv() [18:41:53.959] names <- names(envs) [18:41:53.959] common <- intersect(names, old_names) [18:41:53.959] added <- setdiff(names, old_names) [18:41:53.959] removed <- setdiff(old_names, names) [18:41:53.959] changed <- common[...future.oldEnvVars[common] != [18:41:53.959] envs[common]] [18:41:53.959] NAMES <- toupper(changed) [18:41:53.959] args <- list() [18:41:53.959] for (kk in seq_along(NAMES)) { [18:41:53.959] name <- changed[[kk]] [18:41:53.959] NAME <- NAMES[[kk]] [18:41:53.959] if (name != NAME && is.element(NAME, old_names)) [18:41:53.959] next [18:41:53.959] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.959] } [18:41:53.959] NAMES <- toupper(added) [18:41:53.959] for (kk in seq_along(NAMES)) { [18:41:53.959] name <- added[[kk]] [18:41:53.959] NAME <- NAMES[[kk]] [18:41:53.959] if (name != NAME && is.element(NAME, old_names)) [18:41:53.959] next [18:41:53.959] args[[name]] <- "" [18:41:53.959] } [18:41:53.959] NAMES <- toupper(removed) [18:41:53.959] for (kk in seq_along(NAMES)) { [18:41:53.959] name <- removed[[kk]] [18:41:53.959] NAME <- NAMES[[kk]] [18:41:53.959] if (name != NAME && is.element(NAME, old_names)) [18:41:53.959] next [18:41:53.959] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:53.959] } [18:41:53.959] if (length(args) > 0) [18:41:53.959] base::do.call(base::Sys.setenv, args = args) [18:41:53.959] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:53.959] } [18:41:53.959] { [18:41:53.959] if (base::length(...future.futureOptionsAdded) > [18:41:53.959] 0L) { [18:41:53.959] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:53.959] base::names(opts) <- ...future.futureOptionsAdded [18:41:53.959] base::options(opts) [18:41:53.959] } [18:41:53.959] { [18:41:53.959] { [18:41:53.959] base::options(mc.cores = ...future.mc.cores.old) [18:41:53.959] NULL [18:41:53.959] } [18:41:53.959] options(future.plan = NULL) [18:41:53.959] if (is.na(NA_character_)) [18:41:53.959] Sys.unsetenv("R_FUTURE_PLAN") [18:41:53.959] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:53.959] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:53.959] .init = FALSE) [18:41:53.959] } [18:41:53.959] } [18:41:53.959] } [18:41:53.959] }) [18:41:53.959] if (TRUE) { [18:41:53.959] base::sink(type = "output", split = FALSE) [18:41:53.959] if (TRUE) { [18:41:53.959] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:53.959] } [18:41:53.959] else { [18:41:53.959] ...future.result["stdout"] <- base::list(NULL) [18:41:53.959] } [18:41:53.959] base::close(...future.stdout) [18:41:53.959] ...future.stdout <- NULL [18:41:53.959] } [18:41:53.959] ...future.result$conditions <- ...future.conditions [18:41:53.959] ...future.result$finished <- base::Sys.time() [18:41:53.959] ...future.result [18:41:53.959] } [18:41:53.964] Exporting 5 global objects (847 bytes) to cluster node #1 ... [18:41:53.965] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:53.965] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:53.965] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:53.966] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:53.966] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:53.966] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:53.966] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:53.967] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:53.967] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:53.967] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:53.968] Exporting 5 global objects (847 bytes) to cluster node #1 ... DONE [18:41:53.968] MultisessionFuture started [18:41:53.969] - Launch lazy future ... done [18:41:53.969] run() for 'MultisessionFuture' ... done [18:41:53.969] Created future: [18:41:53.985] receiveMessageFromWorker() for ClusterFuture ... [18:41:53.985] - Validating connection of MultisessionFuture [18:41:53.986] - received message: FutureResult [18:41:53.986] - Received FutureResult [18:41:53.986] - Erased future from FutureRegistry [18:41:53.986] result() for ClusterFuture ... [18:41:53.986] - result already collected: FutureResult [18:41:53.987] result() for ClusterFuture ... done [18:41:53.987] receiveMessageFromWorker() for ClusterFuture ... done [18:41:53.969] MultisessionFuture: [18:41:53.969] Label: 'future_sapply-1' [18:41:53.969] Expression: [18:41:53.969] { [18:41:53.969] do.call(function(...) { [18:41:53.969] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.969] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.969] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.969] on.exit(options(oopts), add = TRUE) [18:41:53.969] } [18:41:53.969] { [18:41:53.969] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.969] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.969] ...future.FUN(...future.X_jj, ...) [18:41:53.969] }) [18:41:53.969] } [18:41:53.969] }, args = future.call.arguments) [18:41:53.969] } [18:41:53.969] Lazy evaluation: FALSE [18:41:53.969] Asynchronous evaluation: TRUE [18:41:53.969] Local evaluation: TRUE [18:41:53.969] Environment: R_GlobalEnv [18:41:53.969] Capture standard output: TRUE [18:41:53.969] Capture condition classes: 'condition' (excluding 'nothing') [18:41:53.969] Globals: 5 objects totaling 384 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:53.969] Packages: [18:41:53.969] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:53.969] Resolved: TRUE [18:41:53.969] Value: [18:41:53.969] Conditions captured: [18:41:53.969] Early signaling: FALSE [18:41:53.969] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:53.969] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:53.987] Chunk #1 of 2 ... DONE [18:41:53.987] Chunk #2 of 2 ... [18:41:53.988] - Finding globals in 'X' for chunk #2 ... [18:41:53.988] getGlobalsAndPackages() ... [18:41:53.988] Searching for globals... [18:41:53.988] [18:41:53.988] Searching for globals ... DONE [18:41:53.989] - globals: [0] [18:41:53.989] getGlobalsAndPackages() ... DONE [18:41:53.989] + additional globals found: [n=0] [18:41:53.989] + additional namespaces needed: [n=0] [18:41:53.989] - Finding globals in 'X' for chunk #2 ... DONE [18:41:53.989] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:53.990] - seeds: [18:41:53.990] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.990] getGlobalsAndPackages() ... [18:41:53.990] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.990] Resolving globals: FALSE [18:41:53.990] Tweak future expression to call with '...' arguments ... [18:41:53.991] { [18:41:53.991] do.call(function(...) { [18:41:53.991] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:53.991] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:53.991] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:53.991] on.exit(options(oopts), add = TRUE) [18:41:53.991] } [18:41:53.991] { [18:41:53.991] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:53.991] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:53.991] ...future.FUN(...future.X_jj, ...) [18:41:53.991] }) [18:41:53.991] } [18:41:53.991] }, args = future.call.arguments) [18:41:53.991] } [18:41:53.991] Tweak future expression to call with '...' arguments ... DONE [18:41:53.992] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:53.992] [18:41:53.992] getGlobalsAndPackages() ... DONE [18:41:53.992] run() for 'Future' ... [18:41:53.992] - state: 'created' [18:41:53.993] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.008] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.008] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.008] - Field: 'node' [18:41:54.008] - Field: 'label' [18:41:54.008] - Field: 'local' [18:41:54.009] - Field: 'owner' [18:41:54.009] - Field: 'envir' [18:41:54.009] - Field: 'workers' [18:41:54.009] - Field: 'packages' [18:41:54.009] - Field: 'gc' [18:41:54.009] - Field: 'conditions' [18:41:54.010] - Field: 'persistent' [18:41:54.010] - Field: 'expr' [18:41:54.010] - Field: 'uuid' [18:41:54.010] - Field: 'seed' [18:41:54.010] - Field: 'version' [18:41:54.011] - Field: 'result' [18:41:54.011] - Field: 'asynchronous' [18:41:54.011] - Field: 'calls' [18:41:54.011] - Field: 'globals' [18:41:54.011] - Field: 'stdout' [18:41:54.011] - Field: 'earlySignal' [18:41:54.012] - Field: 'lazy' [18:41:54.012] - Field: 'state' [18:41:54.012] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.012] - Launch lazy future ... [18:41:54.012] Packages needed by the future expression (n = 0): [18:41:54.013] Packages needed by future strategies (n = 0): [18:41:54.013] { [18:41:54.013] { [18:41:54.013] { [18:41:54.013] ...future.startTime <- base::Sys.time() [18:41:54.013] { [18:41:54.013] { [18:41:54.013] { [18:41:54.013] { [18:41:54.013] base::local({ [18:41:54.013] has_future <- base::requireNamespace("future", [18:41:54.013] quietly = TRUE) [18:41:54.013] if (has_future) { [18:41:54.013] ns <- base::getNamespace("future") [18:41:54.013] version <- ns[[".package"]][["version"]] [18:41:54.013] if (is.null(version)) [18:41:54.013] version <- utils::packageVersion("future") [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] version <- NULL [18:41:54.013] } [18:41:54.013] if (!has_future || version < "1.8.0") { [18:41:54.013] info <- base::c(r_version = base::gsub("R version ", [18:41:54.013] "", base::R.version$version.string), [18:41:54.013] platform = base::sprintf("%s (%s-bit)", [18:41:54.013] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.013] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.013] "release", "version")], collapse = " "), [18:41:54.013] hostname = base::Sys.info()[["nodename"]]) [18:41:54.013] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.013] info) [18:41:54.013] info <- base::paste(info, collapse = "; ") [18:41:54.013] if (!has_future) { [18:41:54.013] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.013] info) [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.013] info, version) [18:41:54.013] } [18:41:54.013] base::stop(msg) [18:41:54.013] } [18:41:54.013] }) [18:41:54.013] } [18:41:54.013] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.013] base::options(mc.cores = 1L) [18:41:54.013] } [18:41:54.013] ...future.strategy.old <- future::plan("list") [18:41:54.013] options(future.plan = NULL) [18:41:54.013] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.013] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.013] } [18:41:54.013] ...future.workdir <- getwd() [18:41:54.013] } [18:41:54.013] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.013] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.013] } [18:41:54.013] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.013] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.013] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.013] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.013] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.013] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.013] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.013] base::names(...future.oldOptions)) [18:41:54.013] } [18:41:54.013] if (FALSE) { [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] if (TRUE) { [18:41:54.013] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.013] open = "w") [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.013] windows = "NUL", "/dev/null"), open = "w") [18:41:54.013] } [18:41:54.013] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.013] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.013] base::sink(type = "output", split = FALSE) [18:41:54.013] base::close(...future.stdout) [18:41:54.013] }, add = TRUE) [18:41:54.013] } [18:41:54.013] ...future.frame <- base::sys.nframe() [18:41:54.013] ...future.conditions <- base::list() [18:41:54.013] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.013] if (FALSE) { [18:41:54.013] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.013] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.013] } [18:41:54.013] ...future.result <- base::tryCatch({ [18:41:54.013] base::withCallingHandlers({ [18:41:54.013] ...future.value <- base::withVisible(base::local({ [18:41:54.013] ...future.makeSendCondition <- base::local({ [18:41:54.013] sendCondition <- NULL [18:41:54.013] function(frame = 1L) { [18:41:54.013] if (is.function(sendCondition)) [18:41:54.013] return(sendCondition) [18:41:54.013] ns <- getNamespace("parallel") [18:41:54.013] if (exists("sendData", mode = "function", [18:41:54.013] envir = ns)) { [18:41:54.013] parallel_sendData <- get("sendData", mode = "function", [18:41:54.013] envir = ns) [18:41:54.013] envir <- sys.frame(frame) [18:41:54.013] master <- NULL [18:41:54.013] while (!identical(envir, .GlobalEnv) && [18:41:54.013] !identical(envir, emptyenv())) { [18:41:54.013] if (exists("master", mode = "list", envir = envir, [18:41:54.013] inherits = FALSE)) { [18:41:54.013] master <- get("master", mode = "list", [18:41:54.013] envir = envir, inherits = FALSE) [18:41:54.013] if (inherits(master, c("SOCKnode", [18:41:54.013] "SOCK0node"))) { [18:41:54.013] sendCondition <<- function(cond) { [18:41:54.013] data <- list(type = "VALUE", value = cond, [18:41:54.013] success = TRUE) [18:41:54.013] parallel_sendData(master, data) [18:41:54.013] } [18:41:54.013] return(sendCondition) [18:41:54.013] } [18:41:54.013] } [18:41:54.013] frame <- frame + 1L [18:41:54.013] envir <- sys.frame(frame) [18:41:54.013] } [18:41:54.013] } [18:41:54.013] sendCondition <<- function(cond) NULL [18:41:54.013] } [18:41:54.013] }) [18:41:54.013] withCallingHandlers({ [18:41:54.013] { [18:41:54.013] do.call(function(...) { [18:41:54.013] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.013] if (!identical(...future.globals.maxSize.org, [18:41:54.013] ...future.globals.maxSize)) { [18:41:54.013] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.013] on.exit(options(oopts), add = TRUE) [18:41:54.013] } [18:41:54.013] { [18:41:54.013] lapply(seq_along(...future.elements_ii), [18:41:54.013] FUN = function(jj) { [18:41:54.013] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.013] ...future.FUN(...future.X_jj, ...) [18:41:54.013] }) [18:41:54.013] } [18:41:54.013] }, args = future.call.arguments) [18:41:54.013] } [18:41:54.013] }, immediateCondition = function(cond) { [18:41:54.013] sendCondition <- ...future.makeSendCondition() [18:41:54.013] sendCondition(cond) [18:41:54.013] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.013] { [18:41:54.013] inherits <- base::inherits [18:41:54.013] invokeRestart <- base::invokeRestart [18:41:54.013] is.null <- base::is.null [18:41:54.013] muffled <- FALSE [18:41:54.013] if (inherits(cond, "message")) { [18:41:54.013] muffled <- grepl(pattern, "muffleMessage") [18:41:54.013] if (muffled) [18:41:54.013] invokeRestart("muffleMessage") [18:41:54.013] } [18:41:54.013] else if (inherits(cond, "warning")) { [18:41:54.013] muffled <- grepl(pattern, "muffleWarning") [18:41:54.013] if (muffled) [18:41:54.013] invokeRestart("muffleWarning") [18:41:54.013] } [18:41:54.013] else if (inherits(cond, "condition")) { [18:41:54.013] if (!is.null(pattern)) { [18:41:54.013] computeRestarts <- base::computeRestarts [18:41:54.013] grepl <- base::grepl [18:41:54.013] restarts <- computeRestarts(cond) [18:41:54.013] for (restart in restarts) { [18:41:54.013] name <- restart$name [18:41:54.013] if (is.null(name)) [18:41:54.013] next [18:41:54.013] if (!grepl(pattern, name)) [18:41:54.013] next [18:41:54.013] invokeRestart(restart) [18:41:54.013] muffled <- TRUE [18:41:54.013] break [18:41:54.013] } [18:41:54.013] } [18:41:54.013] } [18:41:54.013] invisible(muffled) [18:41:54.013] } [18:41:54.013] muffleCondition(cond) [18:41:54.013] }) [18:41:54.013] })) [18:41:54.013] future::FutureResult(value = ...future.value$value, [18:41:54.013] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.013] ...future.rng), globalenv = if (FALSE) [18:41:54.013] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.013] ...future.globalenv.names)) [18:41:54.013] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.013] }, condition = base::local({ [18:41:54.013] c <- base::c [18:41:54.013] inherits <- base::inherits [18:41:54.013] invokeRestart <- base::invokeRestart [18:41:54.013] length <- base::length [18:41:54.013] list <- base::list [18:41:54.013] seq.int <- base::seq.int [18:41:54.013] signalCondition <- base::signalCondition [18:41:54.013] sys.calls <- base::sys.calls [18:41:54.013] `[[` <- base::`[[` [18:41:54.013] `+` <- base::`+` [18:41:54.013] `<<-` <- base::`<<-` [18:41:54.013] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.013] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.013] 3L)] [18:41:54.013] } [18:41:54.013] function(cond) { [18:41:54.013] is_error <- inherits(cond, "error") [18:41:54.013] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.013] NULL) [18:41:54.013] if (is_error) { [18:41:54.013] sessionInformation <- function() { [18:41:54.013] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.013] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.013] search = base::search(), system = base::Sys.info()) [18:41:54.013] } [18:41:54.013] ...future.conditions[[length(...future.conditions) + [18:41:54.013] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.013] cond$call), session = sessionInformation(), [18:41:54.013] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.013] signalCondition(cond) [18:41:54.013] } [18:41:54.013] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.013] "immediateCondition"))) { [18:41:54.013] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.013] ...future.conditions[[length(...future.conditions) + [18:41:54.013] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.013] if (TRUE && !signal) { [18:41:54.013] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.013] { [18:41:54.013] inherits <- base::inherits [18:41:54.013] invokeRestart <- base::invokeRestart [18:41:54.013] is.null <- base::is.null [18:41:54.013] muffled <- FALSE [18:41:54.013] if (inherits(cond, "message")) { [18:41:54.013] muffled <- grepl(pattern, "muffleMessage") [18:41:54.013] if (muffled) [18:41:54.013] invokeRestart("muffleMessage") [18:41:54.013] } [18:41:54.013] else if (inherits(cond, "warning")) { [18:41:54.013] muffled <- grepl(pattern, "muffleWarning") [18:41:54.013] if (muffled) [18:41:54.013] invokeRestart("muffleWarning") [18:41:54.013] } [18:41:54.013] else if (inherits(cond, "condition")) { [18:41:54.013] if (!is.null(pattern)) { [18:41:54.013] computeRestarts <- base::computeRestarts [18:41:54.013] grepl <- base::grepl [18:41:54.013] restarts <- computeRestarts(cond) [18:41:54.013] for (restart in restarts) { [18:41:54.013] name <- restart$name [18:41:54.013] if (is.null(name)) [18:41:54.013] next [18:41:54.013] if (!grepl(pattern, name)) [18:41:54.013] next [18:41:54.013] invokeRestart(restart) [18:41:54.013] muffled <- TRUE [18:41:54.013] break [18:41:54.013] } [18:41:54.013] } [18:41:54.013] } [18:41:54.013] invisible(muffled) [18:41:54.013] } [18:41:54.013] muffleCondition(cond, pattern = "^muffle") [18:41:54.013] } [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] if (TRUE) { [18:41:54.013] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.013] { [18:41:54.013] inherits <- base::inherits [18:41:54.013] invokeRestart <- base::invokeRestart [18:41:54.013] is.null <- base::is.null [18:41:54.013] muffled <- FALSE [18:41:54.013] if (inherits(cond, "message")) { [18:41:54.013] muffled <- grepl(pattern, "muffleMessage") [18:41:54.013] if (muffled) [18:41:54.013] invokeRestart("muffleMessage") [18:41:54.013] } [18:41:54.013] else if (inherits(cond, "warning")) { [18:41:54.013] muffled <- grepl(pattern, "muffleWarning") [18:41:54.013] if (muffled) [18:41:54.013] invokeRestart("muffleWarning") [18:41:54.013] } [18:41:54.013] else if (inherits(cond, "condition")) { [18:41:54.013] if (!is.null(pattern)) { [18:41:54.013] computeRestarts <- base::computeRestarts [18:41:54.013] grepl <- base::grepl [18:41:54.013] restarts <- computeRestarts(cond) [18:41:54.013] for (restart in restarts) { [18:41:54.013] name <- restart$name [18:41:54.013] if (is.null(name)) [18:41:54.013] next [18:41:54.013] if (!grepl(pattern, name)) [18:41:54.013] next [18:41:54.013] invokeRestart(restart) [18:41:54.013] muffled <- TRUE [18:41:54.013] break [18:41:54.013] } [18:41:54.013] } [18:41:54.013] } [18:41:54.013] invisible(muffled) [18:41:54.013] } [18:41:54.013] muffleCondition(cond, pattern = "^muffle") [18:41:54.013] } [18:41:54.013] } [18:41:54.013] } [18:41:54.013] })) [18:41:54.013] }, error = function(ex) { [18:41:54.013] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.013] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.013] ...future.rng), started = ...future.startTime, [18:41:54.013] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.013] version = "1.8"), class = "FutureResult") [18:41:54.013] }, finally = { [18:41:54.013] if (!identical(...future.workdir, getwd())) [18:41:54.013] setwd(...future.workdir) [18:41:54.013] { [18:41:54.013] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.013] ...future.oldOptions$nwarnings <- NULL [18:41:54.013] } [18:41:54.013] base::options(...future.oldOptions) [18:41:54.013] if (.Platform$OS.type == "windows") { [18:41:54.013] old_names <- names(...future.oldEnvVars) [18:41:54.013] envs <- base::Sys.getenv() [18:41:54.013] names <- names(envs) [18:41:54.013] common <- intersect(names, old_names) [18:41:54.013] added <- setdiff(names, old_names) [18:41:54.013] removed <- setdiff(old_names, names) [18:41:54.013] changed <- common[...future.oldEnvVars[common] != [18:41:54.013] envs[common]] [18:41:54.013] NAMES <- toupper(changed) [18:41:54.013] args <- list() [18:41:54.013] for (kk in seq_along(NAMES)) { [18:41:54.013] name <- changed[[kk]] [18:41:54.013] NAME <- NAMES[[kk]] [18:41:54.013] if (name != NAME && is.element(NAME, old_names)) [18:41:54.013] next [18:41:54.013] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.013] } [18:41:54.013] NAMES <- toupper(added) [18:41:54.013] for (kk in seq_along(NAMES)) { [18:41:54.013] name <- added[[kk]] [18:41:54.013] NAME <- NAMES[[kk]] [18:41:54.013] if (name != NAME && is.element(NAME, old_names)) [18:41:54.013] next [18:41:54.013] args[[name]] <- "" [18:41:54.013] } [18:41:54.013] NAMES <- toupper(removed) [18:41:54.013] for (kk in seq_along(NAMES)) { [18:41:54.013] name <- removed[[kk]] [18:41:54.013] NAME <- NAMES[[kk]] [18:41:54.013] if (name != NAME && is.element(NAME, old_names)) [18:41:54.013] next [18:41:54.013] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.013] } [18:41:54.013] if (length(args) > 0) [18:41:54.013] base::do.call(base::Sys.setenv, args = args) [18:41:54.013] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.013] } [18:41:54.013] { [18:41:54.013] if (base::length(...future.futureOptionsAdded) > [18:41:54.013] 0L) { [18:41:54.013] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.013] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.013] base::options(opts) [18:41:54.013] } [18:41:54.013] { [18:41:54.013] { [18:41:54.013] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.013] NULL [18:41:54.013] } [18:41:54.013] options(future.plan = NULL) [18:41:54.013] if (is.na(NA_character_)) [18:41:54.013] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.013] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.013] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.013] .init = FALSE) [18:41:54.013] } [18:41:54.013] } [18:41:54.013] } [18:41:54.013] }) [18:41:54.013] if (TRUE) { [18:41:54.013] base::sink(type = "output", split = FALSE) [18:41:54.013] if (TRUE) { [18:41:54.013] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.013] } [18:41:54.013] else { [18:41:54.013] ...future.result["stdout"] <- base::list(NULL) [18:41:54.013] } [18:41:54.013] base::close(...future.stdout) [18:41:54.013] ...future.stdout <- NULL [18:41:54.013] } [18:41:54.013] ...future.result$conditions <- ...future.conditions [18:41:54.013] ...future.result$finished <- base::Sys.time() [18:41:54.013] ...future.result [18:41:54.013] } [18:41:54.019] Exporting 5 global objects (864 bytes) to cluster node #1 ... [18:41:54.019] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.019] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.019] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.020] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.020] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:54.020] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:54.021] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.021] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.021] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.022] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.022] Exporting 5 global objects (864 bytes) to cluster node #1 ... DONE [18:41:54.022] MultisessionFuture started [18:41:54.023] - Launch lazy future ... done [18:41:54.023] run() for 'MultisessionFuture' ... done [18:41:54.023] Created future: [18:41:54.038] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.039] - Validating connection of MultisessionFuture [18:41:54.039] - received message: FutureResult [18:41:54.039] - Received FutureResult [18:41:54.039] - Erased future from FutureRegistry [18:41:54.039] result() for ClusterFuture ... [18:41:54.040] - result already collected: FutureResult [18:41:54.040] result() for ClusterFuture ... done [18:41:54.040] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.023] MultisessionFuture: [18:41:54.023] Label: 'future_sapply-2' [18:41:54.023] Expression: [18:41:54.023] { [18:41:54.023] do.call(function(...) { [18:41:54.023] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.023] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.023] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.023] on.exit(options(oopts), add = TRUE) [18:41:54.023] } [18:41:54.023] { [18:41:54.023] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.023] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.023] ...future.FUN(...future.X_jj, ...) [18:41:54.023] }) [18:41:54.023] } [18:41:54.023] }, args = future.call.arguments) [18:41:54.023] } [18:41:54.023] Lazy evaluation: FALSE [18:41:54.023] Asynchronous evaluation: TRUE [18:41:54.023] Local evaluation: TRUE [18:41:54.023] Environment: R_GlobalEnv [18:41:54.023] Capture standard output: TRUE [18:41:54.023] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.023] Globals: 5 objects totaling 401 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.023] Packages: [18:41:54.023] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.023] Resolved: TRUE [18:41:54.023] Value: [18:41:54.023] Conditions captured: [18:41:54.023] Early signaling: FALSE [18:41:54.023] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.023] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.040] Chunk #2 of 2 ... DONE [18:41:54.040] Launching 2 futures (chunks) ... DONE [18:41:54.041] Resolving 2 futures (chunks) ... [18:41:54.041] resolve() on list ... [18:41:54.041] recursive: 0 [18:41:54.041] length: 2 [18:41:54.041] [18:41:54.041] Future #1 [18:41:54.042] result() for ClusterFuture ... [18:41:54.042] - result already collected: FutureResult [18:41:54.042] result() for ClusterFuture ... done [18:41:54.042] result() for ClusterFuture ... [18:41:54.042] - result already collected: FutureResult [18:41:54.042] result() for ClusterFuture ... done [18:41:54.043] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.043] - nx: 2 [18:41:54.043] - relay: TRUE [18:41:54.043] - stdout: TRUE [18:41:54.043] - signal: TRUE [18:41:54.043] - resignal: FALSE [18:41:54.043] - force: TRUE [18:41:54.044] - relayed: [n=2] FALSE, FALSE [18:41:54.044] - queued futures: [n=2] FALSE, FALSE [18:41:54.044] - until=1 [18:41:54.044] - relaying element #1 [18:41:54.044] result() for ClusterFuture ... [18:41:54.044] - result already collected: FutureResult [18:41:54.045] result() for ClusterFuture ... done [18:41:54.045] result() for ClusterFuture ... [18:41:54.045] - result already collected: FutureResult [18:41:54.045] result() for ClusterFuture ... done [18:41:54.045] result() for ClusterFuture ... [18:41:54.045] - result already collected: FutureResult [18:41:54.046] result() for ClusterFuture ... done [18:41:54.046] result() for ClusterFuture ... [18:41:54.046] - result already collected: FutureResult [18:41:54.046] result() for ClusterFuture ... done [18:41:54.046] - relayed: [n=2] TRUE, FALSE [18:41:54.046] - queued futures: [n=2] TRUE, FALSE [18:41:54.046] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.047] length: 1 (resolved future 1) [18:41:54.047] Future #2 [18:41:54.047] result() for ClusterFuture ... [18:41:54.047] - result already collected: FutureResult [18:41:54.047] result() for ClusterFuture ... done [18:41:54.048] result() for ClusterFuture ... [18:41:54.048] - result already collected: FutureResult [18:41:54.048] result() for ClusterFuture ... done [18:41:54.048] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.048] - nx: 2 [18:41:54.048] - relay: TRUE [18:41:54.048] - stdout: TRUE [18:41:54.049] - signal: TRUE [18:41:54.049] - resignal: FALSE [18:41:54.049] - force: TRUE [18:41:54.049] - relayed: [n=2] TRUE, FALSE [18:41:54.049] - queued futures: [n=2] TRUE, FALSE [18:41:54.049] - until=2 [18:41:54.050] - relaying element #2 [18:41:54.050] result() for ClusterFuture ... [18:41:54.050] - result already collected: FutureResult [18:41:54.050] result() for ClusterFuture ... done [18:41:54.050] result() for ClusterFuture ... [18:41:54.050] - result already collected: FutureResult [18:41:54.050] result() for ClusterFuture ... done [18:41:54.051] result() for ClusterFuture ... [18:41:54.051] - result already collected: FutureResult [18:41:54.051] result() for ClusterFuture ... done [18:41:54.051] result() for ClusterFuture ... [18:41:54.051] - result already collected: FutureResult [18:41:54.052] result() for ClusterFuture ... done [18:41:54.052] - relayed: [n=2] TRUE, TRUE [18:41:54.052] - queued futures: [n=2] TRUE, TRUE [18:41:54.052] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.053] length: 0 (resolved future 2) [18:41:54.053] Relaying remaining futures [18:41:54.053] signalConditionsASAP(NULL, pos=0) ... [18:41:54.053] - nx: 2 [18:41:54.054] - relay: TRUE [18:41:54.054] - stdout: TRUE [18:41:54.054] - signal: TRUE [18:41:54.054] - resignal: FALSE [18:41:54.054] - force: TRUE [18:41:54.054] - relayed: [n=2] TRUE, TRUE [18:41:54.055] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.055] - relayed: [n=2] TRUE, TRUE [18:41:54.055] - queued futures: [n=2] TRUE, TRUE [18:41:54.055] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.055] resolve() on list ... DONE [18:41:54.056] result() for ClusterFuture ... [18:41:54.056] - result already collected: FutureResult [18:41:54.056] result() for ClusterFuture ... done [18:41:54.056] result() for ClusterFuture ... [18:41:54.056] - result already collected: FutureResult [18:41:54.056] result() for ClusterFuture ... done [18:41:54.057] result() for ClusterFuture ... [18:41:54.057] - result already collected: FutureResult [18:41:54.057] result() for ClusterFuture ... done [18:41:54.057] result() for ClusterFuture ... [18:41:54.057] - result already collected: FutureResult [18:41:54.057] result() for ClusterFuture ... done [18:41:54.057] - Number of value chunks collected: 2 [18:41:54.058] Resolving 2 futures (chunks) ... DONE [18:41:54.058] Reducing values from 2 chunks ... [18:41:54.058] - Number of values collected after concatenation: 3 [18:41:54.058] - Number of values expected: 3 [18:41:54.058] Reducing values from 2 chunks ... DONE [18:41:54.058] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: chr "a" ..$ b: chr "b" ..$ c: chr "c" $ y1:List of 3 ..$ a: chr "a" ..$ b: chr "b" ..$ c: chr "c" List of 2 $ y0:List of 3 ..$ a: chr "a" ..$ b: chr "b" ..$ c: chr "c" $ y2:List of 3 ..$ : chr "a" ..$ : chr "b" ..$ : chr "c" [18:41:54.067] future_lapply() ... [18:41:54.070] Number of chunks: 2 [18:41:54.071] getGlobalsAndPackagesXApply() ... [18:41:54.071] - future.globals: TRUE [18:41:54.071] getGlobalsAndPackages() ... [18:41:54.071] Searching for globals... [18:41:54.072] - globals found: [2] 'FUN', 'UseMethod' [18:41:54.073] Searching for globals ... DONE [18:41:54.073] Resolving globals: FALSE [18:41:54.073] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:54.074] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:54.074] - globals: [1] 'FUN' [18:41:54.074] [18:41:54.074] getGlobalsAndPackages() ... DONE [18:41:54.074] - globals found/used: [n=1] 'FUN' [18:41:54.075] - needed namespaces: [n=0] [18:41:54.075] Finding globals ... DONE [18:41:54.075] - use_args: TRUE [18:41:54.075] - Getting '...' globals ... [18:41:54.075] resolve() on list ... [18:41:54.076] recursive: 0 [18:41:54.076] length: 1 [18:41:54.076] elements: '...' [18:41:54.076] length: 0 (resolved future 1) [18:41:54.076] resolve() on list ... DONE [18:41:54.076] - '...' content: [n=0] [18:41:54.077] List of 1 [18:41:54.077] $ ...: list() [18:41:54.077] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.077] - attr(*, "where")=List of 1 [18:41:54.077] ..$ ...: [18:41:54.077] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.077] - attr(*, "resolved")= logi TRUE [18:41:54.077] - attr(*, "total_size")= num NA [18:41:54.080] - Getting '...' globals ... DONE [18:41:54.080] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.080] List of 2 [18:41:54.080] $ ...future.FUN:function (x, ...) [18:41:54.080] $ ... : list() [18:41:54.080] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.080] - attr(*, "where")=List of 2 [18:41:54.080] ..$ ...future.FUN: [18:41:54.080] ..$ ... : [18:41:54.080] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.080] - attr(*, "resolved")= logi FALSE [18:41:54.080] - attr(*, "total_size")= int 5028 [18:41:54.083] Packages to be attached in all futures: [n=0] [18:41:54.083] getGlobalsAndPackagesXApply() ... DONE [18:41:54.084] Number of futures (= number of chunks): 2 [18:41:54.084] Launching 2 futures (chunks) ... [18:41:54.084] Chunk #1 of 2 ... [18:41:54.084] - Finding globals in 'X' for chunk #1 ... [18:41:54.084] getGlobalsAndPackages() ... [18:41:54.085] Searching for globals... [18:41:54.085] [18:41:54.085] Searching for globals ... DONE [18:41:54.085] - globals: [0] [18:41:54.085] getGlobalsAndPackages() ... DONE [18:41:54.086] + additional globals found: [n=0] [18:41:54.086] + additional namespaces needed: [n=0] [18:41:54.086] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.086] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.086] - seeds: [18:41:54.086] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.087] getGlobalsAndPackages() ... [18:41:54.087] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.087] Resolving globals: FALSE [18:41:54.087] Tweak future expression to call with '...' arguments ... [18:41:54.087] { [18:41:54.087] do.call(function(...) { [18:41:54.087] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.087] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.087] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.087] on.exit(options(oopts), add = TRUE) [18:41:54.087] } [18:41:54.087] { [18:41:54.087] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.087] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.087] ...future.FUN(...future.X_jj, ...) [18:41:54.087] }) [18:41:54.087] } [18:41:54.087] }, args = future.call.arguments) [18:41:54.087] } [18:41:54.088] Tweak future expression to call with '...' arguments ... DONE [18:41:54.088] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.088] [18:41:54.089] getGlobalsAndPackages() ... DONE [18:41:54.089] run() for 'Future' ... [18:41:54.089] - state: 'created' [18:41:54.089] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.105] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.105] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.105] - Field: 'node' [18:41:54.105] - Field: 'label' [18:41:54.105] - Field: 'local' [18:41:54.106] - Field: 'owner' [18:41:54.106] - Field: 'envir' [18:41:54.106] - Field: 'workers' [18:41:54.106] - Field: 'packages' [18:41:54.106] - Field: 'gc' [18:41:54.107] - Field: 'conditions' [18:41:54.107] - Field: 'persistent' [18:41:54.107] - Field: 'expr' [18:41:54.107] - Field: 'uuid' [18:41:54.107] - Field: 'seed' [18:41:54.107] - Field: 'version' [18:41:54.108] - Field: 'result' [18:41:54.108] - Field: 'asynchronous' [18:41:54.108] - Field: 'calls' [18:41:54.108] - Field: 'globals' [18:41:54.108] - Field: 'stdout' [18:41:54.108] - Field: 'earlySignal' [18:41:54.109] - Field: 'lazy' [18:41:54.109] - Field: 'state' [18:41:54.109] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.109] - Launch lazy future ... [18:41:54.110] Packages needed by the future expression (n = 0): [18:41:54.110] Packages needed by future strategies (n = 0): [18:41:54.110] { [18:41:54.110] { [18:41:54.110] { [18:41:54.110] ...future.startTime <- base::Sys.time() [18:41:54.110] { [18:41:54.110] { [18:41:54.110] { [18:41:54.110] { [18:41:54.110] base::local({ [18:41:54.110] has_future <- base::requireNamespace("future", [18:41:54.110] quietly = TRUE) [18:41:54.110] if (has_future) { [18:41:54.110] ns <- base::getNamespace("future") [18:41:54.110] version <- ns[[".package"]][["version"]] [18:41:54.110] if (is.null(version)) [18:41:54.110] version <- utils::packageVersion("future") [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] version <- NULL [18:41:54.110] } [18:41:54.110] if (!has_future || version < "1.8.0") { [18:41:54.110] info <- base::c(r_version = base::gsub("R version ", [18:41:54.110] "", base::R.version$version.string), [18:41:54.110] platform = base::sprintf("%s (%s-bit)", [18:41:54.110] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.110] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.110] "release", "version")], collapse = " "), [18:41:54.110] hostname = base::Sys.info()[["nodename"]]) [18:41:54.110] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.110] info) [18:41:54.110] info <- base::paste(info, collapse = "; ") [18:41:54.110] if (!has_future) { [18:41:54.110] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.110] info) [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.110] info, version) [18:41:54.110] } [18:41:54.110] base::stop(msg) [18:41:54.110] } [18:41:54.110] }) [18:41:54.110] } [18:41:54.110] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.110] base::options(mc.cores = 1L) [18:41:54.110] } [18:41:54.110] ...future.strategy.old <- future::plan("list") [18:41:54.110] options(future.plan = NULL) [18:41:54.110] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.110] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.110] } [18:41:54.110] ...future.workdir <- getwd() [18:41:54.110] } [18:41:54.110] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.110] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.110] } [18:41:54.110] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.110] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.110] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.110] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.110] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.110] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.110] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.110] base::names(...future.oldOptions)) [18:41:54.110] } [18:41:54.110] if (FALSE) { [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] if (TRUE) { [18:41:54.110] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.110] open = "w") [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.110] windows = "NUL", "/dev/null"), open = "w") [18:41:54.110] } [18:41:54.110] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.110] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.110] base::sink(type = "output", split = FALSE) [18:41:54.110] base::close(...future.stdout) [18:41:54.110] }, add = TRUE) [18:41:54.110] } [18:41:54.110] ...future.frame <- base::sys.nframe() [18:41:54.110] ...future.conditions <- base::list() [18:41:54.110] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.110] if (FALSE) { [18:41:54.110] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.110] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.110] } [18:41:54.110] ...future.result <- base::tryCatch({ [18:41:54.110] base::withCallingHandlers({ [18:41:54.110] ...future.value <- base::withVisible(base::local({ [18:41:54.110] ...future.makeSendCondition <- base::local({ [18:41:54.110] sendCondition <- NULL [18:41:54.110] function(frame = 1L) { [18:41:54.110] if (is.function(sendCondition)) [18:41:54.110] return(sendCondition) [18:41:54.110] ns <- getNamespace("parallel") [18:41:54.110] if (exists("sendData", mode = "function", [18:41:54.110] envir = ns)) { [18:41:54.110] parallel_sendData <- get("sendData", mode = "function", [18:41:54.110] envir = ns) [18:41:54.110] envir <- sys.frame(frame) [18:41:54.110] master <- NULL [18:41:54.110] while (!identical(envir, .GlobalEnv) && [18:41:54.110] !identical(envir, emptyenv())) { [18:41:54.110] if (exists("master", mode = "list", envir = envir, [18:41:54.110] inherits = FALSE)) { [18:41:54.110] master <- get("master", mode = "list", [18:41:54.110] envir = envir, inherits = FALSE) [18:41:54.110] if (inherits(master, c("SOCKnode", [18:41:54.110] "SOCK0node"))) { [18:41:54.110] sendCondition <<- function(cond) { [18:41:54.110] data <- list(type = "VALUE", value = cond, [18:41:54.110] success = TRUE) [18:41:54.110] parallel_sendData(master, data) [18:41:54.110] } [18:41:54.110] return(sendCondition) [18:41:54.110] } [18:41:54.110] } [18:41:54.110] frame <- frame + 1L [18:41:54.110] envir <- sys.frame(frame) [18:41:54.110] } [18:41:54.110] } [18:41:54.110] sendCondition <<- function(cond) NULL [18:41:54.110] } [18:41:54.110] }) [18:41:54.110] withCallingHandlers({ [18:41:54.110] { [18:41:54.110] do.call(function(...) { [18:41:54.110] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.110] if (!identical(...future.globals.maxSize.org, [18:41:54.110] ...future.globals.maxSize)) { [18:41:54.110] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.110] on.exit(options(oopts), add = TRUE) [18:41:54.110] } [18:41:54.110] { [18:41:54.110] lapply(seq_along(...future.elements_ii), [18:41:54.110] FUN = function(jj) { [18:41:54.110] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.110] ...future.FUN(...future.X_jj, ...) [18:41:54.110] }) [18:41:54.110] } [18:41:54.110] }, args = future.call.arguments) [18:41:54.110] } [18:41:54.110] }, immediateCondition = function(cond) { [18:41:54.110] sendCondition <- ...future.makeSendCondition() [18:41:54.110] sendCondition(cond) [18:41:54.110] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.110] { [18:41:54.110] inherits <- base::inherits [18:41:54.110] invokeRestart <- base::invokeRestart [18:41:54.110] is.null <- base::is.null [18:41:54.110] muffled <- FALSE [18:41:54.110] if (inherits(cond, "message")) { [18:41:54.110] muffled <- grepl(pattern, "muffleMessage") [18:41:54.110] if (muffled) [18:41:54.110] invokeRestart("muffleMessage") [18:41:54.110] } [18:41:54.110] else if (inherits(cond, "warning")) { [18:41:54.110] muffled <- grepl(pattern, "muffleWarning") [18:41:54.110] if (muffled) [18:41:54.110] invokeRestart("muffleWarning") [18:41:54.110] } [18:41:54.110] else if (inherits(cond, "condition")) { [18:41:54.110] if (!is.null(pattern)) { [18:41:54.110] computeRestarts <- base::computeRestarts [18:41:54.110] grepl <- base::grepl [18:41:54.110] restarts <- computeRestarts(cond) [18:41:54.110] for (restart in restarts) { [18:41:54.110] name <- restart$name [18:41:54.110] if (is.null(name)) [18:41:54.110] next [18:41:54.110] if (!grepl(pattern, name)) [18:41:54.110] next [18:41:54.110] invokeRestart(restart) [18:41:54.110] muffled <- TRUE [18:41:54.110] break [18:41:54.110] } [18:41:54.110] } [18:41:54.110] } [18:41:54.110] invisible(muffled) [18:41:54.110] } [18:41:54.110] muffleCondition(cond) [18:41:54.110] }) [18:41:54.110] })) [18:41:54.110] future::FutureResult(value = ...future.value$value, [18:41:54.110] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.110] ...future.rng), globalenv = if (FALSE) [18:41:54.110] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.110] ...future.globalenv.names)) [18:41:54.110] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.110] }, condition = base::local({ [18:41:54.110] c <- base::c [18:41:54.110] inherits <- base::inherits [18:41:54.110] invokeRestart <- base::invokeRestart [18:41:54.110] length <- base::length [18:41:54.110] list <- base::list [18:41:54.110] seq.int <- base::seq.int [18:41:54.110] signalCondition <- base::signalCondition [18:41:54.110] sys.calls <- base::sys.calls [18:41:54.110] `[[` <- base::`[[` [18:41:54.110] `+` <- base::`+` [18:41:54.110] `<<-` <- base::`<<-` [18:41:54.110] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.110] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.110] 3L)] [18:41:54.110] } [18:41:54.110] function(cond) { [18:41:54.110] is_error <- inherits(cond, "error") [18:41:54.110] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.110] NULL) [18:41:54.110] if (is_error) { [18:41:54.110] sessionInformation <- function() { [18:41:54.110] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.110] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.110] search = base::search(), system = base::Sys.info()) [18:41:54.110] } [18:41:54.110] ...future.conditions[[length(...future.conditions) + [18:41:54.110] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.110] cond$call), session = sessionInformation(), [18:41:54.110] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.110] signalCondition(cond) [18:41:54.110] } [18:41:54.110] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.110] "immediateCondition"))) { [18:41:54.110] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.110] ...future.conditions[[length(...future.conditions) + [18:41:54.110] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.110] if (TRUE && !signal) { [18:41:54.110] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.110] { [18:41:54.110] inherits <- base::inherits [18:41:54.110] invokeRestart <- base::invokeRestart [18:41:54.110] is.null <- base::is.null [18:41:54.110] muffled <- FALSE [18:41:54.110] if (inherits(cond, "message")) { [18:41:54.110] muffled <- grepl(pattern, "muffleMessage") [18:41:54.110] if (muffled) [18:41:54.110] invokeRestart("muffleMessage") [18:41:54.110] } [18:41:54.110] else if (inherits(cond, "warning")) { [18:41:54.110] muffled <- grepl(pattern, "muffleWarning") [18:41:54.110] if (muffled) [18:41:54.110] invokeRestart("muffleWarning") [18:41:54.110] } [18:41:54.110] else if (inherits(cond, "condition")) { [18:41:54.110] if (!is.null(pattern)) { [18:41:54.110] computeRestarts <- base::computeRestarts [18:41:54.110] grepl <- base::grepl [18:41:54.110] restarts <- computeRestarts(cond) [18:41:54.110] for (restart in restarts) { [18:41:54.110] name <- restart$name [18:41:54.110] if (is.null(name)) [18:41:54.110] next [18:41:54.110] if (!grepl(pattern, name)) [18:41:54.110] next [18:41:54.110] invokeRestart(restart) [18:41:54.110] muffled <- TRUE [18:41:54.110] break [18:41:54.110] } [18:41:54.110] } [18:41:54.110] } [18:41:54.110] invisible(muffled) [18:41:54.110] } [18:41:54.110] muffleCondition(cond, pattern = "^muffle") [18:41:54.110] } [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] if (TRUE) { [18:41:54.110] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.110] { [18:41:54.110] inherits <- base::inherits [18:41:54.110] invokeRestart <- base::invokeRestart [18:41:54.110] is.null <- base::is.null [18:41:54.110] muffled <- FALSE [18:41:54.110] if (inherits(cond, "message")) { [18:41:54.110] muffled <- grepl(pattern, "muffleMessage") [18:41:54.110] if (muffled) [18:41:54.110] invokeRestart("muffleMessage") [18:41:54.110] } [18:41:54.110] else if (inherits(cond, "warning")) { [18:41:54.110] muffled <- grepl(pattern, "muffleWarning") [18:41:54.110] if (muffled) [18:41:54.110] invokeRestart("muffleWarning") [18:41:54.110] } [18:41:54.110] else if (inherits(cond, "condition")) { [18:41:54.110] if (!is.null(pattern)) { [18:41:54.110] computeRestarts <- base::computeRestarts [18:41:54.110] grepl <- base::grepl [18:41:54.110] restarts <- computeRestarts(cond) [18:41:54.110] for (restart in restarts) { [18:41:54.110] name <- restart$name [18:41:54.110] if (is.null(name)) [18:41:54.110] next [18:41:54.110] if (!grepl(pattern, name)) [18:41:54.110] next [18:41:54.110] invokeRestart(restart) [18:41:54.110] muffled <- TRUE [18:41:54.110] break [18:41:54.110] } [18:41:54.110] } [18:41:54.110] } [18:41:54.110] invisible(muffled) [18:41:54.110] } [18:41:54.110] muffleCondition(cond, pattern = "^muffle") [18:41:54.110] } [18:41:54.110] } [18:41:54.110] } [18:41:54.110] })) [18:41:54.110] }, error = function(ex) { [18:41:54.110] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.110] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.110] ...future.rng), started = ...future.startTime, [18:41:54.110] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.110] version = "1.8"), class = "FutureResult") [18:41:54.110] }, finally = { [18:41:54.110] if (!identical(...future.workdir, getwd())) [18:41:54.110] setwd(...future.workdir) [18:41:54.110] { [18:41:54.110] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.110] ...future.oldOptions$nwarnings <- NULL [18:41:54.110] } [18:41:54.110] base::options(...future.oldOptions) [18:41:54.110] if (.Platform$OS.type == "windows") { [18:41:54.110] old_names <- names(...future.oldEnvVars) [18:41:54.110] envs <- base::Sys.getenv() [18:41:54.110] names <- names(envs) [18:41:54.110] common <- intersect(names, old_names) [18:41:54.110] added <- setdiff(names, old_names) [18:41:54.110] removed <- setdiff(old_names, names) [18:41:54.110] changed <- common[...future.oldEnvVars[common] != [18:41:54.110] envs[common]] [18:41:54.110] NAMES <- toupper(changed) [18:41:54.110] args <- list() [18:41:54.110] for (kk in seq_along(NAMES)) { [18:41:54.110] name <- changed[[kk]] [18:41:54.110] NAME <- NAMES[[kk]] [18:41:54.110] if (name != NAME && is.element(NAME, old_names)) [18:41:54.110] next [18:41:54.110] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.110] } [18:41:54.110] NAMES <- toupper(added) [18:41:54.110] for (kk in seq_along(NAMES)) { [18:41:54.110] name <- added[[kk]] [18:41:54.110] NAME <- NAMES[[kk]] [18:41:54.110] if (name != NAME && is.element(NAME, old_names)) [18:41:54.110] next [18:41:54.110] args[[name]] <- "" [18:41:54.110] } [18:41:54.110] NAMES <- toupper(removed) [18:41:54.110] for (kk in seq_along(NAMES)) { [18:41:54.110] name <- removed[[kk]] [18:41:54.110] NAME <- NAMES[[kk]] [18:41:54.110] if (name != NAME && is.element(NAME, old_names)) [18:41:54.110] next [18:41:54.110] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.110] } [18:41:54.110] if (length(args) > 0) [18:41:54.110] base::do.call(base::Sys.setenv, args = args) [18:41:54.110] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.110] } [18:41:54.110] { [18:41:54.110] if (base::length(...future.futureOptionsAdded) > [18:41:54.110] 0L) { [18:41:54.110] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.110] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.110] base::options(opts) [18:41:54.110] } [18:41:54.110] { [18:41:54.110] { [18:41:54.110] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.110] NULL [18:41:54.110] } [18:41:54.110] options(future.plan = NULL) [18:41:54.110] if (is.na(NA_character_)) [18:41:54.110] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.110] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.110] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.110] .init = FALSE) [18:41:54.110] } [18:41:54.110] } [18:41:54.110] } [18:41:54.110] }) [18:41:54.110] if (TRUE) { [18:41:54.110] base::sink(type = "output", split = FALSE) [18:41:54.110] if (TRUE) { [18:41:54.110] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.110] } [18:41:54.110] else { [18:41:54.110] ...future.result["stdout"] <- base::list(NULL) [18:41:54.110] } [18:41:54.110] base::close(...future.stdout) [18:41:54.110] ...future.stdout <- NULL [18:41:54.110] } [18:41:54.110] ...future.result$conditions <- ...future.conditions [18:41:54.110] ...future.result$finished <- base::Sys.time() [18:41:54.110] ...future.result [18:41:54.110] } [18:41:54.116] Exporting 5 global objects (940 bytes) to cluster node #1 ... [18:41:54.116] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:54.116] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:54.116] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.117] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.117] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:54.117] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:54.118] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.118] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.118] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.119] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.119] Exporting 5 global objects (940 bytes) to cluster node #1 ... DONE [18:41:54.119] MultisessionFuture started [18:41:54.120] - Launch lazy future ... done [18:41:54.120] run() for 'MultisessionFuture' ... done [18:41:54.120] Created future: [18:41:54.134] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.135] - Validating connection of MultisessionFuture [18:41:54.135] - received message: FutureResult [18:41:54.135] - Received FutureResult [18:41:54.135] - Erased future from FutureRegistry [18:41:54.136] result() for ClusterFuture ... [18:41:54.136] - result already collected: FutureResult [18:41:54.136] result() for ClusterFuture ... done [18:41:54.136] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.120] MultisessionFuture: [18:41:54.120] Label: 'future_sapply-1' [18:41:54.120] Expression: [18:41:54.120] { [18:41:54.120] do.call(function(...) { [18:41:54.120] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.120] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.120] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.120] on.exit(options(oopts), add = TRUE) [18:41:54.120] } [18:41:54.120] { [18:41:54.120] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.120] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.120] ...future.FUN(...future.X_jj, ...) [18:41:54.120] }) [18:41:54.120] } [18:41:54.120] }, args = future.call.arguments) [18:41:54.120] } [18:41:54.120] Lazy evaluation: FALSE [18:41:54.120] Asynchronous evaluation: TRUE [18:41:54.120] Local evaluation: TRUE [18:41:54.120] Environment: R_GlobalEnv [18:41:54.120] Capture standard output: TRUE [18:41:54.120] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.120] Globals: 5 objects totaling 477 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.120] Packages: [18:41:54.120] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.120] Resolved: TRUE [18:41:54.120] Value: [18:41:54.120] Conditions captured: [18:41:54.120] Early signaling: FALSE [18:41:54.120] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.120] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.137] Chunk #1 of 2 ... DONE [18:41:54.137] Chunk #2 of 2 ... [18:41:54.137] - Finding globals in 'X' for chunk #2 ... [18:41:54.137] getGlobalsAndPackages() ... [18:41:54.137] Searching for globals... [18:41:54.138] [18:41:54.138] Searching for globals ... DONE [18:41:54.138] - globals: [0] [18:41:54.138] getGlobalsAndPackages() ... DONE [18:41:54.138] + additional globals found: [n=0] [18:41:54.138] + additional namespaces needed: [n=0] [18:41:54.139] - Finding globals in 'X' for chunk #2 ... DONE [18:41:54.139] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.139] - seeds: [18:41:54.139] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.139] getGlobalsAndPackages() ... [18:41:54.139] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.140] Resolving globals: FALSE [18:41:54.140] Tweak future expression to call with '...' arguments ... [18:41:54.140] { [18:41:54.140] do.call(function(...) { [18:41:54.140] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.140] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.140] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.140] on.exit(options(oopts), add = TRUE) [18:41:54.140] } [18:41:54.140] { [18:41:54.140] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.140] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.140] ...future.FUN(...future.X_jj, ...) [18:41:54.140] }) [18:41:54.140] } [18:41:54.140] }, args = future.call.arguments) [18:41:54.140] } [18:41:54.140] Tweak future expression to call with '...' arguments ... DONE [18:41:54.141] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.141] [18:41:54.141] getGlobalsAndPackages() ... DONE [18:41:54.142] run() for 'Future' ... [18:41:54.142] - state: 'created' [18:41:54.142] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.157] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.157] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.157] - Field: 'node' [18:41:54.158] - Field: 'label' [18:41:54.158] - Field: 'local' [18:41:54.158] - Field: 'owner' [18:41:54.158] - Field: 'envir' [18:41:54.158] - Field: 'workers' [18:41:54.159] - Field: 'packages' [18:41:54.159] - Field: 'gc' [18:41:54.159] - Field: 'conditions' [18:41:54.159] - Field: 'persistent' [18:41:54.159] - Field: 'expr' [18:41:54.159] - Field: 'uuid' [18:41:54.160] - Field: 'seed' [18:41:54.160] - Field: 'version' [18:41:54.160] - Field: 'result' [18:41:54.160] - Field: 'asynchronous' [18:41:54.160] - Field: 'calls' [18:41:54.160] - Field: 'globals' [18:41:54.161] - Field: 'stdout' [18:41:54.161] - Field: 'earlySignal' [18:41:54.162] - Field: 'lazy' [18:41:54.162] - Field: 'state' [18:41:54.162] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.163] - Launch lazy future ... [18:41:54.163] Packages needed by the future expression (n = 0): [18:41:54.163] Packages needed by future strategies (n = 0): [18:41:54.164] { [18:41:54.164] { [18:41:54.164] { [18:41:54.164] ...future.startTime <- base::Sys.time() [18:41:54.164] { [18:41:54.164] { [18:41:54.164] { [18:41:54.164] { [18:41:54.164] base::local({ [18:41:54.164] has_future <- base::requireNamespace("future", [18:41:54.164] quietly = TRUE) [18:41:54.164] if (has_future) { [18:41:54.164] ns <- base::getNamespace("future") [18:41:54.164] version <- ns[[".package"]][["version"]] [18:41:54.164] if (is.null(version)) [18:41:54.164] version <- utils::packageVersion("future") [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] version <- NULL [18:41:54.164] } [18:41:54.164] if (!has_future || version < "1.8.0") { [18:41:54.164] info <- base::c(r_version = base::gsub("R version ", [18:41:54.164] "", base::R.version$version.string), [18:41:54.164] platform = base::sprintf("%s (%s-bit)", [18:41:54.164] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.164] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.164] "release", "version")], collapse = " "), [18:41:54.164] hostname = base::Sys.info()[["nodename"]]) [18:41:54.164] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.164] info) [18:41:54.164] info <- base::paste(info, collapse = "; ") [18:41:54.164] if (!has_future) { [18:41:54.164] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.164] info) [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.164] info, version) [18:41:54.164] } [18:41:54.164] base::stop(msg) [18:41:54.164] } [18:41:54.164] }) [18:41:54.164] } [18:41:54.164] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.164] base::options(mc.cores = 1L) [18:41:54.164] } [18:41:54.164] ...future.strategy.old <- future::plan("list") [18:41:54.164] options(future.plan = NULL) [18:41:54.164] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.164] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.164] } [18:41:54.164] ...future.workdir <- getwd() [18:41:54.164] } [18:41:54.164] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.164] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.164] } [18:41:54.164] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.164] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.164] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.164] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.164] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.164] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.164] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.164] base::names(...future.oldOptions)) [18:41:54.164] } [18:41:54.164] if (FALSE) { [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] if (TRUE) { [18:41:54.164] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.164] open = "w") [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.164] windows = "NUL", "/dev/null"), open = "w") [18:41:54.164] } [18:41:54.164] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.164] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.164] base::sink(type = "output", split = FALSE) [18:41:54.164] base::close(...future.stdout) [18:41:54.164] }, add = TRUE) [18:41:54.164] } [18:41:54.164] ...future.frame <- base::sys.nframe() [18:41:54.164] ...future.conditions <- base::list() [18:41:54.164] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.164] if (FALSE) { [18:41:54.164] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.164] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.164] } [18:41:54.164] ...future.result <- base::tryCatch({ [18:41:54.164] base::withCallingHandlers({ [18:41:54.164] ...future.value <- base::withVisible(base::local({ [18:41:54.164] ...future.makeSendCondition <- base::local({ [18:41:54.164] sendCondition <- NULL [18:41:54.164] function(frame = 1L) { [18:41:54.164] if (is.function(sendCondition)) [18:41:54.164] return(sendCondition) [18:41:54.164] ns <- getNamespace("parallel") [18:41:54.164] if (exists("sendData", mode = "function", [18:41:54.164] envir = ns)) { [18:41:54.164] parallel_sendData <- get("sendData", mode = "function", [18:41:54.164] envir = ns) [18:41:54.164] envir <- sys.frame(frame) [18:41:54.164] master <- NULL [18:41:54.164] while (!identical(envir, .GlobalEnv) && [18:41:54.164] !identical(envir, emptyenv())) { [18:41:54.164] if (exists("master", mode = "list", envir = envir, [18:41:54.164] inherits = FALSE)) { [18:41:54.164] master <- get("master", mode = "list", [18:41:54.164] envir = envir, inherits = FALSE) [18:41:54.164] if (inherits(master, c("SOCKnode", [18:41:54.164] "SOCK0node"))) { [18:41:54.164] sendCondition <<- function(cond) { [18:41:54.164] data <- list(type = "VALUE", value = cond, [18:41:54.164] success = TRUE) [18:41:54.164] parallel_sendData(master, data) [18:41:54.164] } [18:41:54.164] return(sendCondition) [18:41:54.164] } [18:41:54.164] } [18:41:54.164] frame <- frame + 1L [18:41:54.164] envir <- sys.frame(frame) [18:41:54.164] } [18:41:54.164] } [18:41:54.164] sendCondition <<- function(cond) NULL [18:41:54.164] } [18:41:54.164] }) [18:41:54.164] withCallingHandlers({ [18:41:54.164] { [18:41:54.164] do.call(function(...) { [18:41:54.164] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.164] if (!identical(...future.globals.maxSize.org, [18:41:54.164] ...future.globals.maxSize)) { [18:41:54.164] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.164] on.exit(options(oopts), add = TRUE) [18:41:54.164] } [18:41:54.164] { [18:41:54.164] lapply(seq_along(...future.elements_ii), [18:41:54.164] FUN = function(jj) { [18:41:54.164] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.164] ...future.FUN(...future.X_jj, ...) [18:41:54.164] }) [18:41:54.164] } [18:41:54.164] }, args = future.call.arguments) [18:41:54.164] } [18:41:54.164] }, immediateCondition = function(cond) { [18:41:54.164] sendCondition <- ...future.makeSendCondition() [18:41:54.164] sendCondition(cond) [18:41:54.164] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.164] { [18:41:54.164] inherits <- base::inherits [18:41:54.164] invokeRestart <- base::invokeRestart [18:41:54.164] is.null <- base::is.null [18:41:54.164] muffled <- FALSE [18:41:54.164] if (inherits(cond, "message")) { [18:41:54.164] muffled <- grepl(pattern, "muffleMessage") [18:41:54.164] if (muffled) [18:41:54.164] invokeRestart("muffleMessage") [18:41:54.164] } [18:41:54.164] else if (inherits(cond, "warning")) { [18:41:54.164] muffled <- grepl(pattern, "muffleWarning") [18:41:54.164] if (muffled) [18:41:54.164] invokeRestart("muffleWarning") [18:41:54.164] } [18:41:54.164] else if (inherits(cond, "condition")) { [18:41:54.164] if (!is.null(pattern)) { [18:41:54.164] computeRestarts <- base::computeRestarts [18:41:54.164] grepl <- base::grepl [18:41:54.164] restarts <- computeRestarts(cond) [18:41:54.164] for (restart in restarts) { [18:41:54.164] name <- restart$name [18:41:54.164] if (is.null(name)) [18:41:54.164] next [18:41:54.164] if (!grepl(pattern, name)) [18:41:54.164] next [18:41:54.164] invokeRestart(restart) [18:41:54.164] muffled <- TRUE [18:41:54.164] break [18:41:54.164] } [18:41:54.164] } [18:41:54.164] } [18:41:54.164] invisible(muffled) [18:41:54.164] } [18:41:54.164] muffleCondition(cond) [18:41:54.164] }) [18:41:54.164] })) [18:41:54.164] future::FutureResult(value = ...future.value$value, [18:41:54.164] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.164] ...future.rng), globalenv = if (FALSE) [18:41:54.164] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.164] ...future.globalenv.names)) [18:41:54.164] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.164] }, condition = base::local({ [18:41:54.164] c <- base::c [18:41:54.164] inherits <- base::inherits [18:41:54.164] invokeRestart <- base::invokeRestart [18:41:54.164] length <- base::length [18:41:54.164] list <- base::list [18:41:54.164] seq.int <- base::seq.int [18:41:54.164] signalCondition <- base::signalCondition [18:41:54.164] sys.calls <- base::sys.calls [18:41:54.164] `[[` <- base::`[[` [18:41:54.164] `+` <- base::`+` [18:41:54.164] `<<-` <- base::`<<-` [18:41:54.164] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.164] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.164] 3L)] [18:41:54.164] } [18:41:54.164] function(cond) { [18:41:54.164] is_error <- inherits(cond, "error") [18:41:54.164] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.164] NULL) [18:41:54.164] if (is_error) { [18:41:54.164] sessionInformation <- function() { [18:41:54.164] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.164] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.164] search = base::search(), system = base::Sys.info()) [18:41:54.164] } [18:41:54.164] ...future.conditions[[length(...future.conditions) + [18:41:54.164] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.164] cond$call), session = sessionInformation(), [18:41:54.164] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.164] signalCondition(cond) [18:41:54.164] } [18:41:54.164] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.164] "immediateCondition"))) { [18:41:54.164] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.164] ...future.conditions[[length(...future.conditions) + [18:41:54.164] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.164] if (TRUE && !signal) { [18:41:54.164] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.164] { [18:41:54.164] inherits <- base::inherits [18:41:54.164] invokeRestart <- base::invokeRestart [18:41:54.164] is.null <- base::is.null [18:41:54.164] muffled <- FALSE [18:41:54.164] if (inherits(cond, "message")) { [18:41:54.164] muffled <- grepl(pattern, "muffleMessage") [18:41:54.164] if (muffled) [18:41:54.164] invokeRestart("muffleMessage") [18:41:54.164] } [18:41:54.164] else if (inherits(cond, "warning")) { [18:41:54.164] muffled <- grepl(pattern, "muffleWarning") [18:41:54.164] if (muffled) [18:41:54.164] invokeRestart("muffleWarning") [18:41:54.164] } [18:41:54.164] else if (inherits(cond, "condition")) { [18:41:54.164] if (!is.null(pattern)) { [18:41:54.164] computeRestarts <- base::computeRestarts [18:41:54.164] grepl <- base::grepl [18:41:54.164] restarts <- computeRestarts(cond) [18:41:54.164] for (restart in restarts) { [18:41:54.164] name <- restart$name [18:41:54.164] if (is.null(name)) [18:41:54.164] next [18:41:54.164] if (!grepl(pattern, name)) [18:41:54.164] next [18:41:54.164] invokeRestart(restart) [18:41:54.164] muffled <- TRUE [18:41:54.164] break [18:41:54.164] } [18:41:54.164] } [18:41:54.164] } [18:41:54.164] invisible(muffled) [18:41:54.164] } [18:41:54.164] muffleCondition(cond, pattern = "^muffle") [18:41:54.164] } [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] if (TRUE) { [18:41:54.164] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.164] { [18:41:54.164] inherits <- base::inherits [18:41:54.164] invokeRestart <- base::invokeRestart [18:41:54.164] is.null <- base::is.null [18:41:54.164] muffled <- FALSE [18:41:54.164] if (inherits(cond, "message")) { [18:41:54.164] muffled <- grepl(pattern, "muffleMessage") [18:41:54.164] if (muffled) [18:41:54.164] invokeRestart("muffleMessage") [18:41:54.164] } [18:41:54.164] else if (inherits(cond, "warning")) { [18:41:54.164] muffled <- grepl(pattern, "muffleWarning") [18:41:54.164] if (muffled) [18:41:54.164] invokeRestart("muffleWarning") [18:41:54.164] } [18:41:54.164] else if (inherits(cond, "condition")) { [18:41:54.164] if (!is.null(pattern)) { [18:41:54.164] computeRestarts <- base::computeRestarts [18:41:54.164] grepl <- base::grepl [18:41:54.164] restarts <- computeRestarts(cond) [18:41:54.164] for (restart in restarts) { [18:41:54.164] name <- restart$name [18:41:54.164] if (is.null(name)) [18:41:54.164] next [18:41:54.164] if (!grepl(pattern, name)) [18:41:54.164] next [18:41:54.164] invokeRestart(restart) [18:41:54.164] muffled <- TRUE [18:41:54.164] break [18:41:54.164] } [18:41:54.164] } [18:41:54.164] } [18:41:54.164] invisible(muffled) [18:41:54.164] } [18:41:54.164] muffleCondition(cond, pattern = "^muffle") [18:41:54.164] } [18:41:54.164] } [18:41:54.164] } [18:41:54.164] })) [18:41:54.164] }, error = function(ex) { [18:41:54.164] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.164] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.164] ...future.rng), started = ...future.startTime, [18:41:54.164] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.164] version = "1.8"), class = "FutureResult") [18:41:54.164] }, finally = { [18:41:54.164] if (!identical(...future.workdir, getwd())) [18:41:54.164] setwd(...future.workdir) [18:41:54.164] { [18:41:54.164] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.164] ...future.oldOptions$nwarnings <- NULL [18:41:54.164] } [18:41:54.164] base::options(...future.oldOptions) [18:41:54.164] if (.Platform$OS.type == "windows") { [18:41:54.164] old_names <- names(...future.oldEnvVars) [18:41:54.164] envs <- base::Sys.getenv() [18:41:54.164] names <- names(envs) [18:41:54.164] common <- intersect(names, old_names) [18:41:54.164] added <- setdiff(names, old_names) [18:41:54.164] removed <- setdiff(old_names, names) [18:41:54.164] changed <- common[...future.oldEnvVars[common] != [18:41:54.164] envs[common]] [18:41:54.164] NAMES <- toupper(changed) [18:41:54.164] args <- list() [18:41:54.164] for (kk in seq_along(NAMES)) { [18:41:54.164] name <- changed[[kk]] [18:41:54.164] NAME <- NAMES[[kk]] [18:41:54.164] if (name != NAME && is.element(NAME, old_names)) [18:41:54.164] next [18:41:54.164] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.164] } [18:41:54.164] NAMES <- toupper(added) [18:41:54.164] for (kk in seq_along(NAMES)) { [18:41:54.164] name <- added[[kk]] [18:41:54.164] NAME <- NAMES[[kk]] [18:41:54.164] if (name != NAME && is.element(NAME, old_names)) [18:41:54.164] next [18:41:54.164] args[[name]] <- "" [18:41:54.164] } [18:41:54.164] NAMES <- toupper(removed) [18:41:54.164] for (kk in seq_along(NAMES)) { [18:41:54.164] name <- removed[[kk]] [18:41:54.164] NAME <- NAMES[[kk]] [18:41:54.164] if (name != NAME && is.element(NAME, old_names)) [18:41:54.164] next [18:41:54.164] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.164] } [18:41:54.164] if (length(args) > 0) [18:41:54.164] base::do.call(base::Sys.setenv, args = args) [18:41:54.164] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.164] } [18:41:54.164] { [18:41:54.164] if (base::length(...future.futureOptionsAdded) > [18:41:54.164] 0L) { [18:41:54.164] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.164] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.164] base::options(opts) [18:41:54.164] } [18:41:54.164] { [18:41:54.164] { [18:41:54.164] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.164] NULL [18:41:54.164] } [18:41:54.164] options(future.plan = NULL) [18:41:54.164] if (is.na(NA_character_)) [18:41:54.164] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.164] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.164] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.164] .init = FALSE) [18:41:54.164] } [18:41:54.164] } [18:41:54.164] } [18:41:54.164] }) [18:41:54.164] if (TRUE) { [18:41:54.164] base::sink(type = "output", split = FALSE) [18:41:54.164] if (TRUE) { [18:41:54.164] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.164] } [18:41:54.164] else { [18:41:54.164] ...future.result["stdout"] <- base::list(NULL) [18:41:54.164] } [18:41:54.164] base::close(...future.stdout) [18:41:54.164] ...future.stdout <- NULL [18:41:54.164] } [18:41:54.164] ...future.result$conditions <- ...future.conditions [18:41:54.164] ...future.result$finished <- base::Sys.time() [18:41:54.164] ...future.result [18:41:54.164] } [18:41:54.169] Exporting 5 global objects (957 bytes) to cluster node #1 ... [18:41:54.169] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:54.170] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:54.170] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.170] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.171] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:54.171] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:54.171] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.172] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.172] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.172] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.172] Exporting 5 global objects (957 bytes) to cluster node #1 ... DONE [18:41:54.173] MultisessionFuture started [18:41:54.173] - Launch lazy future ... done [18:41:54.173] run() for 'MultisessionFuture' ... done [18:41:54.174] Created future: [18:41:54.189] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.189] - Validating connection of MultisessionFuture [18:41:54.189] - received message: FutureResult [18:41:54.189] - Received FutureResult [18:41:54.190] - Erased future from FutureRegistry [18:41:54.190] result() for ClusterFuture ... [18:41:54.190] - result already collected: FutureResult [18:41:54.190] result() for ClusterFuture ... done [18:41:54.190] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.174] MultisessionFuture: [18:41:54.174] Label: 'future_sapply-2' [18:41:54.174] Expression: [18:41:54.174] { [18:41:54.174] do.call(function(...) { [18:41:54.174] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.174] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.174] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.174] on.exit(options(oopts), add = TRUE) [18:41:54.174] } [18:41:54.174] { [18:41:54.174] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.174] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.174] ...future.FUN(...future.X_jj, ...) [18:41:54.174] }) [18:41:54.174] } [18:41:54.174] }, args = future.call.arguments) [18:41:54.174] } [18:41:54.174] Lazy evaluation: FALSE [18:41:54.174] Asynchronous evaluation: TRUE [18:41:54.174] Local evaluation: TRUE [18:41:54.174] Environment: R_GlobalEnv [18:41:54.174] Capture standard output: TRUE [18:41:54.174] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.174] Globals: 5 objects totaling 494 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.174] Packages: [18:41:54.174] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.174] Resolved: TRUE [18:41:54.174] Value: [18:41:54.174] Conditions captured: [18:41:54.174] Early signaling: FALSE [18:41:54.174] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.174] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.191] Chunk #2 of 2 ... DONE [18:41:54.191] Launching 2 futures (chunks) ... DONE [18:41:54.191] Resolving 2 futures (chunks) ... [18:41:54.191] resolve() on list ... [18:41:54.191] recursive: 0 [18:41:54.192] length: 2 [18:41:54.192] [18:41:54.192] Future #1 [18:41:54.192] result() for ClusterFuture ... [18:41:54.192] - result already collected: FutureResult [18:41:54.192] result() for ClusterFuture ... done [18:41:54.193] result() for ClusterFuture ... [18:41:54.193] - result already collected: FutureResult [18:41:54.193] result() for ClusterFuture ... done [18:41:54.193] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.193] - nx: 2 [18:41:54.193] - relay: TRUE [18:41:54.194] - stdout: TRUE [18:41:54.194] - signal: TRUE [18:41:54.194] - resignal: FALSE [18:41:54.194] - force: TRUE [18:41:54.194] - relayed: [n=2] FALSE, FALSE [18:41:54.194] - queued futures: [n=2] FALSE, FALSE [18:41:54.194] - until=1 [18:41:54.195] - relaying element #1 [18:41:54.195] result() for ClusterFuture ... [18:41:54.195] - result already collected: FutureResult [18:41:54.195] result() for ClusterFuture ... done [18:41:54.195] result() for ClusterFuture ... [18:41:54.195] - result already collected: FutureResult [18:41:54.196] result() for ClusterFuture ... done [18:41:54.196] result() for ClusterFuture ... [18:41:54.196] - result already collected: FutureResult [18:41:54.196] result() for ClusterFuture ... done [18:41:54.196] result() for ClusterFuture ... [18:41:54.196] - result already collected: FutureResult [18:41:54.197] result() for ClusterFuture ... done [18:41:54.197] - relayed: [n=2] TRUE, FALSE [18:41:54.197] - queued futures: [n=2] TRUE, FALSE [18:41:54.197] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.197] length: 1 (resolved future 1) [18:41:54.197] Future #2 [18:41:54.198] result() for ClusterFuture ... [18:41:54.198] - result already collected: FutureResult [18:41:54.198] result() for ClusterFuture ... done [18:41:54.198] result() for ClusterFuture ... [18:41:54.198] - result already collected: FutureResult [18:41:54.198] result() for ClusterFuture ... done [18:41:54.199] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.199] - nx: 2 [18:41:54.199] - relay: TRUE [18:41:54.199] - stdout: TRUE [18:41:54.199] - signal: TRUE [18:41:54.199] - resignal: FALSE [18:41:54.199] - force: TRUE [18:41:54.200] - relayed: [n=2] TRUE, FALSE [18:41:54.200] - queued futures: [n=2] TRUE, FALSE [18:41:54.200] - until=2 [18:41:54.200] - relaying element #2 [18:41:54.200] result() for ClusterFuture ... [18:41:54.200] - result already collected: FutureResult [18:41:54.201] result() for ClusterFuture ... done [18:41:54.201] result() for ClusterFuture ... [18:41:54.201] - result already collected: FutureResult [18:41:54.201] result() for ClusterFuture ... done [18:41:54.201] result() for ClusterFuture ... [18:41:54.201] - result already collected: FutureResult [18:41:54.202] result() for ClusterFuture ... done [18:41:54.202] result() for ClusterFuture ... [18:41:54.202] - result already collected: FutureResult [18:41:54.202] result() for ClusterFuture ... done [18:41:54.202] - relayed: [n=2] TRUE, TRUE [18:41:54.202] - queued futures: [n=2] TRUE, TRUE [18:41:54.202] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.203] length: 0 (resolved future 2) [18:41:54.203] Relaying remaining futures [18:41:54.203] signalConditionsASAP(NULL, pos=0) ... [18:41:54.203] - nx: 2 [18:41:54.203] - relay: TRUE [18:41:54.203] - stdout: TRUE [18:41:54.204] - signal: TRUE [18:41:54.204] - resignal: FALSE [18:41:54.204] - force: TRUE [18:41:54.204] - relayed: [n=2] TRUE, TRUE [18:41:54.204] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.204] - relayed: [n=2] TRUE, TRUE [18:41:54.205] - queued futures: [n=2] TRUE, TRUE [18:41:54.205] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.205] resolve() on list ... DONE [18:41:54.205] result() for ClusterFuture ... [18:41:54.205] - result already collected: FutureResult [18:41:54.205] result() for ClusterFuture ... done [18:41:54.206] result() for ClusterFuture ... [18:41:54.206] - result already collected: FutureResult [18:41:54.206] result() for ClusterFuture ... done [18:41:54.206] result() for ClusterFuture ... [18:41:54.206] - result already collected: FutureResult [18:41:54.206] result() for ClusterFuture ... done [18:41:54.206] result() for ClusterFuture ... [18:41:54.207] - result already collected: FutureResult [18:41:54.207] result() for ClusterFuture ... done [18:41:54.207] - Number of value chunks collected: 2 [18:41:54.207] Resolving 2 futures (chunks) ... DONE [18:41:54.207] Reducing values from 2 chunks ... [18:41:54.207] - Number of values collected after concatenation: 3 [18:41:54.208] - Number of values expected: 3 [18:41:54.208] Reducing values from 2 chunks ... DONE [18:41:54.208] future_lapply() ... DONE List of 2 $ y0:List of 3 ..$ a: chr [1, 1] "a" ..$ b: chr [1, 1] "b" ..$ c: chr [1, 1] "c" $ y1:List of 3 ..$ a: chr [1, 1] "a" ..$ b: chr [1, 1] "b" ..$ c: chr [1, 1] "c" List of 2 $ y0:List of 3 ..$ a: chr [1, 1] "a" ..$ b: chr [1, 1] "b" ..$ c: chr [1, 1] "c" $ y2:List of 3 ..$ : chr [1, 1] "a" ..$ : chr [1, 1] "b" ..$ : chr [1, 1] "c" [18:41:54.214] future_lapply() ... [18:41:54.217] Number of chunks: 2 [18:41:54.217] getGlobalsAndPackagesXApply() ... [18:41:54.217] - future.globals: TRUE [18:41:54.218] getGlobalsAndPackages() ... [18:41:54.218] Searching for globals... [18:41:54.219] - globals found: [1] 'FUN' [18:41:54.219] Searching for globals ... DONE [18:41:54.219] Resolving globals: FALSE [18:41:54.220] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:54.220] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:54.220] - globals: [1] 'FUN' [18:41:54.221] [18:41:54.221] getGlobalsAndPackages() ... DONE [18:41:54.221] - globals found/used: [n=1] 'FUN' [18:41:54.221] - needed namespaces: [n=0] [18:41:54.221] Finding globals ... DONE [18:41:54.221] - use_args: TRUE [18:41:54.221] - Getting '...' globals ... [18:41:54.222] resolve() on list ... [18:41:54.222] recursive: 0 [18:41:54.222] length: 1 [18:41:54.222] elements: '...' [18:41:54.223] length: 0 (resolved future 1) [18:41:54.223] resolve() on list ... DONE [18:41:54.223] - '...' content: [n=0] [18:41:54.223] List of 1 [18:41:54.223] $ ...: list() [18:41:54.223] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.223] - attr(*, "where")=List of 1 [18:41:54.223] ..$ ...: [18:41:54.223] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.223] - attr(*, "resolved")= logi TRUE [18:41:54.223] - attr(*, "total_size")= num NA [18:41:54.229] - Getting '...' globals ... DONE [18:41:54.230] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.230] List of 2 [18:41:54.230] $ ...future.FUN:function (x) [18:41:54.230] $ ... : list() [18:41:54.230] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.230] - attr(*, "where")=List of 2 [18:41:54.230] ..$ ...future.FUN: [18:41:54.230] ..$ ... : [18:41:54.230] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.230] - attr(*, "resolved")= logi FALSE [18:41:54.230] - attr(*, "total_size")= int 4788 [18:41:54.233] Packages to be attached in all futures: [n=0] [18:41:54.233] getGlobalsAndPackagesXApply() ... DONE [18:41:54.234] Number of futures (= number of chunks): 2 [18:41:54.234] Launching 2 futures (chunks) ... [18:41:54.234] Chunk #1 of 2 ... [18:41:54.234] - Finding globals in 'X' for chunk #1 ... [18:41:54.234] getGlobalsAndPackages() ... [18:41:54.235] Searching for globals... [18:41:54.235] [18:41:54.235] Searching for globals ... DONE [18:41:54.235] - globals: [0] [18:41:54.235] getGlobalsAndPackages() ... DONE [18:41:54.236] + additional globals found: [n=0] [18:41:54.236] + additional namespaces needed: [n=0] [18:41:54.236] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.236] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.236] - seeds: [18:41:54.236] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.237] getGlobalsAndPackages() ... [18:41:54.237] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.237] Resolving globals: FALSE [18:41:54.237] Tweak future expression to call with '...' arguments ... [18:41:54.237] { [18:41:54.237] do.call(function(...) { [18:41:54.237] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.237] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.237] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.237] on.exit(options(oopts), add = TRUE) [18:41:54.237] } [18:41:54.237] { [18:41:54.237] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.237] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.237] ...future.FUN(...future.X_jj, ...) [18:41:54.237] }) [18:41:54.237] } [18:41:54.237] }, args = future.call.arguments) [18:41:54.237] } [18:41:54.238] Tweak future expression to call with '...' arguments ... DONE [18:41:54.238] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.238] [18:41:54.239] getGlobalsAndPackages() ... DONE [18:41:54.239] run() for 'Future' ... [18:41:54.239] - state: 'created' [18:41:54.239] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.255] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.255] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.255] - Field: 'node' [18:41:54.255] - Field: 'label' [18:41:54.256] - Field: 'local' [18:41:54.256] - Field: 'owner' [18:41:54.256] - Field: 'envir' [18:41:54.256] - Field: 'workers' [18:41:54.256] - Field: 'packages' [18:41:54.257] - Field: 'gc' [18:41:54.257] - Field: 'conditions' [18:41:54.257] - Field: 'persistent' [18:41:54.257] - Field: 'expr' [18:41:54.257] - Field: 'uuid' [18:41:54.257] - Field: 'seed' [18:41:54.258] - Field: 'version' [18:41:54.258] - Field: 'result' [18:41:54.258] - Field: 'asynchronous' [18:41:54.258] - Field: 'calls' [18:41:54.258] - Field: 'globals' [18:41:54.258] - Field: 'stdout' [18:41:54.259] - Field: 'earlySignal' [18:41:54.259] - Field: 'lazy' [18:41:54.259] - Field: 'state' [18:41:54.259] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.259] - Launch lazy future ... [18:41:54.260] Packages needed by the future expression (n = 0): [18:41:54.260] Packages needed by future strategies (n = 0): [18:41:54.260] { [18:41:54.260] { [18:41:54.260] { [18:41:54.260] ...future.startTime <- base::Sys.time() [18:41:54.260] { [18:41:54.260] { [18:41:54.260] { [18:41:54.260] { [18:41:54.260] base::local({ [18:41:54.260] has_future <- base::requireNamespace("future", [18:41:54.260] quietly = TRUE) [18:41:54.260] if (has_future) { [18:41:54.260] ns <- base::getNamespace("future") [18:41:54.260] version <- ns[[".package"]][["version"]] [18:41:54.260] if (is.null(version)) [18:41:54.260] version <- utils::packageVersion("future") [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] version <- NULL [18:41:54.260] } [18:41:54.260] if (!has_future || version < "1.8.0") { [18:41:54.260] info <- base::c(r_version = base::gsub("R version ", [18:41:54.260] "", base::R.version$version.string), [18:41:54.260] platform = base::sprintf("%s (%s-bit)", [18:41:54.260] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.260] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.260] "release", "version")], collapse = " "), [18:41:54.260] hostname = base::Sys.info()[["nodename"]]) [18:41:54.260] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.260] info) [18:41:54.260] info <- base::paste(info, collapse = "; ") [18:41:54.260] if (!has_future) { [18:41:54.260] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.260] info) [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.260] info, version) [18:41:54.260] } [18:41:54.260] base::stop(msg) [18:41:54.260] } [18:41:54.260] }) [18:41:54.260] } [18:41:54.260] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.260] base::options(mc.cores = 1L) [18:41:54.260] } [18:41:54.260] ...future.strategy.old <- future::plan("list") [18:41:54.260] options(future.plan = NULL) [18:41:54.260] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.260] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.260] } [18:41:54.260] ...future.workdir <- getwd() [18:41:54.260] } [18:41:54.260] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.260] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.260] } [18:41:54.260] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.260] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.260] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.260] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.260] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.260] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.260] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.260] base::names(...future.oldOptions)) [18:41:54.260] } [18:41:54.260] if (FALSE) { [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] if (TRUE) { [18:41:54.260] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.260] open = "w") [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.260] windows = "NUL", "/dev/null"), open = "w") [18:41:54.260] } [18:41:54.260] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.260] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.260] base::sink(type = "output", split = FALSE) [18:41:54.260] base::close(...future.stdout) [18:41:54.260] }, add = TRUE) [18:41:54.260] } [18:41:54.260] ...future.frame <- base::sys.nframe() [18:41:54.260] ...future.conditions <- base::list() [18:41:54.260] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.260] if (FALSE) { [18:41:54.260] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.260] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.260] } [18:41:54.260] ...future.result <- base::tryCatch({ [18:41:54.260] base::withCallingHandlers({ [18:41:54.260] ...future.value <- base::withVisible(base::local({ [18:41:54.260] ...future.makeSendCondition <- base::local({ [18:41:54.260] sendCondition <- NULL [18:41:54.260] function(frame = 1L) { [18:41:54.260] if (is.function(sendCondition)) [18:41:54.260] return(sendCondition) [18:41:54.260] ns <- getNamespace("parallel") [18:41:54.260] if (exists("sendData", mode = "function", [18:41:54.260] envir = ns)) { [18:41:54.260] parallel_sendData <- get("sendData", mode = "function", [18:41:54.260] envir = ns) [18:41:54.260] envir <- sys.frame(frame) [18:41:54.260] master <- NULL [18:41:54.260] while (!identical(envir, .GlobalEnv) && [18:41:54.260] !identical(envir, emptyenv())) { [18:41:54.260] if (exists("master", mode = "list", envir = envir, [18:41:54.260] inherits = FALSE)) { [18:41:54.260] master <- get("master", mode = "list", [18:41:54.260] envir = envir, inherits = FALSE) [18:41:54.260] if (inherits(master, c("SOCKnode", [18:41:54.260] "SOCK0node"))) { [18:41:54.260] sendCondition <<- function(cond) { [18:41:54.260] data <- list(type = "VALUE", value = cond, [18:41:54.260] success = TRUE) [18:41:54.260] parallel_sendData(master, data) [18:41:54.260] } [18:41:54.260] return(sendCondition) [18:41:54.260] } [18:41:54.260] } [18:41:54.260] frame <- frame + 1L [18:41:54.260] envir <- sys.frame(frame) [18:41:54.260] } [18:41:54.260] } [18:41:54.260] sendCondition <<- function(cond) NULL [18:41:54.260] } [18:41:54.260] }) [18:41:54.260] withCallingHandlers({ [18:41:54.260] { [18:41:54.260] do.call(function(...) { [18:41:54.260] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.260] if (!identical(...future.globals.maxSize.org, [18:41:54.260] ...future.globals.maxSize)) { [18:41:54.260] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.260] on.exit(options(oopts), add = TRUE) [18:41:54.260] } [18:41:54.260] { [18:41:54.260] lapply(seq_along(...future.elements_ii), [18:41:54.260] FUN = function(jj) { [18:41:54.260] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.260] ...future.FUN(...future.X_jj, ...) [18:41:54.260] }) [18:41:54.260] } [18:41:54.260] }, args = future.call.arguments) [18:41:54.260] } [18:41:54.260] }, immediateCondition = function(cond) { [18:41:54.260] sendCondition <- ...future.makeSendCondition() [18:41:54.260] sendCondition(cond) [18:41:54.260] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.260] { [18:41:54.260] inherits <- base::inherits [18:41:54.260] invokeRestart <- base::invokeRestart [18:41:54.260] is.null <- base::is.null [18:41:54.260] muffled <- FALSE [18:41:54.260] if (inherits(cond, "message")) { [18:41:54.260] muffled <- grepl(pattern, "muffleMessage") [18:41:54.260] if (muffled) [18:41:54.260] invokeRestart("muffleMessage") [18:41:54.260] } [18:41:54.260] else if (inherits(cond, "warning")) { [18:41:54.260] muffled <- grepl(pattern, "muffleWarning") [18:41:54.260] if (muffled) [18:41:54.260] invokeRestart("muffleWarning") [18:41:54.260] } [18:41:54.260] else if (inherits(cond, "condition")) { [18:41:54.260] if (!is.null(pattern)) { [18:41:54.260] computeRestarts <- base::computeRestarts [18:41:54.260] grepl <- base::grepl [18:41:54.260] restarts <- computeRestarts(cond) [18:41:54.260] for (restart in restarts) { [18:41:54.260] name <- restart$name [18:41:54.260] if (is.null(name)) [18:41:54.260] next [18:41:54.260] if (!grepl(pattern, name)) [18:41:54.260] next [18:41:54.260] invokeRestart(restart) [18:41:54.260] muffled <- TRUE [18:41:54.260] break [18:41:54.260] } [18:41:54.260] } [18:41:54.260] } [18:41:54.260] invisible(muffled) [18:41:54.260] } [18:41:54.260] muffleCondition(cond) [18:41:54.260] }) [18:41:54.260] })) [18:41:54.260] future::FutureResult(value = ...future.value$value, [18:41:54.260] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.260] ...future.rng), globalenv = if (FALSE) [18:41:54.260] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.260] ...future.globalenv.names)) [18:41:54.260] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.260] }, condition = base::local({ [18:41:54.260] c <- base::c [18:41:54.260] inherits <- base::inherits [18:41:54.260] invokeRestart <- base::invokeRestart [18:41:54.260] length <- base::length [18:41:54.260] list <- base::list [18:41:54.260] seq.int <- base::seq.int [18:41:54.260] signalCondition <- base::signalCondition [18:41:54.260] sys.calls <- base::sys.calls [18:41:54.260] `[[` <- base::`[[` [18:41:54.260] `+` <- base::`+` [18:41:54.260] `<<-` <- base::`<<-` [18:41:54.260] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.260] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.260] 3L)] [18:41:54.260] } [18:41:54.260] function(cond) { [18:41:54.260] is_error <- inherits(cond, "error") [18:41:54.260] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.260] NULL) [18:41:54.260] if (is_error) { [18:41:54.260] sessionInformation <- function() { [18:41:54.260] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.260] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.260] search = base::search(), system = base::Sys.info()) [18:41:54.260] } [18:41:54.260] ...future.conditions[[length(...future.conditions) + [18:41:54.260] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.260] cond$call), session = sessionInformation(), [18:41:54.260] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.260] signalCondition(cond) [18:41:54.260] } [18:41:54.260] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.260] "immediateCondition"))) { [18:41:54.260] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.260] ...future.conditions[[length(...future.conditions) + [18:41:54.260] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.260] if (TRUE && !signal) { [18:41:54.260] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.260] { [18:41:54.260] inherits <- base::inherits [18:41:54.260] invokeRestart <- base::invokeRestart [18:41:54.260] is.null <- base::is.null [18:41:54.260] muffled <- FALSE [18:41:54.260] if (inherits(cond, "message")) { [18:41:54.260] muffled <- grepl(pattern, "muffleMessage") [18:41:54.260] if (muffled) [18:41:54.260] invokeRestart("muffleMessage") [18:41:54.260] } [18:41:54.260] else if (inherits(cond, "warning")) { [18:41:54.260] muffled <- grepl(pattern, "muffleWarning") [18:41:54.260] if (muffled) [18:41:54.260] invokeRestart("muffleWarning") [18:41:54.260] } [18:41:54.260] else if (inherits(cond, "condition")) { [18:41:54.260] if (!is.null(pattern)) { [18:41:54.260] computeRestarts <- base::computeRestarts [18:41:54.260] grepl <- base::grepl [18:41:54.260] restarts <- computeRestarts(cond) [18:41:54.260] for (restart in restarts) { [18:41:54.260] name <- restart$name [18:41:54.260] if (is.null(name)) [18:41:54.260] next [18:41:54.260] if (!grepl(pattern, name)) [18:41:54.260] next [18:41:54.260] invokeRestart(restart) [18:41:54.260] muffled <- TRUE [18:41:54.260] break [18:41:54.260] } [18:41:54.260] } [18:41:54.260] } [18:41:54.260] invisible(muffled) [18:41:54.260] } [18:41:54.260] muffleCondition(cond, pattern = "^muffle") [18:41:54.260] } [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] if (TRUE) { [18:41:54.260] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.260] { [18:41:54.260] inherits <- base::inherits [18:41:54.260] invokeRestart <- base::invokeRestart [18:41:54.260] is.null <- base::is.null [18:41:54.260] muffled <- FALSE [18:41:54.260] if (inherits(cond, "message")) { [18:41:54.260] muffled <- grepl(pattern, "muffleMessage") [18:41:54.260] if (muffled) [18:41:54.260] invokeRestart("muffleMessage") [18:41:54.260] } [18:41:54.260] else if (inherits(cond, "warning")) { [18:41:54.260] muffled <- grepl(pattern, "muffleWarning") [18:41:54.260] if (muffled) [18:41:54.260] invokeRestart("muffleWarning") [18:41:54.260] } [18:41:54.260] else if (inherits(cond, "condition")) { [18:41:54.260] if (!is.null(pattern)) { [18:41:54.260] computeRestarts <- base::computeRestarts [18:41:54.260] grepl <- base::grepl [18:41:54.260] restarts <- computeRestarts(cond) [18:41:54.260] for (restart in restarts) { [18:41:54.260] name <- restart$name [18:41:54.260] if (is.null(name)) [18:41:54.260] next [18:41:54.260] if (!grepl(pattern, name)) [18:41:54.260] next [18:41:54.260] invokeRestart(restart) [18:41:54.260] muffled <- TRUE [18:41:54.260] break [18:41:54.260] } [18:41:54.260] } [18:41:54.260] } [18:41:54.260] invisible(muffled) [18:41:54.260] } [18:41:54.260] muffleCondition(cond, pattern = "^muffle") [18:41:54.260] } [18:41:54.260] } [18:41:54.260] } [18:41:54.260] })) [18:41:54.260] }, error = function(ex) { [18:41:54.260] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.260] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.260] ...future.rng), started = ...future.startTime, [18:41:54.260] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.260] version = "1.8"), class = "FutureResult") [18:41:54.260] }, finally = { [18:41:54.260] if (!identical(...future.workdir, getwd())) [18:41:54.260] setwd(...future.workdir) [18:41:54.260] { [18:41:54.260] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.260] ...future.oldOptions$nwarnings <- NULL [18:41:54.260] } [18:41:54.260] base::options(...future.oldOptions) [18:41:54.260] if (.Platform$OS.type == "windows") { [18:41:54.260] old_names <- names(...future.oldEnvVars) [18:41:54.260] envs <- base::Sys.getenv() [18:41:54.260] names <- names(envs) [18:41:54.260] common <- intersect(names, old_names) [18:41:54.260] added <- setdiff(names, old_names) [18:41:54.260] removed <- setdiff(old_names, names) [18:41:54.260] changed <- common[...future.oldEnvVars[common] != [18:41:54.260] envs[common]] [18:41:54.260] NAMES <- toupper(changed) [18:41:54.260] args <- list() [18:41:54.260] for (kk in seq_along(NAMES)) { [18:41:54.260] name <- changed[[kk]] [18:41:54.260] NAME <- NAMES[[kk]] [18:41:54.260] if (name != NAME && is.element(NAME, old_names)) [18:41:54.260] next [18:41:54.260] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.260] } [18:41:54.260] NAMES <- toupper(added) [18:41:54.260] for (kk in seq_along(NAMES)) { [18:41:54.260] name <- added[[kk]] [18:41:54.260] NAME <- NAMES[[kk]] [18:41:54.260] if (name != NAME && is.element(NAME, old_names)) [18:41:54.260] next [18:41:54.260] args[[name]] <- "" [18:41:54.260] } [18:41:54.260] NAMES <- toupper(removed) [18:41:54.260] for (kk in seq_along(NAMES)) { [18:41:54.260] name <- removed[[kk]] [18:41:54.260] NAME <- NAMES[[kk]] [18:41:54.260] if (name != NAME && is.element(NAME, old_names)) [18:41:54.260] next [18:41:54.260] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.260] } [18:41:54.260] if (length(args) > 0) [18:41:54.260] base::do.call(base::Sys.setenv, args = args) [18:41:54.260] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.260] } [18:41:54.260] { [18:41:54.260] if (base::length(...future.futureOptionsAdded) > [18:41:54.260] 0L) { [18:41:54.260] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.260] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.260] base::options(opts) [18:41:54.260] } [18:41:54.260] { [18:41:54.260] { [18:41:54.260] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.260] NULL [18:41:54.260] } [18:41:54.260] options(future.plan = NULL) [18:41:54.260] if (is.na(NA_character_)) [18:41:54.260] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.260] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.260] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.260] .init = FALSE) [18:41:54.260] } [18:41:54.260] } [18:41:54.260] } [18:41:54.260] }) [18:41:54.260] if (TRUE) { [18:41:54.260] base::sink(type = "output", split = FALSE) [18:41:54.260] if (TRUE) { [18:41:54.260] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.260] } [18:41:54.260] else { [18:41:54.260] ...future.result["stdout"] <- base::list(NULL) [18:41:54.260] } [18:41:54.260] base::close(...future.stdout) [18:41:54.260] ...future.stdout <- NULL [18:41:54.260] } [18:41:54.260] ...future.result$conditions <- ...future.conditions [18:41:54.260] ...future.result$finished <- base::Sys.time() [18:41:54.260] ...future.result [18:41:54.260] } [18:41:54.266] Exporting 5 global objects (847 bytes) to cluster node #1 ... [18:41:54.266] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.266] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.267] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.267] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.267] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:54.268] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:54.268] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.268] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.268] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.269] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.269] Exporting 5 global objects (847 bytes) to cluster node #1 ... DONE [18:41:54.270] MultisessionFuture started [18:41:54.270] - Launch lazy future ... done [18:41:54.270] run() for 'MultisessionFuture' ... done [18:41:54.270] Created future: [18:41:54.285] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.285] - Validating connection of MultisessionFuture [18:41:54.285] - received message: FutureResult [18:41:54.286] - Received FutureResult [18:41:54.286] - Erased future from FutureRegistry [18:41:54.286] result() for ClusterFuture ... [18:41:54.286] - result already collected: FutureResult [18:41:54.286] result() for ClusterFuture ... done [18:41:54.287] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.270] MultisessionFuture: [18:41:54.270] Label: 'future_sapply-1' [18:41:54.270] Expression: [18:41:54.270] { [18:41:54.270] do.call(function(...) { [18:41:54.270] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.270] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.270] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.270] on.exit(options(oopts), add = TRUE) [18:41:54.270] } [18:41:54.270] { [18:41:54.270] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.270] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.270] ...future.FUN(...future.X_jj, ...) [18:41:54.270] }) [18:41:54.270] } [18:41:54.270] }, args = future.call.arguments) [18:41:54.270] } [18:41:54.270] Lazy evaluation: FALSE [18:41:54.270] Asynchronous evaluation: TRUE [18:41:54.270] Local evaluation: TRUE [18:41:54.270] Environment: R_GlobalEnv [18:41:54.270] Capture standard output: TRUE [18:41:54.270] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.270] Globals: 5 objects totaling 384 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.270] Packages: [18:41:54.270] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.270] Resolved: TRUE [18:41:54.270] Value: [18:41:54.270] Conditions captured: [18:41:54.270] Early signaling: FALSE [18:41:54.270] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.270] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.287] Chunk #1 of 2 ... DONE [18:41:54.287] Chunk #2 of 2 ... [18:41:54.287] - Finding globals in 'X' for chunk #2 ... [18:41:54.288] getGlobalsAndPackages() ... [18:41:54.288] Searching for globals... [18:41:54.288] [18:41:54.288] Searching for globals ... DONE [18:41:54.288] - globals: [0] [18:41:54.288] getGlobalsAndPackages() ... DONE [18:41:54.289] + additional globals found: [n=0] [18:41:54.289] + additional namespaces needed: [n=0] [18:41:54.289] - Finding globals in 'X' for chunk #2 ... DONE [18:41:54.289] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.289] - seeds: [18:41:54.289] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.290] getGlobalsAndPackages() ... [18:41:54.290] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.290] Resolving globals: FALSE [18:41:54.290] Tweak future expression to call with '...' arguments ... [18:41:54.290] { [18:41:54.290] do.call(function(...) { [18:41:54.290] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.290] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.290] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.290] on.exit(options(oopts), add = TRUE) [18:41:54.290] } [18:41:54.290] { [18:41:54.290] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.290] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.290] ...future.FUN(...future.X_jj, ...) [18:41:54.290] }) [18:41:54.290] } [18:41:54.290] }, args = future.call.arguments) [18:41:54.290] } [18:41:54.291] Tweak future expression to call with '...' arguments ... DONE [18:41:54.291] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.291] [18:41:54.292] getGlobalsAndPackages() ... DONE [18:41:54.292] run() for 'Future' ... [18:41:54.292] - state: 'created' [18:41:54.292] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.309] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.309] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.309] - Field: 'node' [18:41:54.310] - Field: 'label' [18:41:54.310] - Field: 'local' [18:41:54.310] - Field: 'owner' [18:41:54.310] - Field: 'envir' [18:41:54.310] - Field: 'workers' [18:41:54.310] - Field: 'packages' [18:41:54.311] - Field: 'gc' [18:41:54.311] - Field: 'conditions' [18:41:54.311] - Field: 'persistent' [18:41:54.311] - Field: 'expr' [18:41:54.311] - Field: 'uuid' [18:41:54.312] - Field: 'seed' [18:41:54.312] - Field: 'version' [18:41:54.312] - Field: 'result' [18:41:54.312] - Field: 'asynchronous' [18:41:54.312] - Field: 'calls' [18:41:54.312] - Field: 'globals' [18:41:54.313] - Field: 'stdout' [18:41:54.313] - Field: 'earlySignal' [18:41:54.313] - Field: 'lazy' [18:41:54.313] - Field: 'state' [18:41:54.313] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.313] - Launch lazy future ... [18:41:54.314] Packages needed by the future expression (n = 0): [18:41:54.314] Packages needed by future strategies (n = 0): [18:41:54.315] { [18:41:54.315] { [18:41:54.315] { [18:41:54.315] ...future.startTime <- base::Sys.time() [18:41:54.315] { [18:41:54.315] { [18:41:54.315] { [18:41:54.315] { [18:41:54.315] base::local({ [18:41:54.315] has_future <- base::requireNamespace("future", [18:41:54.315] quietly = TRUE) [18:41:54.315] if (has_future) { [18:41:54.315] ns <- base::getNamespace("future") [18:41:54.315] version <- ns[[".package"]][["version"]] [18:41:54.315] if (is.null(version)) [18:41:54.315] version <- utils::packageVersion("future") [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] version <- NULL [18:41:54.315] } [18:41:54.315] if (!has_future || version < "1.8.0") { [18:41:54.315] info <- base::c(r_version = base::gsub("R version ", [18:41:54.315] "", base::R.version$version.string), [18:41:54.315] platform = base::sprintf("%s (%s-bit)", [18:41:54.315] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.315] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.315] "release", "version")], collapse = " "), [18:41:54.315] hostname = base::Sys.info()[["nodename"]]) [18:41:54.315] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.315] info) [18:41:54.315] info <- base::paste(info, collapse = "; ") [18:41:54.315] if (!has_future) { [18:41:54.315] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.315] info) [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.315] info, version) [18:41:54.315] } [18:41:54.315] base::stop(msg) [18:41:54.315] } [18:41:54.315] }) [18:41:54.315] } [18:41:54.315] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.315] base::options(mc.cores = 1L) [18:41:54.315] } [18:41:54.315] ...future.strategy.old <- future::plan("list") [18:41:54.315] options(future.plan = NULL) [18:41:54.315] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.315] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.315] } [18:41:54.315] ...future.workdir <- getwd() [18:41:54.315] } [18:41:54.315] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.315] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.315] } [18:41:54.315] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.315] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.315] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.315] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.315] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.315] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.315] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.315] base::names(...future.oldOptions)) [18:41:54.315] } [18:41:54.315] if (FALSE) { [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] if (TRUE) { [18:41:54.315] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.315] open = "w") [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.315] windows = "NUL", "/dev/null"), open = "w") [18:41:54.315] } [18:41:54.315] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.315] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.315] base::sink(type = "output", split = FALSE) [18:41:54.315] base::close(...future.stdout) [18:41:54.315] }, add = TRUE) [18:41:54.315] } [18:41:54.315] ...future.frame <- base::sys.nframe() [18:41:54.315] ...future.conditions <- base::list() [18:41:54.315] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.315] if (FALSE) { [18:41:54.315] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.315] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.315] } [18:41:54.315] ...future.result <- base::tryCatch({ [18:41:54.315] base::withCallingHandlers({ [18:41:54.315] ...future.value <- base::withVisible(base::local({ [18:41:54.315] ...future.makeSendCondition <- base::local({ [18:41:54.315] sendCondition <- NULL [18:41:54.315] function(frame = 1L) { [18:41:54.315] if (is.function(sendCondition)) [18:41:54.315] return(sendCondition) [18:41:54.315] ns <- getNamespace("parallel") [18:41:54.315] if (exists("sendData", mode = "function", [18:41:54.315] envir = ns)) { [18:41:54.315] parallel_sendData <- get("sendData", mode = "function", [18:41:54.315] envir = ns) [18:41:54.315] envir <- sys.frame(frame) [18:41:54.315] master <- NULL [18:41:54.315] while (!identical(envir, .GlobalEnv) && [18:41:54.315] !identical(envir, emptyenv())) { [18:41:54.315] if (exists("master", mode = "list", envir = envir, [18:41:54.315] inherits = FALSE)) { [18:41:54.315] master <- get("master", mode = "list", [18:41:54.315] envir = envir, inherits = FALSE) [18:41:54.315] if (inherits(master, c("SOCKnode", [18:41:54.315] "SOCK0node"))) { [18:41:54.315] sendCondition <<- function(cond) { [18:41:54.315] data <- list(type = "VALUE", value = cond, [18:41:54.315] success = TRUE) [18:41:54.315] parallel_sendData(master, data) [18:41:54.315] } [18:41:54.315] return(sendCondition) [18:41:54.315] } [18:41:54.315] } [18:41:54.315] frame <- frame + 1L [18:41:54.315] envir <- sys.frame(frame) [18:41:54.315] } [18:41:54.315] } [18:41:54.315] sendCondition <<- function(cond) NULL [18:41:54.315] } [18:41:54.315] }) [18:41:54.315] withCallingHandlers({ [18:41:54.315] { [18:41:54.315] do.call(function(...) { [18:41:54.315] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.315] if (!identical(...future.globals.maxSize.org, [18:41:54.315] ...future.globals.maxSize)) { [18:41:54.315] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.315] on.exit(options(oopts), add = TRUE) [18:41:54.315] } [18:41:54.315] { [18:41:54.315] lapply(seq_along(...future.elements_ii), [18:41:54.315] FUN = function(jj) { [18:41:54.315] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.315] ...future.FUN(...future.X_jj, ...) [18:41:54.315] }) [18:41:54.315] } [18:41:54.315] }, args = future.call.arguments) [18:41:54.315] } [18:41:54.315] }, immediateCondition = function(cond) { [18:41:54.315] sendCondition <- ...future.makeSendCondition() [18:41:54.315] sendCondition(cond) [18:41:54.315] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.315] { [18:41:54.315] inherits <- base::inherits [18:41:54.315] invokeRestart <- base::invokeRestart [18:41:54.315] is.null <- base::is.null [18:41:54.315] muffled <- FALSE [18:41:54.315] if (inherits(cond, "message")) { [18:41:54.315] muffled <- grepl(pattern, "muffleMessage") [18:41:54.315] if (muffled) [18:41:54.315] invokeRestart("muffleMessage") [18:41:54.315] } [18:41:54.315] else if (inherits(cond, "warning")) { [18:41:54.315] muffled <- grepl(pattern, "muffleWarning") [18:41:54.315] if (muffled) [18:41:54.315] invokeRestart("muffleWarning") [18:41:54.315] } [18:41:54.315] else if (inherits(cond, "condition")) { [18:41:54.315] if (!is.null(pattern)) { [18:41:54.315] computeRestarts <- base::computeRestarts [18:41:54.315] grepl <- base::grepl [18:41:54.315] restarts <- computeRestarts(cond) [18:41:54.315] for (restart in restarts) { [18:41:54.315] name <- restart$name [18:41:54.315] if (is.null(name)) [18:41:54.315] next [18:41:54.315] if (!grepl(pattern, name)) [18:41:54.315] next [18:41:54.315] invokeRestart(restart) [18:41:54.315] muffled <- TRUE [18:41:54.315] break [18:41:54.315] } [18:41:54.315] } [18:41:54.315] } [18:41:54.315] invisible(muffled) [18:41:54.315] } [18:41:54.315] muffleCondition(cond) [18:41:54.315] }) [18:41:54.315] })) [18:41:54.315] future::FutureResult(value = ...future.value$value, [18:41:54.315] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.315] ...future.rng), globalenv = if (FALSE) [18:41:54.315] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.315] ...future.globalenv.names)) [18:41:54.315] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.315] }, condition = base::local({ [18:41:54.315] c <- base::c [18:41:54.315] inherits <- base::inherits [18:41:54.315] invokeRestart <- base::invokeRestart [18:41:54.315] length <- base::length [18:41:54.315] list <- base::list [18:41:54.315] seq.int <- base::seq.int [18:41:54.315] signalCondition <- base::signalCondition [18:41:54.315] sys.calls <- base::sys.calls [18:41:54.315] `[[` <- base::`[[` [18:41:54.315] `+` <- base::`+` [18:41:54.315] `<<-` <- base::`<<-` [18:41:54.315] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.315] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.315] 3L)] [18:41:54.315] } [18:41:54.315] function(cond) { [18:41:54.315] is_error <- inherits(cond, "error") [18:41:54.315] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.315] NULL) [18:41:54.315] if (is_error) { [18:41:54.315] sessionInformation <- function() { [18:41:54.315] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.315] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.315] search = base::search(), system = base::Sys.info()) [18:41:54.315] } [18:41:54.315] ...future.conditions[[length(...future.conditions) + [18:41:54.315] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.315] cond$call), session = sessionInformation(), [18:41:54.315] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.315] signalCondition(cond) [18:41:54.315] } [18:41:54.315] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.315] "immediateCondition"))) { [18:41:54.315] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.315] ...future.conditions[[length(...future.conditions) + [18:41:54.315] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.315] if (TRUE && !signal) { [18:41:54.315] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.315] { [18:41:54.315] inherits <- base::inherits [18:41:54.315] invokeRestart <- base::invokeRestart [18:41:54.315] is.null <- base::is.null [18:41:54.315] muffled <- FALSE [18:41:54.315] if (inherits(cond, "message")) { [18:41:54.315] muffled <- grepl(pattern, "muffleMessage") [18:41:54.315] if (muffled) [18:41:54.315] invokeRestart("muffleMessage") [18:41:54.315] } [18:41:54.315] else if (inherits(cond, "warning")) { [18:41:54.315] muffled <- grepl(pattern, "muffleWarning") [18:41:54.315] if (muffled) [18:41:54.315] invokeRestart("muffleWarning") [18:41:54.315] } [18:41:54.315] else if (inherits(cond, "condition")) { [18:41:54.315] if (!is.null(pattern)) { [18:41:54.315] computeRestarts <- base::computeRestarts [18:41:54.315] grepl <- base::grepl [18:41:54.315] restarts <- computeRestarts(cond) [18:41:54.315] for (restart in restarts) { [18:41:54.315] name <- restart$name [18:41:54.315] if (is.null(name)) [18:41:54.315] next [18:41:54.315] if (!grepl(pattern, name)) [18:41:54.315] next [18:41:54.315] invokeRestart(restart) [18:41:54.315] muffled <- TRUE [18:41:54.315] break [18:41:54.315] } [18:41:54.315] } [18:41:54.315] } [18:41:54.315] invisible(muffled) [18:41:54.315] } [18:41:54.315] muffleCondition(cond, pattern = "^muffle") [18:41:54.315] } [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] if (TRUE) { [18:41:54.315] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.315] { [18:41:54.315] inherits <- base::inherits [18:41:54.315] invokeRestart <- base::invokeRestart [18:41:54.315] is.null <- base::is.null [18:41:54.315] muffled <- FALSE [18:41:54.315] if (inherits(cond, "message")) { [18:41:54.315] muffled <- grepl(pattern, "muffleMessage") [18:41:54.315] if (muffled) [18:41:54.315] invokeRestart("muffleMessage") [18:41:54.315] } [18:41:54.315] else if (inherits(cond, "warning")) { [18:41:54.315] muffled <- grepl(pattern, "muffleWarning") [18:41:54.315] if (muffled) [18:41:54.315] invokeRestart("muffleWarning") [18:41:54.315] } [18:41:54.315] else if (inherits(cond, "condition")) { [18:41:54.315] if (!is.null(pattern)) { [18:41:54.315] computeRestarts <- base::computeRestarts [18:41:54.315] grepl <- base::grepl [18:41:54.315] restarts <- computeRestarts(cond) [18:41:54.315] for (restart in restarts) { [18:41:54.315] name <- restart$name [18:41:54.315] if (is.null(name)) [18:41:54.315] next [18:41:54.315] if (!grepl(pattern, name)) [18:41:54.315] next [18:41:54.315] invokeRestart(restart) [18:41:54.315] muffled <- TRUE [18:41:54.315] break [18:41:54.315] } [18:41:54.315] } [18:41:54.315] } [18:41:54.315] invisible(muffled) [18:41:54.315] } [18:41:54.315] muffleCondition(cond, pattern = "^muffle") [18:41:54.315] } [18:41:54.315] } [18:41:54.315] } [18:41:54.315] })) [18:41:54.315] }, error = function(ex) { [18:41:54.315] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.315] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.315] ...future.rng), started = ...future.startTime, [18:41:54.315] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.315] version = "1.8"), class = "FutureResult") [18:41:54.315] }, finally = { [18:41:54.315] if (!identical(...future.workdir, getwd())) [18:41:54.315] setwd(...future.workdir) [18:41:54.315] { [18:41:54.315] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.315] ...future.oldOptions$nwarnings <- NULL [18:41:54.315] } [18:41:54.315] base::options(...future.oldOptions) [18:41:54.315] if (.Platform$OS.type == "windows") { [18:41:54.315] old_names <- names(...future.oldEnvVars) [18:41:54.315] envs <- base::Sys.getenv() [18:41:54.315] names <- names(envs) [18:41:54.315] common <- intersect(names, old_names) [18:41:54.315] added <- setdiff(names, old_names) [18:41:54.315] removed <- setdiff(old_names, names) [18:41:54.315] changed <- common[...future.oldEnvVars[common] != [18:41:54.315] envs[common]] [18:41:54.315] NAMES <- toupper(changed) [18:41:54.315] args <- list() [18:41:54.315] for (kk in seq_along(NAMES)) { [18:41:54.315] name <- changed[[kk]] [18:41:54.315] NAME <- NAMES[[kk]] [18:41:54.315] if (name != NAME && is.element(NAME, old_names)) [18:41:54.315] next [18:41:54.315] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.315] } [18:41:54.315] NAMES <- toupper(added) [18:41:54.315] for (kk in seq_along(NAMES)) { [18:41:54.315] name <- added[[kk]] [18:41:54.315] NAME <- NAMES[[kk]] [18:41:54.315] if (name != NAME && is.element(NAME, old_names)) [18:41:54.315] next [18:41:54.315] args[[name]] <- "" [18:41:54.315] } [18:41:54.315] NAMES <- toupper(removed) [18:41:54.315] for (kk in seq_along(NAMES)) { [18:41:54.315] name <- removed[[kk]] [18:41:54.315] NAME <- NAMES[[kk]] [18:41:54.315] if (name != NAME && is.element(NAME, old_names)) [18:41:54.315] next [18:41:54.315] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.315] } [18:41:54.315] if (length(args) > 0) [18:41:54.315] base::do.call(base::Sys.setenv, args = args) [18:41:54.315] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.315] } [18:41:54.315] { [18:41:54.315] if (base::length(...future.futureOptionsAdded) > [18:41:54.315] 0L) { [18:41:54.315] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.315] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.315] base::options(opts) [18:41:54.315] } [18:41:54.315] { [18:41:54.315] { [18:41:54.315] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.315] NULL [18:41:54.315] } [18:41:54.315] options(future.plan = NULL) [18:41:54.315] if (is.na(NA_character_)) [18:41:54.315] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.315] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.315] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.315] .init = FALSE) [18:41:54.315] } [18:41:54.315] } [18:41:54.315] } [18:41:54.315] }) [18:41:54.315] if (TRUE) { [18:41:54.315] base::sink(type = "output", split = FALSE) [18:41:54.315] if (TRUE) { [18:41:54.315] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.315] } [18:41:54.315] else { [18:41:54.315] ...future.result["stdout"] <- base::list(NULL) [18:41:54.315] } [18:41:54.315] base::close(...future.stdout) [18:41:54.315] ...future.stdout <- NULL [18:41:54.315] } [18:41:54.315] ...future.result$conditions <- ...future.conditions [18:41:54.315] ...future.result$finished <- base::Sys.time() [18:41:54.315] ...future.result [18:41:54.315] } [18:41:54.320] Exporting 5 global objects (864 bytes) to cluster node #1 ... [18:41:54.320] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.320] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.321] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.321] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.321] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:54.322] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:54.322] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.322] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.322] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.323] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.323] Exporting 5 global objects (864 bytes) to cluster node #1 ... DONE [18:41:54.324] MultisessionFuture started [18:41:54.324] - Launch lazy future ... done [18:41:54.324] run() for 'MultisessionFuture' ... done [18:41:54.324] Created future: [18:41:54.339] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.339] - Validating connection of MultisessionFuture [18:41:54.339] - received message: FutureResult [18:41:54.340] - Received FutureResult [18:41:54.340] - Erased future from FutureRegistry [18:41:54.340] result() for ClusterFuture ... [18:41:54.340] - result already collected: FutureResult [18:41:54.340] result() for ClusterFuture ... done [18:41:54.340] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.324] MultisessionFuture: [18:41:54.324] Label: 'future_sapply-2' [18:41:54.324] Expression: [18:41:54.324] { [18:41:54.324] do.call(function(...) { [18:41:54.324] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.324] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.324] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.324] on.exit(options(oopts), add = TRUE) [18:41:54.324] } [18:41:54.324] { [18:41:54.324] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.324] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.324] ...future.FUN(...future.X_jj, ...) [18:41:54.324] }) [18:41:54.324] } [18:41:54.324] }, args = future.call.arguments) [18:41:54.324] } [18:41:54.324] Lazy evaluation: FALSE [18:41:54.324] Asynchronous evaluation: TRUE [18:41:54.324] Local evaluation: TRUE [18:41:54.324] Environment: R_GlobalEnv [18:41:54.324] Capture standard output: TRUE [18:41:54.324] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.324] Globals: 5 objects totaling 401 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.324] Packages: [18:41:54.324] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.324] Resolved: TRUE [18:41:54.324] Value: [18:41:54.324] Conditions captured: [18:41:54.324] Early signaling: FALSE [18:41:54.324] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.324] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.341] Chunk #2 of 2 ... DONE [18:41:54.341] Launching 2 futures (chunks) ... DONE [18:41:54.341] Resolving 2 futures (chunks) ... [18:41:54.341] resolve() on list ... [18:41:54.341] recursive: 0 [18:41:54.342] length: 2 [18:41:54.342] [18:41:54.342] Future #1 [18:41:54.342] result() for ClusterFuture ... [18:41:54.342] - result already collected: FutureResult [18:41:54.342] result() for ClusterFuture ... done [18:41:54.343] result() for ClusterFuture ... [18:41:54.343] - result already collected: FutureResult [18:41:54.343] result() for ClusterFuture ... done [18:41:54.343] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.343] - nx: 2 [18:41:54.343] - relay: TRUE [18:41:54.343] - stdout: TRUE [18:41:54.344] - signal: TRUE [18:41:54.344] - resignal: FALSE [18:41:54.344] - force: TRUE [18:41:54.344] - relayed: [n=2] FALSE, FALSE [18:41:54.344] - queued futures: [n=2] FALSE, FALSE [18:41:54.344] - until=1 [18:41:54.345] - relaying element #1 [18:41:54.345] result() for ClusterFuture ... [18:41:54.345] - result already collected: FutureResult [18:41:54.345] result() for ClusterFuture ... done [18:41:54.345] result() for ClusterFuture ... [18:41:54.345] - result already collected: FutureResult [18:41:54.346] result() for ClusterFuture ... done [18:41:54.346] result() for ClusterFuture ... [18:41:54.346] - result already collected: FutureResult [18:41:54.346] result() for ClusterFuture ... done [18:41:54.346] result() for ClusterFuture ... [18:41:54.346] - result already collected: FutureResult [18:41:54.347] result() for ClusterFuture ... done [18:41:54.347] - relayed: [n=2] TRUE, FALSE [18:41:54.347] - queued futures: [n=2] TRUE, FALSE [18:41:54.347] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.347] length: 1 (resolved future 1) [18:41:54.347] Future #2 [18:41:54.348] result() for ClusterFuture ... [18:41:54.348] - result already collected: FutureResult [18:41:54.348] result() for ClusterFuture ... done [18:41:54.348] result() for ClusterFuture ... [18:41:54.348] - result already collected: FutureResult [18:41:54.348] result() for ClusterFuture ... done [18:41:54.349] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.349] - nx: 2 [18:41:54.349] - relay: TRUE [18:41:54.349] - stdout: TRUE [18:41:54.349] - signal: TRUE [18:41:54.349] - resignal: FALSE [18:41:54.349] - force: TRUE [18:41:54.350] - relayed: [n=2] TRUE, FALSE [18:41:54.350] - queued futures: [n=2] TRUE, FALSE [18:41:54.350] - until=2 [18:41:54.350] - relaying element #2 [18:41:54.350] result() for ClusterFuture ... [18:41:54.350] - result already collected: FutureResult [18:41:54.351] result() for ClusterFuture ... done [18:41:54.351] result() for ClusterFuture ... [18:41:54.351] - result already collected: FutureResult [18:41:54.351] result() for ClusterFuture ... done [18:41:54.351] result() for ClusterFuture ... [18:41:54.351] - result already collected: FutureResult [18:41:54.352] result() for ClusterFuture ... done [18:41:54.352] result() for ClusterFuture ... [18:41:54.352] - result already collected: FutureResult [18:41:54.352] result() for ClusterFuture ... done [18:41:54.352] - relayed: [n=2] TRUE, TRUE [18:41:54.352] - queued futures: [n=2] TRUE, TRUE [18:41:54.352] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.353] length: 0 (resolved future 2) [18:41:54.353] Relaying remaining futures [18:41:54.353] signalConditionsASAP(NULL, pos=0) ... [18:41:54.353] - nx: 2 [18:41:54.353] - relay: TRUE [18:41:54.353] - stdout: TRUE [18:41:54.354] - signal: TRUE [18:41:54.354] - resignal: FALSE [18:41:54.354] - force: TRUE [18:41:54.354] - relayed: [n=2] TRUE, TRUE [18:41:54.354] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.354] - relayed: [n=2] TRUE, TRUE [18:41:54.355] - queued futures: [n=2] TRUE, TRUE [18:41:54.355] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.355] resolve() on list ... DONE [18:41:54.355] result() for ClusterFuture ... [18:41:54.355] - result already collected: FutureResult [18:41:54.355] result() for ClusterFuture ... done [18:41:54.355] result() for ClusterFuture ... [18:41:54.356] - result already collected: FutureResult [18:41:54.356] result() for ClusterFuture ... done [18:41:54.356] result() for ClusterFuture ... [18:41:54.356] - result already collected: FutureResult [18:41:54.356] result() for ClusterFuture ... done [18:41:54.356] result() for ClusterFuture ... [18:41:54.357] - result already collected: FutureResult [18:41:54.357] result() for ClusterFuture ... done [18:41:54.357] - Number of value chunks collected: 2 [18:41:54.357] Resolving 2 futures (chunks) ... DONE [18:41:54.357] Reducing values from 2 chunks ... [18:41:54.357] - Number of values collected after concatenation: 3 [18:41:54.358] - Number of values expected: 3 [18:41:54.358] Reducing values from 2 chunks ... DONE [18:41:54.358] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:54.360] future_lapply() ... [18:41:54.363] Number of chunks: 2 [18:41:54.363] getGlobalsAndPackagesXApply() ... [18:41:54.363] - future.globals: TRUE [18:41:54.363] getGlobalsAndPackages() ... [18:41:54.363] Searching for globals... [18:41:54.365] - globals found: [2] 'FUN', 'UseMethod' [18:41:54.365] Searching for globals ... DONE [18:41:54.365] Resolving globals: FALSE [18:41:54.366] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:54.366] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:54.366] - globals: [1] 'FUN' [18:41:54.366] [18:41:54.367] getGlobalsAndPackages() ... DONE [18:41:54.367] - globals found/used: [n=1] 'FUN' [18:41:54.367] - needed namespaces: [n=0] [18:41:54.367] Finding globals ... DONE [18:41:54.367] - use_args: TRUE [18:41:54.367] - Getting '...' globals ... [18:41:54.368] resolve() on list ... [18:41:54.368] recursive: 0 [18:41:54.368] length: 1 [18:41:54.368] elements: '...' [18:41:54.369] length: 0 (resolved future 1) [18:41:54.369] resolve() on list ... DONE [18:41:54.369] - '...' content: [n=0] [18:41:54.369] List of 1 [18:41:54.369] $ ...: list() [18:41:54.369] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.369] - attr(*, "where")=List of 1 [18:41:54.369] ..$ ...: [18:41:54.369] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.369] - attr(*, "resolved")= logi TRUE [18:41:54.369] - attr(*, "total_size")= num NA [18:41:54.372] - Getting '...' globals ... DONE [18:41:54.372] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.372] List of 2 [18:41:54.372] $ ...future.FUN:function (x, ...) [18:41:54.372] $ ... : list() [18:41:54.372] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.372] - attr(*, "where")=List of 2 [18:41:54.372] ..$ ...future.FUN: [18:41:54.372] ..$ ... : [18:41:54.372] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.372] - attr(*, "resolved")= logi FALSE [18:41:54.372] - attr(*, "total_size")= int 5028 [18:41:54.376] Packages to be attached in all futures: [n=0] [18:41:54.376] getGlobalsAndPackagesXApply() ... DONE [18:41:54.376] Number of futures (= number of chunks): 2 [18:41:54.376] Launching 2 futures (chunks) ... [18:41:54.377] Chunk #1 of 2 ... [18:41:54.377] - Finding globals in 'X' for chunk #1 ... [18:41:54.377] getGlobalsAndPackages() ... [18:41:54.377] Searching for globals... [18:41:54.377] [18:41:54.378] Searching for globals ... DONE [18:41:54.378] - globals: [0] [18:41:54.378] getGlobalsAndPackages() ... DONE [18:41:54.378] + additional globals found: [n=0] [18:41:54.378] + additional namespaces needed: [n=0] [18:41:54.378] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.379] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.379] - seeds: [18:41:54.379] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.379] getGlobalsAndPackages() ... [18:41:54.379] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.379] Resolving globals: FALSE [18:41:54.380] Tweak future expression to call with '...' arguments ... [18:41:54.380] { [18:41:54.380] do.call(function(...) { [18:41:54.380] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.380] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.380] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.380] on.exit(options(oopts), add = TRUE) [18:41:54.380] } [18:41:54.380] { [18:41:54.380] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.380] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.380] ...future.FUN(...future.X_jj, ...) [18:41:54.380] }) [18:41:54.380] } [18:41:54.380] }, args = future.call.arguments) [18:41:54.380] } [18:41:54.380] Tweak future expression to call with '...' arguments ... DONE [18:41:54.381] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.381] [18:41:54.381] getGlobalsAndPackages() ... DONE [18:41:54.381] run() for 'Future' ... [18:41:54.382] - state: 'created' [18:41:54.382] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.397] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.397] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.401] - Field: 'node' [18:41:54.401] - Field: 'label' [18:41:54.401] - Field: 'local' [18:41:54.401] - Field: 'owner' [18:41:54.402] - Field: 'envir' [18:41:54.402] - Field: 'workers' [18:41:54.402] - Field: 'packages' [18:41:54.402] - Field: 'gc' [18:41:54.402] - Field: 'conditions' [18:41:54.402] - Field: 'persistent' [18:41:54.403] - Field: 'expr' [18:41:54.403] - Field: 'uuid' [18:41:54.403] - Field: 'seed' [18:41:54.403] - Field: 'version' [18:41:54.403] - Field: 'result' [18:41:54.404] - Field: 'asynchronous' [18:41:54.404] - Field: 'calls' [18:41:54.404] - Field: 'globals' [18:41:54.404] - Field: 'stdout' [18:41:54.404] - Field: 'earlySignal' [18:41:54.404] - Field: 'lazy' [18:41:54.405] - Field: 'state' [18:41:54.405] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.405] - Launch lazy future ... [18:41:54.405] Packages needed by the future expression (n = 0): [18:41:54.405] Packages needed by future strategies (n = 0): [18:41:54.406] { [18:41:54.406] { [18:41:54.406] { [18:41:54.406] ...future.startTime <- base::Sys.time() [18:41:54.406] { [18:41:54.406] { [18:41:54.406] { [18:41:54.406] { [18:41:54.406] base::local({ [18:41:54.406] has_future <- base::requireNamespace("future", [18:41:54.406] quietly = TRUE) [18:41:54.406] if (has_future) { [18:41:54.406] ns <- base::getNamespace("future") [18:41:54.406] version <- ns[[".package"]][["version"]] [18:41:54.406] if (is.null(version)) [18:41:54.406] version <- utils::packageVersion("future") [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] version <- NULL [18:41:54.406] } [18:41:54.406] if (!has_future || version < "1.8.0") { [18:41:54.406] info <- base::c(r_version = base::gsub("R version ", [18:41:54.406] "", base::R.version$version.string), [18:41:54.406] platform = base::sprintf("%s (%s-bit)", [18:41:54.406] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.406] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.406] "release", "version")], collapse = " "), [18:41:54.406] hostname = base::Sys.info()[["nodename"]]) [18:41:54.406] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.406] info) [18:41:54.406] info <- base::paste(info, collapse = "; ") [18:41:54.406] if (!has_future) { [18:41:54.406] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.406] info) [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.406] info, version) [18:41:54.406] } [18:41:54.406] base::stop(msg) [18:41:54.406] } [18:41:54.406] }) [18:41:54.406] } [18:41:54.406] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.406] base::options(mc.cores = 1L) [18:41:54.406] } [18:41:54.406] ...future.strategy.old <- future::plan("list") [18:41:54.406] options(future.plan = NULL) [18:41:54.406] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.406] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.406] } [18:41:54.406] ...future.workdir <- getwd() [18:41:54.406] } [18:41:54.406] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.406] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.406] } [18:41:54.406] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.406] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.406] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.406] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.406] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.406] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.406] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.406] base::names(...future.oldOptions)) [18:41:54.406] } [18:41:54.406] if (FALSE) { [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] if (TRUE) { [18:41:54.406] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.406] open = "w") [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.406] windows = "NUL", "/dev/null"), open = "w") [18:41:54.406] } [18:41:54.406] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.406] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.406] base::sink(type = "output", split = FALSE) [18:41:54.406] base::close(...future.stdout) [18:41:54.406] }, add = TRUE) [18:41:54.406] } [18:41:54.406] ...future.frame <- base::sys.nframe() [18:41:54.406] ...future.conditions <- base::list() [18:41:54.406] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.406] if (FALSE) { [18:41:54.406] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.406] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.406] } [18:41:54.406] ...future.result <- base::tryCatch({ [18:41:54.406] base::withCallingHandlers({ [18:41:54.406] ...future.value <- base::withVisible(base::local({ [18:41:54.406] ...future.makeSendCondition <- base::local({ [18:41:54.406] sendCondition <- NULL [18:41:54.406] function(frame = 1L) { [18:41:54.406] if (is.function(sendCondition)) [18:41:54.406] return(sendCondition) [18:41:54.406] ns <- getNamespace("parallel") [18:41:54.406] if (exists("sendData", mode = "function", [18:41:54.406] envir = ns)) { [18:41:54.406] parallel_sendData <- get("sendData", mode = "function", [18:41:54.406] envir = ns) [18:41:54.406] envir <- sys.frame(frame) [18:41:54.406] master <- NULL [18:41:54.406] while (!identical(envir, .GlobalEnv) && [18:41:54.406] !identical(envir, emptyenv())) { [18:41:54.406] if (exists("master", mode = "list", envir = envir, [18:41:54.406] inherits = FALSE)) { [18:41:54.406] master <- get("master", mode = "list", [18:41:54.406] envir = envir, inherits = FALSE) [18:41:54.406] if (inherits(master, c("SOCKnode", [18:41:54.406] "SOCK0node"))) { [18:41:54.406] sendCondition <<- function(cond) { [18:41:54.406] data <- list(type = "VALUE", value = cond, [18:41:54.406] success = TRUE) [18:41:54.406] parallel_sendData(master, data) [18:41:54.406] } [18:41:54.406] return(sendCondition) [18:41:54.406] } [18:41:54.406] } [18:41:54.406] frame <- frame + 1L [18:41:54.406] envir <- sys.frame(frame) [18:41:54.406] } [18:41:54.406] } [18:41:54.406] sendCondition <<- function(cond) NULL [18:41:54.406] } [18:41:54.406] }) [18:41:54.406] withCallingHandlers({ [18:41:54.406] { [18:41:54.406] do.call(function(...) { [18:41:54.406] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.406] if (!identical(...future.globals.maxSize.org, [18:41:54.406] ...future.globals.maxSize)) { [18:41:54.406] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.406] on.exit(options(oopts), add = TRUE) [18:41:54.406] } [18:41:54.406] { [18:41:54.406] lapply(seq_along(...future.elements_ii), [18:41:54.406] FUN = function(jj) { [18:41:54.406] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.406] ...future.FUN(...future.X_jj, ...) [18:41:54.406] }) [18:41:54.406] } [18:41:54.406] }, args = future.call.arguments) [18:41:54.406] } [18:41:54.406] }, immediateCondition = function(cond) { [18:41:54.406] sendCondition <- ...future.makeSendCondition() [18:41:54.406] sendCondition(cond) [18:41:54.406] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.406] { [18:41:54.406] inherits <- base::inherits [18:41:54.406] invokeRestart <- base::invokeRestart [18:41:54.406] is.null <- base::is.null [18:41:54.406] muffled <- FALSE [18:41:54.406] if (inherits(cond, "message")) { [18:41:54.406] muffled <- grepl(pattern, "muffleMessage") [18:41:54.406] if (muffled) [18:41:54.406] invokeRestart("muffleMessage") [18:41:54.406] } [18:41:54.406] else if (inherits(cond, "warning")) { [18:41:54.406] muffled <- grepl(pattern, "muffleWarning") [18:41:54.406] if (muffled) [18:41:54.406] invokeRestart("muffleWarning") [18:41:54.406] } [18:41:54.406] else if (inherits(cond, "condition")) { [18:41:54.406] if (!is.null(pattern)) { [18:41:54.406] computeRestarts <- base::computeRestarts [18:41:54.406] grepl <- base::grepl [18:41:54.406] restarts <- computeRestarts(cond) [18:41:54.406] for (restart in restarts) { [18:41:54.406] name <- restart$name [18:41:54.406] if (is.null(name)) [18:41:54.406] next [18:41:54.406] if (!grepl(pattern, name)) [18:41:54.406] next [18:41:54.406] invokeRestart(restart) [18:41:54.406] muffled <- TRUE [18:41:54.406] break [18:41:54.406] } [18:41:54.406] } [18:41:54.406] } [18:41:54.406] invisible(muffled) [18:41:54.406] } [18:41:54.406] muffleCondition(cond) [18:41:54.406] }) [18:41:54.406] })) [18:41:54.406] future::FutureResult(value = ...future.value$value, [18:41:54.406] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.406] ...future.rng), globalenv = if (FALSE) [18:41:54.406] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.406] ...future.globalenv.names)) [18:41:54.406] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.406] }, condition = base::local({ [18:41:54.406] c <- base::c [18:41:54.406] inherits <- base::inherits [18:41:54.406] invokeRestart <- base::invokeRestart [18:41:54.406] length <- base::length [18:41:54.406] list <- base::list [18:41:54.406] seq.int <- base::seq.int [18:41:54.406] signalCondition <- base::signalCondition [18:41:54.406] sys.calls <- base::sys.calls [18:41:54.406] `[[` <- base::`[[` [18:41:54.406] `+` <- base::`+` [18:41:54.406] `<<-` <- base::`<<-` [18:41:54.406] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.406] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.406] 3L)] [18:41:54.406] } [18:41:54.406] function(cond) { [18:41:54.406] is_error <- inherits(cond, "error") [18:41:54.406] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.406] NULL) [18:41:54.406] if (is_error) { [18:41:54.406] sessionInformation <- function() { [18:41:54.406] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.406] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.406] search = base::search(), system = base::Sys.info()) [18:41:54.406] } [18:41:54.406] ...future.conditions[[length(...future.conditions) + [18:41:54.406] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.406] cond$call), session = sessionInformation(), [18:41:54.406] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.406] signalCondition(cond) [18:41:54.406] } [18:41:54.406] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.406] "immediateCondition"))) { [18:41:54.406] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.406] ...future.conditions[[length(...future.conditions) + [18:41:54.406] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.406] if (TRUE && !signal) { [18:41:54.406] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.406] { [18:41:54.406] inherits <- base::inherits [18:41:54.406] invokeRestart <- base::invokeRestart [18:41:54.406] is.null <- base::is.null [18:41:54.406] muffled <- FALSE [18:41:54.406] if (inherits(cond, "message")) { [18:41:54.406] muffled <- grepl(pattern, "muffleMessage") [18:41:54.406] if (muffled) [18:41:54.406] invokeRestart("muffleMessage") [18:41:54.406] } [18:41:54.406] else if (inherits(cond, "warning")) { [18:41:54.406] muffled <- grepl(pattern, "muffleWarning") [18:41:54.406] if (muffled) [18:41:54.406] invokeRestart("muffleWarning") [18:41:54.406] } [18:41:54.406] else if (inherits(cond, "condition")) { [18:41:54.406] if (!is.null(pattern)) { [18:41:54.406] computeRestarts <- base::computeRestarts [18:41:54.406] grepl <- base::grepl [18:41:54.406] restarts <- computeRestarts(cond) [18:41:54.406] for (restart in restarts) { [18:41:54.406] name <- restart$name [18:41:54.406] if (is.null(name)) [18:41:54.406] next [18:41:54.406] if (!grepl(pattern, name)) [18:41:54.406] next [18:41:54.406] invokeRestart(restart) [18:41:54.406] muffled <- TRUE [18:41:54.406] break [18:41:54.406] } [18:41:54.406] } [18:41:54.406] } [18:41:54.406] invisible(muffled) [18:41:54.406] } [18:41:54.406] muffleCondition(cond, pattern = "^muffle") [18:41:54.406] } [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] if (TRUE) { [18:41:54.406] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.406] { [18:41:54.406] inherits <- base::inherits [18:41:54.406] invokeRestart <- base::invokeRestart [18:41:54.406] is.null <- base::is.null [18:41:54.406] muffled <- FALSE [18:41:54.406] if (inherits(cond, "message")) { [18:41:54.406] muffled <- grepl(pattern, "muffleMessage") [18:41:54.406] if (muffled) [18:41:54.406] invokeRestart("muffleMessage") [18:41:54.406] } [18:41:54.406] else if (inherits(cond, "warning")) { [18:41:54.406] muffled <- grepl(pattern, "muffleWarning") [18:41:54.406] if (muffled) [18:41:54.406] invokeRestart("muffleWarning") [18:41:54.406] } [18:41:54.406] else if (inherits(cond, "condition")) { [18:41:54.406] if (!is.null(pattern)) { [18:41:54.406] computeRestarts <- base::computeRestarts [18:41:54.406] grepl <- base::grepl [18:41:54.406] restarts <- computeRestarts(cond) [18:41:54.406] for (restart in restarts) { [18:41:54.406] name <- restart$name [18:41:54.406] if (is.null(name)) [18:41:54.406] next [18:41:54.406] if (!grepl(pattern, name)) [18:41:54.406] next [18:41:54.406] invokeRestart(restart) [18:41:54.406] muffled <- TRUE [18:41:54.406] break [18:41:54.406] } [18:41:54.406] } [18:41:54.406] } [18:41:54.406] invisible(muffled) [18:41:54.406] } [18:41:54.406] muffleCondition(cond, pattern = "^muffle") [18:41:54.406] } [18:41:54.406] } [18:41:54.406] } [18:41:54.406] })) [18:41:54.406] }, error = function(ex) { [18:41:54.406] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.406] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.406] ...future.rng), started = ...future.startTime, [18:41:54.406] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.406] version = "1.8"), class = "FutureResult") [18:41:54.406] }, finally = { [18:41:54.406] if (!identical(...future.workdir, getwd())) [18:41:54.406] setwd(...future.workdir) [18:41:54.406] { [18:41:54.406] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.406] ...future.oldOptions$nwarnings <- NULL [18:41:54.406] } [18:41:54.406] base::options(...future.oldOptions) [18:41:54.406] if (.Platform$OS.type == "windows") { [18:41:54.406] old_names <- names(...future.oldEnvVars) [18:41:54.406] envs <- base::Sys.getenv() [18:41:54.406] names <- names(envs) [18:41:54.406] common <- intersect(names, old_names) [18:41:54.406] added <- setdiff(names, old_names) [18:41:54.406] removed <- setdiff(old_names, names) [18:41:54.406] changed <- common[...future.oldEnvVars[common] != [18:41:54.406] envs[common]] [18:41:54.406] NAMES <- toupper(changed) [18:41:54.406] args <- list() [18:41:54.406] for (kk in seq_along(NAMES)) { [18:41:54.406] name <- changed[[kk]] [18:41:54.406] NAME <- NAMES[[kk]] [18:41:54.406] if (name != NAME && is.element(NAME, old_names)) [18:41:54.406] next [18:41:54.406] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.406] } [18:41:54.406] NAMES <- toupper(added) [18:41:54.406] for (kk in seq_along(NAMES)) { [18:41:54.406] name <- added[[kk]] [18:41:54.406] NAME <- NAMES[[kk]] [18:41:54.406] if (name != NAME && is.element(NAME, old_names)) [18:41:54.406] next [18:41:54.406] args[[name]] <- "" [18:41:54.406] } [18:41:54.406] NAMES <- toupper(removed) [18:41:54.406] for (kk in seq_along(NAMES)) { [18:41:54.406] name <- removed[[kk]] [18:41:54.406] NAME <- NAMES[[kk]] [18:41:54.406] if (name != NAME && is.element(NAME, old_names)) [18:41:54.406] next [18:41:54.406] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.406] } [18:41:54.406] if (length(args) > 0) [18:41:54.406] base::do.call(base::Sys.setenv, args = args) [18:41:54.406] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.406] } [18:41:54.406] { [18:41:54.406] if (base::length(...future.futureOptionsAdded) > [18:41:54.406] 0L) { [18:41:54.406] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.406] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.406] base::options(opts) [18:41:54.406] } [18:41:54.406] { [18:41:54.406] { [18:41:54.406] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.406] NULL [18:41:54.406] } [18:41:54.406] options(future.plan = NULL) [18:41:54.406] if (is.na(NA_character_)) [18:41:54.406] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.406] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.406] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.406] .init = FALSE) [18:41:54.406] } [18:41:54.406] } [18:41:54.406] } [18:41:54.406] }) [18:41:54.406] if (TRUE) { [18:41:54.406] base::sink(type = "output", split = FALSE) [18:41:54.406] if (TRUE) { [18:41:54.406] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.406] } [18:41:54.406] else { [18:41:54.406] ...future.result["stdout"] <- base::list(NULL) [18:41:54.406] } [18:41:54.406] base::close(...future.stdout) [18:41:54.406] ...future.stdout <- NULL [18:41:54.406] } [18:41:54.406] ...future.result$conditions <- ...future.conditions [18:41:54.406] ...future.result$finished <- base::Sys.time() [18:41:54.406] ...future.result [18:41:54.406] } [18:41:54.411] Exporting 5 global objects (940 bytes) to cluster node #1 ... [18:41:54.412] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:54.412] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:54.412] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.413] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.413] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:54.413] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:54.414] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.414] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.414] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.415] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.415] Exporting 5 global objects (940 bytes) to cluster node #1 ... DONE [18:41:54.415] MultisessionFuture started [18:41:54.416] - Launch lazy future ... done [18:41:54.416] run() for 'MultisessionFuture' ... done [18:41:54.416] Created future: [18:41:54.433] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.433] - Validating connection of MultisessionFuture [18:41:54.433] - received message: FutureResult [18:41:54.434] - Received FutureResult [18:41:54.434] - Erased future from FutureRegistry [18:41:54.434] result() for ClusterFuture ... [18:41:54.434] - result already collected: FutureResult [18:41:54.434] result() for ClusterFuture ... done [18:41:54.435] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.416] MultisessionFuture: [18:41:54.416] Label: 'future_sapply-1' [18:41:54.416] Expression: [18:41:54.416] { [18:41:54.416] do.call(function(...) { [18:41:54.416] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.416] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.416] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.416] on.exit(options(oopts), add = TRUE) [18:41:54.416] } [18:41:54.416] { [18:41:54.416] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.416] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.416] ...future.FUN(...future.X_jj, ...) [18:41:54.416] }) [18:41:54.416] } [18:41:54.416] }, args = future.call.arguments) [18:41:54.416] } [18:41:54.416] Lazy evaluation: FALSE [18:41:54.416] Asynchronous evaluation: TRUE [18:41:54.416] Local evaluation: TRUE [18:41:54.416] Environment: R_GlobalEnv [18:41:54.416] Capture standard output: TRUE [18:41:54.416] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.416] Globals: 5 objects totaling 477 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.416] Packages: [18:41:54.416] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.416] Resolved: TRUE [18:41:54.416] Value: [18:41:54.416] Conditions captured: [18:41:54.416] Early signaling: FALSE [18:41:54.416] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.416] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.435] Chunk #1 of 2 ... DONE [18:41:54.435] Chunk #2 of 2 ... [18:41:54.435] - Finding globals in 'X' for chunk #2 ... [18:41:54.436] getGlobalsAndPackages() ... [18:41:54.436] Searching for globals... [18:41:54.436] [18:41:54.436] Searching for globals ... DONE [18:41:54.436] - globals: [0] [18:41:54.437] getGlobalsAndPackages() ... DONE [18:41:54.437] + additional globals found: [n=0] [18:41:54.437] + additional namespaces needed: [n=0] [18:41:54.437] - Finding globals in 'X' for chunk #2 ... DONE [18:41:54.437] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.437] - seeds: [18:41:54.437] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.438] getGlobalsAndPackages() ... [18:41:54.438] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.438] Resolving globals: FALSE [18:41:54.438] Tweak future expression to call with '...' arguments ... [18:41:54.438] { [18:41:54.438] do.call(function(...) { [18:41:54.438] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.438] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.438] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.438] on.exit(options(oopts), add = TRUE) [18:41:54.438] } [18:41:54.438] { [18:41:54.438] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.438] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.438] ...future.FUN(...future.X_jj, ...) [18:41:54.438] }) [18:41:54.438] } [18:41:54.438] }, args = future.call.arguments) [18:41:54.438] } [18:41:54.439] Tweak future expression to call with '...' arguments ... DONE [18:41:54.439] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.439] [18:41:54.440] getGlobalsAndPackages() ... DONE [18:41:54.440] run() for 'Future' ... [18:41:54.440] - state: 'created' [18:41:54.440] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.456] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.456] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.456] - Field: 'node' [18:41:54.457] - Field: 'label' [18:41:54.457] - Field: 'local' [18:41:54.457] - Field: 'owner' [18:41:54.457] - Field: 'envir' [18:41:54.457] - Field: 'workers' [18:41:54.457] - Field: 'packages' [18:41:54.458] - Field: 'gc' [18:41:54.458] - Field: 'conditions' [18:41:54.458] - Field: 'persistent' [18:41:54.458] - Field: 'expr' [18:41:54.458] - Field: 'uuid' [18:41:54.459] - Field: 'seed' [18:41:54.459] - Field: 'version' [18:41:54.459] - Field: 'result' [18:41:54.459] - Field: 'asynchronous' [18:41:54.459] - Field: 'calls' [18:41:54.460] - Field: 'globals' [18:41:54.460] - Field: 'stdout' [18:41:54.460] - Field: 'earlySignal' [18:41:54.460] - Field: 'lazy' [18:41:54.460] - Field: 'state' [18:41:54.461] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.461] - Launch lazy future ... [18:41:54.461] Packages needed by the future expression (n = 0): [18:41:54.461] Packages needed by future strategies (n = 0): [18:41:54.462] { [18:41:54.462] { [18:41:54.462] { [18:41:54.462] ...future.startTime <- base::Sys.time() [18:41:54.462] { [18:41:54.462] { [18:41:54.462] { [18:41:54.462] { [18:41:54.462] base::local({ [18:41:54.462] has_future <- base::requireNamespace("future", [18:41:54.462] quietly = TRUE) [18:41:54.462] if (has_future) { [18:41:54.462] ns <- base::getNamespace("future") [18:41:54.462] version <- ns[[".package"]][["version"]] [18:41:54.462] if (is.null(version)) [18:41:54.462] version <- utils::packageVersion("future") [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] version <- NULL [18:41:54.462] } [18:41:54.462] if (!has_future || version < "1.8.0") { [18:41:54.462] info <- base::c(r_version = base::gsub("R version ", [18:41:54.462] "", base::R.version$version.string), [18:41:54.462] platform = base::sprintf("%s (%s-bit)", [18:41:54.462] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.462] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.462] "release", "version")], collapse = " "), [18:41:54.462] hostname = base::Sys.info()[["nodename"]]) [18:41:54.462] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.462] info) [18:41:54.462] info <- base::paste(info, collapse = "; ") [18:41:54.462] if (!has_future) { [18:41:54.462] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.462] info) [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.462] info, version) [18:41:54.462] } [18:41:54.462] base::stop(msg) [18:41:54.462] } [18:41:54.462] }) [18:41:54.462] } [18:41:54.462] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.462] base::options(mc.cores = 1L) [18:41:54.462] } [18:41:54.462] ...future.strategy.old <- future::plan("list") [18:41:54.462] options(future.plan = NULL) [18:41:54.462] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.462] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.462] } [18:41:54.462] ...future.workdir <- getwd() [18:41:54.462] } [18:41:54.462] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.462] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.462] } [18:41:54.462] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.462] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.462] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.462] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.462] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.462] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.462] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.462] base::names(...future.oldOptions)) [18:41:54.462] } [18:41:54.462] if (FALSE) { [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] if (TRUE) { [18:41:54.462] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.462] open = "w") [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.462] windows = "NUL", "/dev/null"), open = "w") [18:41:54.462] } [18:41:54.462] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.462] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.462] base::sink(type = "output", split = FALSE) [18:41:54.462] base::close(...future.stdout) [18:41:54.462] }, add = TRUE) [18:41:54.462] } [18:41:54.462] ...future.frame <- base::sys.nframe() [18:41:54.462] ...future.conditions <- base::list() [18:41:54.462] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.462] if (FALSE) { [18:41:54.462] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.462] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.462] } [18:41:54.462] ...future.result <- base::tryCatch({ [18:41:54.462] base::withCallingHandlers({ [18:41:54.462] ...future.value <- base::withVisible(base::local({ [18:41:54.462] ...future.makeSendCondition <- base::local({ [18:41:54.462] sendCondition <- NULL [18:41:54.462] function(frame = 1L) { [18:41:54.462] if (is.function(sendCondition)) [18:41:54.462] return(sendCondition) [18:41:54.462] ns <- getNamespace("parallel") [18:41:54.462] if (exists("sendData", mode = "function", [18:41:54.462] envir = ns)) { [18:41:54.462] parallel_sendData <- get("sendData", mode = "function", [18:41:54.462] envir = ns) [18:41:54.462] envir <- sys.frame(frame) [18:41:54.462] master <- NULL [18:41:54.462] while (!identical(envir, .GlobalEnv) && [18:41:54.462] !identical(envir, emptyenv())) { [18:41:54.462] if (exists("master", mode = "list", envir = envir, [18:41:54.462] inherits = FALSE)) { [18:41:54.462] master <- get("master", mode = "list", [18:41:54.462] envir = envir, inherits = FALSE) [18:41:54.462] if (inherits(master, c("SOCKnode", [18:41:54.462] "SOCK0node"))) { [18:41:54.462] sendCondition <<- function(cond) { [18:41:54.462] data <- list(type = "VALUE", value = cond, [18:41:54.462] success = TRUE) [18:41:54.462] parallel_sendData(master, data) [18:41:54.462] } [18:41:54.462] return(sendCondition) [18:41:54.462] } [18:41:54.462] } [18:41:54.462] frame <- frame + 1L [18:41:54.462] envir <- sys.frame(frame) [18:41:54.462] } [18:41:54.462] } [18:41:54.462] sendCondition <<- function(cond) NULL [18:41:54.462] } [18:41:54.462] }) [18:41:54.462] withCallingHandlers({ [18:41:54.462] { [18:41:54.462] do.call(function(...) { [18:41:54.462] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.462] if (!identical(...future.globals.maxSize.org, [18:41:54.462] ...future.globals.maxSize)) { [18:41:54.462] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.462] on.exit(options(oopts), add = TRUE) [18:41:54.462] } [18:41:54.462] { [18:41:54.462] lapply(seq_along(...future.elements_ii), [18:41:54.462] FUN = function(jj) { [18:41:54.462] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.462] ...future.FUN(...future.X_jj, ...) [18:41:54.462] }) [18:41:54.462] } [18:41:54.462] }, args = future.call.arguments) [18:41:54.462] } [18:41:54.462] }, immediateCondition = function(cond) { [18:41:54.462] sendCondition <- ...future.makeSendCondition() [18:41:54.462] sendCondition(cond) [18:41:54.462] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.462] { [18:41:54.462] inherits <- base::inherits [18:41:54.462] invokeRestart <- base::invokeRestart [18:41:54.462] is.null <- base::is.null [18:41:54.462] muffled <- FALSE [18:41:54.462] if (inherits(cond, "message")) { [18:41:54.462] muffled <- grepl(pattern, "muffleMessage") [18:41:54.462] if (muffled) [18:41:54.462] invokeRestart("muffleMessage") [18:41:54.462] } [18:41:54.462] else if (inherits(cond, "warning")) { [18:41:54.462] muffled <- grepl(pattern, "muffleWarning") [18:41:54.462] if (muffled) [18:41:54.462] invokeRestart("muffleWarning") [18:41:54.462] } [18:41:54.462] else if (inherits(cond, "condition")) { [18:41:54.462] if (!is.null(pattern)) { [18:41:54.462] computeRestarts <- base::computeRestarts [18:41:54.462] grepl <- base::grepl [18:41:54.462] restarts <- computeRestarts(cond) [18:41:54.462] for (restart in restarts) { [18:41:54.462] name <- restart$name [18:41:54.462] if (is.null(name)) [18:41:54.462] next [18:41:54.462] if (!grepl(pattern, name)) [18:41:54.462] next [18:41:54.462] invokeRestart(restart) [18:41:54.462] muffled <- TRUE [18:41:54.462] break [18:41:54.462] } [18:41:54.462] } [18:41:54.462] } [18:41:54.462] invisible(muffled) [18:41:54.462] } [18:41:54.462] muffleCondition(cond) [18:41:54.462] }) [18:41:54.462] })) [18:41:54.462] future::FutureResult(value = ...future.value$value, [18:41:54.462] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.462] ...future.rng), globalenv = if (FALSE) [18:41:54.462] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.462] ...future.globalenv.names)) [18:41:54.462] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.462] }, condition = base::local({ [18:41:54.462] c <- base::c [18:41:54.462] inherits <- base::inherits [18:41:54.462] invokeRestart <- base::invokeRestart [18:41:54.462] length <- base::length [18:41:54.462] list <- base::list [18:41:54.462] seq.int <- base::seq.int [18:41:54.462] signalCondition <- base::signalCondition [18:41:54.462] sys.calls <- base::sys.calls [18:41:54.462] `[[` <- base::`[[` [18:41:54.462] `+` <- base::`+` [18:41:54.462] `<<-` <- base::`<<-` [18:41:54.462] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.462] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.462] 3L)] [18:41:54.462] } [18:41:54.462] function(cond) { [18:41:54.462] is_error <- inherits(cond, "error") [18:41:54.462] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.462] NULL) [18:41:54.462] if (is_error) { [18:41:54.462] sessionInformation <- function() { [18:41:54.462] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.462] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.462] search = base::search(), system = base::Sys.info()) [18:41:54.462] } [18:41:54.462] ...future.conditions[[length(...future.conditions) + [18:41:54.462] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.462] cond$call), session = sessionInformation(), [18:41:54.462] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.462] signalCondition(cond) [18:41:54.462] } [18:41:54.462] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.462] "immediateCondition"))) { [18:41:54.462] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.462] ...future.conditions[[length(...future.conditions) + [18:41:54.462] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.462] if (TRUE && !signal) { [18:41:54.462] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.462] { [18:41:54.462] inherits <- base::inherits [18:41:54.462] invokeRestart <- base::invokeRestart [18:41:54.462] is.null <- base::is.null [18:41:54.462] muffled <- FALSE [18:41:54.462] if (inherits(cond, "message")) { [18:41:54.462] muffled <- grepl(pattern, "muffleMessage") [18:41:54.462] if (muffled) [18:41:54.462] invokeRestart("muffleMessage") [18:41:54.462] } [18:41:54.462] else if (inherits(cond, "warning")) { [18:41:54.462] muffled <- grepl(pattern, "muffleWarning") [18:41:54.462] if (muffled) [18:41:54.462] invokeRestart("muffleWarning") [18:41:54.462] } [18:41:54.462] else if (inherits(cond, "condition")) { [18:41:54.462] if (!is.null(pattern)) { [18:41:54.462] computeRestarts <- base::computeRestarts [18:41:54.462] grepl <- base::grepl [18:41:54.462] restarts <- computeRestarts(cond) [18:41:54.462] for (restart in restarts) { [18:41:54.462] name <- restart$name [18:41:54.462] if (is.null(name)) [18:41:54.462] next [18:41:54.462] if (!grepl(pattern, name)) [18:41:54.462] next [18:41:54.462] invokeRestart(restart) [18:41:54.462] muffled <- TRUE [18:41:54.462] break [18:41:54.462] } [18:41:54.462] } [18:41:54.462] } [18:41:54.462] invisible(muffled) [18:41:54.462] } [18:41:54.462] muffleCondition(cond, pattern = "^muffle") [18:41:54.462] } [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] if (TRUE) { [18:41:54.462] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.462] { [18:41:54.462] inherits <- base::inherits [18:41:54.462] invokeRestart <- base::invokeRestart [18:41:54.462] is.null <- base::is.null [18:41:54.462] muffled <- FALSE [18:41:54.462] if (inherits(cond, "message")) { [18:41:54.462] muffled <- grepl(pattern, "muffleMessage") [18:41:54.462] if (muffled) [18:41:54.462] invokeRestart("muffleMessage") [18:41:54.462] } [18:41:54.462] else if (inherits(cond, "warning")) { [18:41:54.462] muffled <- grepl(pattern, "muffleWarning") [18:41:54.462] if (muffled) [18:41:54.462] invokeRestart("muffleWarning") [18:41:54.462] } [18:41:54.462] else if (inherits(cond, "condition")) { [18:41:54.462] if (!is.null(pattern)) { [18:41:54.462] computeRestarts <- base::computeRestarts [18:41:54.462] grepl <- base::grepl [18:41:54.462] restarts <- computeRestarts(cond) [18:41:54.462] for (restart in restarts) { [18:41:54.462] name <- restart$name [18:41:54.462] if (is.null(name)) [18:41:54.462] next [18:41:54.462] if (!grepl(pattern, name)) [18:41:54.462] next [18:41:54.462] invokeRestart(restart) [18:41:54.462] muffled <- TRUE [18:41:54.462] break [18:41:54.462] } [18:41:54.462] } [18:41:54.462] } [18:41:54.462] invisible(muffled) [18:41:54.462] } [18:41:54.462] muffleCondition(cond, pattern = "^muffle") [18:41:54.462] } [18:41:54.462] } [18:41:54.462] } [18:41:54.462] })) [18:41:54.462] }, error = function(ex) { [18:41:54.462] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.462] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.462] ...future.rng), started = ...future.startTime, [18:41:54.462] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.462] version = "1.8"), class = "FutureResult") [18:41:54.462] }, finally = { [18:41:54.462] if (!identical(...future.workdir, getwd())) [18:41:54.462] setwd(...future.workdir) [18:41:54.462] { [18:41:54.462] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.462] ...future.oldOptions$nwarnings <- NULL [18:41:54.462] } [18:41:54.462] base::options(...future.oldOptions) [18:41:54.462] if (.Platform$OS.type == "windows") { [18:41:54.462] old_names <- names(...future.oldEnvVars) [18:41:54.462] envs <- base::Sys.getenv() [18:41:54.462] names <- names(envs) [18:41:54.462] common <- intersect(names, old_names) [18:41:54.462] added <- setdiff(names, old_names) [18:41:54.462] removed <- setdiff(old_names, names) [18:41:54.462] changed <- common[...future.oldEnvVars[common] != [18:41:54.462] envs[common]] [18:41:54.462] NAMES <- toupper(changed) [18:41:54.462] args <- list() [18:41:54.462] for (kk in seq_along(NAMES)) { [18:41:54.462] name <- changed[[kk]] [18:41:54.462] NAME <- NAMES[[kk]] [18:41:54.462] if (name != NAME && is.element(NAME, old_names)) [18:41:54.462] next [18:41:54.462] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.462] } [18:41:54.462] NAMES <- toupper(added) [18:41:54.462] for (kk in seq_along(NAMES)) { [18:41:54.462] name <- added[[kk]] [18:41:54.462] NAME <- NAMES[[kk]] [18:41:54.462] if (name != NAME && is.element(NAME, old_names)) [18:41:54.462] next [18:41:54.462] args[[name]] <- "" [18:41:54.462] } [18:41:54.462] NAMES <- toupper(removed) [18:41:54.462] for (kk in seq_along(NAMES)) { [18:41:54.462] name <- removed[[kk]] [18:41:54.462] NAME <- NAMES[[kk]] [18:41:54.462] if (name != NAME && is.element(NAME, old_names)) [18:41:54.462] next [18:41:54.462] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.462] } [18:41:54.462] if (length(args) > 0) [18:41:54.462] base::do.call(base::Sys.setenv, args = args) [18:41:54.462] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.462] } [18:41:54.462] { [18:41:54.462] if (base::length(...future.futureOptionsAdded) > [18:41:54.462] 0L) { [18:41:54.462] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.462] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.462] base::options(opts) [18:41:54.462] } [18:41:54.462] { [18:41:54.462] { [18:41:54.462] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.462] NULL [18:41:54.462] } [18:41:54.462] options(future.plan = NULL) [18:41:54.462] if (is.na(NA_character_)) [18:41:54.462] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.462] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.462] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.462] .init = FALSE) [18:41:54.462] } [18:41:54.462] } [18:41:54.462] } [18:41:54.462] }) [18:41:54.462] if (TRUE) { [18:41:54.462] base::sink(type = "output", split = FALSE) [18:41:54.462] if (TRUE) { [18:41:54.462] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.462] } [18:41:54.462] else { [18:41:54.462] ...future.result["stdout"] <- base::list(NULL) [18:41:54.462] } [18:41:54.462] base::close(...future.stdout) [18:41:54.462] ...future.stdout <- NULL [18:41:54.462] } [18:41:54.462] ...future.result$conditions <- ...future.conditions [18:41:54.462] ...future.result$finished <- base::Sys.time() [18:41:54.462] ...future.result [18:41:54.462] } [18:41:54.467] Exporting 5 global objects (957 bytes) to cluster node #1 ... [18:41:54.467] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:54.468] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:54.468] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.468] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.469] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:54.469] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:54.469] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.470] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.470] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.470] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.470] Exporting 5 global objects (957 bytes) to cluster node #1 ... DONE [18:41:54.471] MultisessionFuture started [18:41:54.471] - Launch lazy future ... done [18:41:54.471] run() for 'MultisessionFuture' ... done [18:41:54.472] Created future: [18:41:54.488] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.488] - Validating connection of MultisessionFuture [18:41:54.488] - received message: FutureResult [18:41:54.489] - Received FutureResult [18:41:54.489] - Erased future from FutureRegistry [18:41:54.489] result() for ClusterFuture ... [18:41:54.489] - result already collected: FutureResult [18:41:54.489] result() for ClusterFuture ... done [18:41:54.490] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.472] MultisessionFuture: [18:41:54.472] Label: 'future_sapply-2' [18:41:54.472] Expression: [18:41:54.472] { [18:41:54.472] do.call(function(...) { [18:41:54.472] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.472] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.472] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.472] on.exit(options(oopts), add = TRUE) [18:41:54.472] } [18:41:54.472] { [18:41:54.472] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.472] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.472] ...future.FUN(...future.X_jj, ...) [18:41:54.472] }) [18:41:54.472] } [18:41:54.472] }, args = future.call.arguments) [18:41:54.472] } [18:41:54.472] Lazy evaluation: FALSE [18:41:54.472] Asynchronous evaluation: TRUE [18:41:54.472] Local evaluation: TRUE [18:41:54.472] Environment: R_GlobalEnv [18:41:54.472] Capture standard output: TRUE [18:41:54.472] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.472] Globals: 5 objects totaling 494 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.472] Packages: [18:41:54.472] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.472] Resolved: TRUE [18:41:54.472] Value: [18:41:54.472] Conditions captured: [18:41:54.472] Early signaling: FALSE [18:41:54.472] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.472] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.490] Chunk #2 of 2 ... DONE [18:41:54.490] Launching 2 futures (chunks) ... DONE [18:41:54.491] Resolving 2 futures (chunks) ... [18:41:54.491] resolve() on list ... [18:41:54.491] recursive: 0 [18:41:54.491] length: 2 [18:41:54.491] [18:41:54.492] Future #1 [18:41:54.492] result() for ClusterFuture ... [18:41:54.492] - result already collected: FutureResult [18:41:54.492] result() for ClusterFuture ... done [18:41:54.492] result() for ClusterFuture ... [18:41:54.492] - result already collected: FutureResult [18:41:54.492] result() for ClusterFuture ... done [18:41:54.493] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.493] - nx: 2 [18:41:54.493] - relay: TRUE [18:41:54.493] - stdout: TRUE [18:41:54.493] - signal: TRUE [18:41:54.493] - resignal: FALSE [18:41:54.494] - force: TRUE [18:41:54.494] - relayed: [n=2] FALSE, FALSE [18:41:54.494] - queued futures: [n=2] FALSE, FALSE [18:41:54.494] - until=1 [18:41:54.494] - relaying element #1 [18:41:54.494] result() for ClusterFuture ... [18:41:54.494] - result already collected: FutureResult [18:41:54.495] result() for ClusterFuture ... done [18:41:54.495] result() for ClusterFuture ... [18:41:54.495] - result already collected: FutureResult [18:41:54.495] result() for ClusterFuture ... done [18:41:54.495] result() for ClusterFuture ... [18:41:54.495] - result already collected: FutureResult [18:41:54.496] result() for ClusterFuture ... done [18:41:54.496] result() for ClusterFuture ... [18:41:54.496] - result already collected: FutureResult [18:41:54.496] result() for ClusterFuture ... done [18:41:54.496] - relayed: [n=2] TRUE, FALSE [18:41:54.496] - queued futures: [n=2] TRUE, FALSE [18:41:54.497] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.497] length: 1 (resolved future 1) [18:41:54.497] Future #2 [18:41:54.497] result() for ClusterFuture ... [18:41:54.497] - result already collected: FutureResult [18:41:54.497] result() for ClusterFuture ... done [18:41:54.498] result() for ClusterFuture ... [18:41:54.498] - result already collected: FutureResult [18:41:54.498] result() for ClusterFuture ... done [18:41:54.498] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.498] - nx: 2 [18:41:54.498] - relay: TRUE [18:41:54.498] - stdout: TRUE [18:41:54.499] - signal: TRUE [18:41:54.499] - resignal: FALSE [18:41:54.499] - force: TRUE [18:41:54.499] - relayed: [n=2] TRUE, FALSE [18:41:54.499] - queued futures: [n=2] TRUE, FALSE [18:41:54.499] - until=2 [18:41:54.500] - relaying element #2 [18:41:54.500] result() for ClusterFuture ... [18:41:54.500] - result already collected: FutureResult [18:41:54.500] result() for ClusterFuture ... done [18:41:54.500] result() for ClusterFuture ... [18:41:54.500] - result already collected: FutureResult [18:41:54.500] result() for ClusterFuture ... done [18:41:54.501] result() for ClusterFuture ... [18:41:54.501] - result already collected: FutureResult [18:41:54.501] result() for ClusterFuture ... done [18:41:54.501] result() for ClusterFuture ... [18:41:54.501] - result already collected: FutureResult [18:41:54.501] result() for ClusterFuture ... done [18:41:54.502] - relayed: [n=2] TRUE, TRUE [18:41:54.502] - queued futures: [n=2] TRUE, TRUE [18:41:54.502] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.502] length: 0 (resolved future 2) [18:41:54.502] Relaying remaining futures [18:41:54.502] signalConditionsASAP(NULL, pos=0) ... [18:41:54.503] - nx: 2 [18:41:54.503] - relay: TRUE [18:41:54.503] - stdout: TRUE [18:41:54.503] - signal: TRUE [18:41:54.503] - resignal: FALSE [18:41:54.503] - force: TRUE [18:41:54.503] - relayed: [n=2] TRUE, TRUE [18:41:54.504] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.504] - relayed: [n=2] TRUE, TRUE [18:41:54.504] - queued futures: [n=2] TRUE, TRUE [18:41:54.504] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.504] resolve() on list ... DONE [18:41:54.504] result() for ClusterFuture ... [18:41:54.505] - result already collected: FutureResult [18:41:54.505] result() for ClusterFuture ... done [18:41:54.505] result() for ClusterFuture ... [18:41:54.505] - result already collected: FutureResult [18:41:54.505] result() for ClusterFuture ... done [18:41:54.505] result() for ClusterFuture ... [18:41:54.506] - result already collected: FutureResult [18:41:54.506] result() for ClusterFuture ... done [18:41:54.506] result() for ClusterFuture ... [18:41:54.506] - result already collected: FutureResult [18:41:54.506] result() for ClusterFuture ... done [18:41:54.506] - Number of value chunks collected: 2 [18:41:54.507] Resolving 2 futures (chunks) ... DONE [18:41:54.507] Reducing values from 2 chunks ... [18:41:54.507] - Number of values collected after concatenation: 3 [18:41:54.507] - Number of values expected: 3 [18:41:54.507] Reducing values from 2 chunks ... DONE [18:41:54.507] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:54.509] future_lapply() ... [18:41:54.512] Number of chunks: 2 [18:41:54.512] getGlobalsAndPackagesXApply() ... [18:41:54.512] - future.globals: TRUE [18:41:54.512] getGlobalsAndPackages() ... [18:41:54.513] Searching for globals... [18:41:54.514] - globals found: [1] 'FUN' [18:41:54.514] Searching for globals ... DONE [18:41:54.514] Resolving globals: FALSE [18:41:54.515] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:54.515] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:54.515] - globals: [1] 'FUN' [18:41:54.515] [18:41:54.516] getGlobalsAndPackages() ... DONE [18:41:54.516] - globals found/used: [n=1] 'FUN' [18:41:54.516] - needed namespaces: [n=0] [18:41:54.516] Finding globals ... DONE [18:41:54.516] - use_args: TRUE [18:41:54.516] - Getting '...' globals ... [18:41:54.517] resolve() on list ... [18:41:54.517] recursive: 0 [18:41:54.517] length: 1 [18:41:54.517] elements: '...' [18:41:54.517] length: 0 (resolved future 1) [18:41:54.518] resolve() on list ... DONE [18:41:54.518] - '...' content: [n=0] [18:41:54.518] List of 1 [18:41:54.518] $ ...: list() [18:41:54.518] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.518] - attr(*, "where")=List of 1 [18:41:54.518] ..$ ...: [18:41:54.518] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.518] - attr(*, "resolved")= logi TRUE [18:41:54.518] - attr(*, "total_size")= num NA [18:41:54.521] - Getting '...' globals ... DONE [18:41:54.521] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.521] List of 2 [18:41:54.521] $ ...future.FUN:function (x) [18:41:54.521] $ ... : list() [18:41:54.521] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.521] - attr(*, "where")=List of 2 [18:41:54.521] ..$ ...future.FUN: [18:41:54.521] ..$ ... : [18:41:54.521] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.521] - attr(*, "resolved")= logi FALSE [18:41:54.521] - attr(*, "total_size")= int 4788 [18:41:54.525] Packages to be attached in all futures: [n=0] [18:41:54.525] getGlobalsAndPackagesXApply() ... DONE [18:41:54.525] Number of futures (= number of chunks): 2 [18:41:54.525] Launching 2 futures (chunks) ... [18:41:54.525] Chunk #1 of 2 ... [18:41:54.526] - Finding globals in 'X' for chunk #1 ... [18:41:54.526] getGlobalsAndPackages() ... [18:41:54.526] Searching for globals... [18:41:54.526] [18:41:54.526] Searching for globals ... DONE [18:41:54.527] - globals: [0] [18:41:54.527] getGlobalsAndPackages() ... DONE [18:41:54.527] + additional globals found: [n=0] [18:41:54.527] + additional namespaces needed: [n=0] [18:41:54.527] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.527] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.528] - seeds: [18:41:54.528] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.528] getGlobalsAndPackages() ... [18:41:54.528] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.528] Resolving globals: FALSE [18:41:54.528] Tweak future expression to call with '...' arguments ... [18:41:54.529] { [18:41:54.529] do.call(function(...) { [18:41:54.529] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.529] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.529] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.529] on.exit(options(oopts), add = TRUE) [18:41:54.529] } [18:41:54.529] { [18:41:54.529] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.529] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.529] ...future.FUN(...future.X_jj, ...) [18:41:54.529] }) [18:41:54.529] } [18:41:54.529] }, args = future.call.arguments) [18:41:54.529] } [18:41:54.529] Tweak future expression to call with '...' arguments ... DONE [18:41:54.530] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.530] [18:41:54.530] getGlobalsAndPackages() ... DONE [18:41:54.530] run() for 'Future' ... [18:41:54.530] - state: 'created' [18:41:54.531] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.546] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.546] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.546] - Field: 'node' [18:41:54.547] - Field: 'label' [18:41:54.547] - Field: 'local' [18:41:54.547] - Field: 'owner' [18:41:54.547] - Field: 'envir' [18:41:54.547] - Field: 'workers' [18:41:54.548] - Field: 'packages' [18:41:54.548] - Field: 'gc' [18:41:54.548] - Field: 'conditions' [18:41:54.548] - Field: 'persistent' [18:41:54.548] - Field: 'expr' [18:41:54.548] - Field: 'uuid' [18:41:54.549] - Field: 'seed' [18:41:54.549] - Field: 'version' [18:41:54.549] - Field: 'result' [18:41:54.549] - Field: 'asynchronous' [18:41:54.549] - Field: 'calls' [18:41:54.549] - Field: 'globals' [18:41:54.550] - Field: 'stdout' [18:41:54.550] - Field: 'earlySignal' [18:41:54.550] - Field: 'lazy' [18:41:54.550] - Field: 'state' [18:41:54.550] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.550] - Launch lazy future ... [18:41:54.551] Packages needed by the future expression (n = 0): [18:41:54.551] Packages needed by future strategies (n = 0): [18:41:54.552] { [18:41:54.552] { [18:41:54.552] { [18:41:54.552] ...future.startTime <- base::Sys.time() [18:41:54.552] { [18:41:54.552] { [18:41:54.552] { [18:41:54.552] { [18:41:54.552] base::local({ [18:41:54.552] has_future <- base::requireNamespace("future", [18:41:54.552] quietly = TRUE) [18:41:54.552] if (has_future) { [18:41:54.552] ns <- base::getNamespace("future") [18:41:54.552] version <- ns[[".package"]][["version"]] [18:41:54.552] if (is.null(version)) [18:41:54.552] version <- utils::packageVersion("future") [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] version <- NULL [18:41:54.552] } [18:41:54.552] if (!has_future || version < "1.8.0") { [18:41:54.552] info <- base::c(r_version = base::gsub("R version ", [18:41:54.552] "", base::R.version$version.string), [18:41:54.552] platform = base::sprintf("%s (%s-bit)", [18:41:54.552] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.552] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.552] "release", "version")], collapse = " "), [18:41:54.552] hostname = base::Sys.info()[["nodename"]]) [18:41:54.552] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.552] info) [18:41:54.552] info <- base::paste(info, collapse = "; ") [18:41:54.552] if (!has_future) { [18:41:54.552] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.552] info) [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.552] info, version) [18:41:54.552] } [18:41:54.552] base::stop(msg) [18:41:54.552] } [18:41:54.552] }) [18:41:54.552] } [18:41:54.552] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.552] base::options(mc.cores = 1L) [18:41:54.552] } [18:41:54.552] ...future.strategy.old <- future::plan("list") [18:41:54.552] options(future.plan = NULL) [18:41:54.552] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.552] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.552] } [18:41:54.552] ...future.workdir <- getwd() [18:41:54.552] } [18:41:54.552] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.552] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.552] } [18:41:54.552] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.552] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.552] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.552] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.552] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.552] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.552] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.552] base::names(...future.oldOptions)) [18:41:54.552] } [18:41:54.552] if (FALSE) { [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] if (TRUE) { [18:41:54.552] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.552] open = "w") [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.552] windows = "NUL", "/dev/null"), open = "w") [18:41:54.552] } [18:41:54.552] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.552] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.552] base::sink(type = "output", split = FALSE) [18:41:54.552] base::close(...future.stdout) [18:41:54.552] }, add = TRUE) [18:41:54.552] } [18:41:54.552] ...future.frame <- base::sys.nframe() [18:41:54.552] ...future.conditions <- base::list() [18:41:54.552] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.552] if (FALSE) { [18:41:54.552] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.552] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.552] } [18:41:54.552] ...future.result <- base::tryCatch({ [18:41:54.552] base::withCallingHandlers({ [18:41:54.552] ...future.value <- base::withVisible(base::local({ [18:41:54.552] ...future.makeSendCondition <- base::local({ [18:41:54.552] sendCondition <- NULL [18:41:54.552] function(frame = 1L) { [18:41:54.552] if (is.function(sendCondition)) [18:41:54.552] return(sendCondition) [18:41:54.552] ns <- getNamespace("parallel") [18:41:54.552] if (exists("sendData", mode = "function", [18:41:54.552] envir = ns)) { [18:41:54.552] parallel_sendData <- get("sendData", mode = "function", [18:41:54.552] envir = ns) [18:41:54.552] envir <- sys.frame(frame) [18:41:54.552] master <- NULL [18:41:54.552] while (!identical(envir, .GlobalEnv) && [18:41:54.552] !identical(envir, emptyenv())) { [18:41:54.552] if (exists("master", mode = "list", envir = envir, [18:41:54.552] inherits = FALSE)) { [18:41:54.552] master <- get("master", mode = "list", [18:41:54.552] envir = envir, inherits = FALSE) [18:41:54.552] if (inherits(master, c("SOCKnode", [18:41:54.552] "SOCK0node"))) { [18:41:54.552] sendCondition <<- function(cond) { [18:41:54.552] data <- list(type = "VALUE", value = cond, [18:41:54.552] success = TRUE) [18:41:54.552] parallel_sendData(master, data) [18:41:54.552] } [18:41:54.552] return(sendCondition) [18:41:54.552] } [18:41:54.552] } [18:41:54.552] frame <- frame + 1L [18:41:54.552] envir <- sys.frame(frame) [18:41:54.552] } [18:41:54.552] } [18:41:54.552] sendCondition <<- function(cond) NULL [18:41:54.552] } [18:41:54.552] }) [18:41:54.552] withCallingHandlers({ [18:41:54.552] { [18:41:54.552] do.call(function(...) { [18:41:54.552] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.552] if (!identical(...future.globals.maxSize.org, [18:41:54.552] ...future.globals.maxSize)) { [18:41:54.552] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.552] on.exit(options(oopts), add = TRUE) [18:41:54.552] } [18:41:54.552] { [18:41:54.552] lapply(seq_along(...future.elements_ii), [18:41:54.552] FUN = function(jj) { [18:41:54.552] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.552] ...future.FUN(...future.X_jj, ...) [18:41:54.552] }) [18:41:54.552] } [18:41:54.552] }, args = future.call.arguments) [18:41:54.552] } [18:41:54.552] }, immediateCondition = function(cond) { [18:41:54.552] sendCondition <- ...future.makeSendCondition() [18:41:54.552] sendCondition(cond) [18:41:54.552] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.552] { [18:41:54.552] inherits <- base::inherits [18:41:54.552] invokeRestart <- base::invokeRestart [18:41:54.552] is.null <- base::is.null [18:41:54.552] muffled <- FALSE [18:41:54.552] if (inherits(cond, "message")) { [18:41:54.552] muffled <- grepl(pattern, "muffleMessage") [18:41:54.552] if (muffled) [18:41:54.552] invokeRestart("muffleMessage") [18:41:54.552] } [18:41:54.552] else if (inherits(cond, "warning")) { [18:41:54.552] muffled <- grepl(pattern, "muffleWarning") [18:41:54.552] if (muffled) [18:41:54.552] invokeRestart("muffleWarning") [18:41:54.552] } [18:41:54.552] else if (inherits(cond, "condition")) { [18:41:54.552] if (!is.null(pattern)) { [18:41:54.552] computeRestarts <- base::computeRestarts [18:41:54.552] grepl <- base::grepl [18:41:54.552] restarts <- computeRestarts(cond) [18:41:54.552] for (restart in restarts) { [18:41:54.552] name <- restart$name [18:41:54.552] if (is.null(name)) [18:41:54.552] next [18:41:54.552] if (!grepl(pattern, name)) [18:41:54.552] next [18:41:54.552] invokeRestart(restart) [18:41:54.552] muffled <- TRUE [18:41:54.552] break [18:41:54.552] } [18:41:54.552] } [18:41:54.552] } [18:41:54.552] invisible(muffled) [18:41:54.552] } [18:41:54.552] muffleCondition(cond) [18:41:54.552] }) [18:41:54.552] })) [18:41:54.552] future::FutureResult(value = ...future.value$value, [18:41:54.552] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.552] ...future.rng), globalenv = if (FALSE) [18:41:54.552] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.552] ...future.globalenv.names)) [18:41:54.552] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.552] }, condition = base::local({ [18:41:54.552] c <- base::c [18:41:54.552] inherits <- base::inherits [18:41:54.552] invokeRestart <- base::invokeRestart [18:41:54.552] length <- base::length [18:41:54.552] list <- base::list [18:41:54.552] seq.int <- base::seq.int [18:41:54.552] signalCondition <- base::signalCondition [18:41:54.552] sys.calls <- base::sys.calls [18:41:54.552] `[[` <- base::`[[` [18:41:54.552] `+` <- base::`+` [18:41:54.552] `<<-` <- base::`<<-` [18:41:54.552] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.552] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.552] 3L)] [18:41:54.552] } [18:41:54.552] function(cond) { [18:41:54.552] is_error <- inherits(cond, "error") [18:41:54.552] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.552] NULL) [18:41:54.552] if (is_error) { [18:41:54.552] sessionInformation <- function() { [18:41:54.552] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.552] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.552] search = base::search(), system = base::Sys.info()) [18:41:54.552] } [18:41:54.552] ...future.conditions[[length(...future.conditions) + [18:41:54.552] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.552] cond$call), session = sessionInformation(), [18:41:54.552] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.552] signalCondition(cond) [18:41:54.552] } [18:41:54.552] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.552] "immediateCondition"))) { [18:41:54.552] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.552] ...future.conditions[[length(...future.conditions) + [18:41:54.552] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.552] if (TRUE && !signal) { [18:41:54.552] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.552] { [18:41:54.552] inherits <- base::inherits [18:41:54.552] invokeRestart <- base::invokeRestart [18:41:54.552] is.null <- base::is.null [18:41:54.552] muffled <- FALSE [18:41:54.552] if (inherits(cond, "message")) { [18:41:54.552] muffled <- grepl(pattern, "muffleMessage") [18:41:54.552] if (muffled) [18:41:54.552] invokeRestart("muffleMessage") [18:41:54.552] } [18:41:54.552] else if (inherits(cond, "warning")) { [18:41:54.552] muffled <- grepl(pattern, "muffleWarning") [18:41:54.552] if (muffled) [18:41:54.552] invokeRestart("muffleWarning") [18:41:54.552] } [18:41:54.552] else if (inherits(cond, "condition")) { [18:41:54.552] if (!is.null(pattern)) { [18:41:54.552] computeRestarts <- base::computeRestarts [18:41:54.552] grepl <- base::grepl [18:41:54.552] restarts <- computeRestarts(cond) [18:41:54.552] for (restart in restarts) { [18:41:54.552] name <- restart$name [18:41:54.552] if (is.null(name)) [18:41:54.552] next [18:41:54.552] if (!grepl(pattern, name)) [18:41:54.552] next [18:41:54.552] invokeRestart(restart) [18:41:54.552] muffled <- TRUE [18:41:54.552] break [18:41:54.552] } [18:41:54.552] } [18:41:54.552] } [18:41:54.552] invisible(muffled) [18:41:54.552] } [18:41:54.552] muffleCondition(cond, pattern = "^muffle") [18:41:54.552] } [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] if (TRUE) { [18:41:54.552] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.552] { [18:41:54.552] inherits <- base::inherits [18:41:54.552] invokeRestart <- base::invokeRestart [18:41:54.552] is.null <- base::is.null [18:41:54.552] muffled <- FALSE [18:41:54.552] if (inherits(cond, "message")) { [18:41:54.552] muffled <- grepl(pattern, "muffleMessage") [18:41:54.552] if (muffled) [18:41:54.552] invokeRestart("muffleMessage") [18:41:54.552] } [18:41:54.552] else if (inherits(cond, "warning")) { [18:41:54.552] muffled <- grepl(pattern, "muffleWarning") [18:41:54.552] if (muffled) [18:41:54.552] invokeRestart("muffleWarning") [18:41:54.552] } [18:41:54.552] else if (inherits(cond, "condition")) { [18:41:54.552] if (!is.null(pattern)) { [18:41:54.552] computeRestarts <- base::computeRestarts [18:41:54.552] grepl <- base::grepl [18:41:54.552] restarts <- computeRestarts(cond) [18:41:54.552] for (restart in restarts) { [18:41:54.552] name <- restart$name [18:41:54.552] if (is.null(name)) [18:41:54.552] next [18:41:54.552] if (!grepl(pattern, name)) [18:41:54.552] next [18:41:54.552] invokeRestart(restart) [18:41:54.552] muffled <- TRUE [18:41:54.552] break [18:41:54.552] } [18:41:54.552] } [18:41:54.552] } [18:41:54.552] invisible(muffled) [18:41:54.552] } [18:41:54.552] muffleCondition(cond, pattern = "^muffle") [18:41:54.552] } [18:41:54.552] } [18:41:54.552] } [18:41:54.552] })) [18:41:54.552] }, error = function(ex) { [18:41:54.552] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.552] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.552] ...future.rng), started = ...future.startTime, [18:41:54.552] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.552] version = "1.8"), class = "FutureResult") [18:41:54.552] }, finally = { [18:41:54.552] if (!identical(...future.workdir, getwd())) [18:41:54.552] setwd(...future.workdir) [18:41:54.552] { [18:41:54.552] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.552] ...future.oldOptions$nwarnings <- NULL [18:41:54.552] } [18:41:54.552] base::options(...future.oldOptions) [18:41:54.552] if (.Platform$OS.type == "windows") { [18:41:54.552] old_names <- names(...future.oldEnvVars) [18:41:54.552] envs <- base::Sys.getenv() [18:41:54.552] names <- names(envs) [18:41:54.552] common <- intersect(names, old_names) [18:41:54.552] added <- setdiff(names, old_names) [18:41:54.552] removed <- setdiff(old_names, names) [18:41:54.552] changed <- common[...future.oldEnvVars[common] != [18:41:54.552] envs[common]] [18:41:54.552] NAMES <- toupper(changed) [18:41:54.552] args <- list() [18:41:54.552] for (kk in seq_along(NAMES)) { [18:41:54.552] name <- changed[[kk]] [18:41:54.552] NAME <- NAMES[[kk]] [18:41:54.552] if (name != NAME && is.element(NAME, old_names)) [18:41:54.552] next [18:41:54.552] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.552] } [18:41:54.552] NAMES <- toupper(added) [18:41:54.552] for (kk in seq_along(NAMES)) { [18:41:54.552] name <- added[[kk]] [18:41:54.552] NAME <- NAMES[[kk]] [18:41:54.552] if (name != NAME && is.element(NAME, old_names)) [18:41:54.552] next [18:41:54.552] args[[name]] <- "" [18:41:54.552] } [18:41:54.552] NAMES <- toupper(removed) [18:41:54.552] for (kk in seq_along(NAMES)) { [18:41:54.552] name <- removed[[kk]] [18:41:54.552] NAME <- NAMES[[kk]] [18:41:54.552] if (name != NAME && is.element(NAME, old_names)) [18:41:54.552] next [18:41:54.552] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.552] } [18:41:54.552] if (length(args) > 0) [18:41:54.552] base::do.call(base::Sys.setenv, args = args) [18:41:54.552] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.552] } [18:41:54.552] { [18:41:54.552] if (base::length(...future.futureOptionsAdded) > [18:41:54.552] 0L) { [18:41:54.552] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.552] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.552] base::options(opts) [18:41:54.552] } [18:41:54.552] { [18:41:54.552] { [18:41:54.552] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.552] NULL [18:41:54.552] } [18:41:54.552] options(future.plan = NULL) [18:41:54.552] if (is.na(NA_character_)) [18:41:54.552] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.552] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.552] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.552] .init = FALSE) [18:41:54.552] } [18:41:54.552] } [18:41:54.552] } [18:41:54.552] }) [18:41:54.552] if (TRUE) { [18:41:54.552] base::sink(type = "output", split = FALSE) [18:41:54.552] if (TRUE) { [18:41:54.552] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.552] } [18:41:54.552] else { [18:41:54.552] ...future.result["stdout"] <- base::list(NULL) [18:41:54.552] } [18:41:54.552] base::close(...future.stdout) [18:41:54.552] ...future.stdout <- NULL [18:41:54.552] } [18:41:54.552] ...future.result$conditions <- ...future.conditions [18:41:54.552] ...future.result$finished <- base::Sys.time() [18:41:54.552] ...future.result [18:41:54.552] } [18:41:54.557] Exporting 5 global objects (847 bytes) to cluster node #1 ... [18:41:54.557] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.557] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.558] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.558] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.558] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:54.559] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:54.559] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.559] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.559] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.560] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.560] Exporting 5 global objects (847 bytes) to cluster node #1 ... DONE [18:41:54.561] MultisessionFuture started [18:41:54.561] - Launch lazy future ... done [18:41:54.561] run() for 'MultisessionFuture' ... done [18:41:54.561] Created future: [18:41:54.576] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.576] - Validating connection of MultisessionFuture [18:41:54.576] - received message: FutureResult [18:41:54.577] - Received FutureResult [18:41:54.577] - Erased future from FutureRegistry [18:41:54.577] result() for ClusterFuture ... [18:41:54.577] - result already collected: FutureResult [18:41:54.577] result() for ClusterFuture ... done [18:41:54.577] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.561] MultisessionFuture: [18:41:54.561] Label: 'future_sapply-1' [18:41:54.561] Expression: [18:41:54.561] { [18:41:54.561] do.call(function(...) { [18:41:54.561] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.561] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.561] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.561] on.exit(options(oopts), add = TRUE) [18:41:54.561] } [18:41:54.561] { [18:41:54.561] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.561] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.561] ...future.FUN(...future.X_jj, ...) [18:41:54.561] }) [18:41:54.561] } [18:41:54.561] }, args = future.call.arguments) [18:41:54.561] } [18:41:54.561] Lazy evaluation: FALSE [18:41:54.561] Asynchronous evaluation: TRUE [18:41:54.561] Local evaluation: TRUE [18:41:54.561] Environment: R_GlobalEnv [18:41:54.561] Capture standard output: TRUE [18:41:54.561] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.561] Globals: 5 objects totaling 384 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.561] Packages: [18:41:54.561] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.561] Resolved: TRUE [18:41:54.561] Value: [18:41:54.561] Conditions captured: [18:41:54.561] Early signaling: FALSE [18:41:54.561] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.561] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.578] Chunk #1 of 2 ... DONE [18:41:54.578] Chunk #2 of 2 ... [18:41:54.578] - Finding globals in 'X' for chunk #2 ... [18:41:54.578] getGlobalsAndPackages() ... [18:41:54.579] Searching for globals... [18:41:54.579] [18:41:54.579] Searching for globals ... DONE [18:41:54.579] - globals: [0] [18:41:54.579] getGlobalsAndPackages() ... DONE [18:41:54.580] + additional globals found: [n=0] [18:41:54.580] + additional namespaces needed: [n=0] [18:41:54.580] - Finding globals in 'X' for chunk #2 ... DONE [18:41:54.580] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.580] - seeds: [18:41:54.580] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.581] getGlobalsAndPackages() ... [18:41:54.581] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.581] Resolving globals: FALSE [18:41:54.581] Tweak future expression to call with '...' arguments ... [18:41:54.581] { [18:41:54.581] do.call(function(...) { [18:41:54.581] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.581] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.581] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.581] on.exit(options(oopts), add = TRUE) [18:41:54.581] } [18:41:54.581] { [18:41:54.581] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.581] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.581] ...future.FUN(...future.X_jj, ...) [18:41:54.581] }) [18:41:54.581] } [18:41:54.581] }, args = future.call.arguments) [18:41:54.581] } [18:41:54.582] Tweak future expression to call with '...' arguments ... DONE [18:41:54.582] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.582] [18:41:54.583] getGlobalsAndPackages() ... DONE [18:41:54.583] run() for 'Future' ... [18:41:54.583] - state: 'created' [18:41:54.583] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.604] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.604] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.605] - Field: 'node' [18:41:54.605] - Field: 'label' [18:41:54.605] - Field: 'local' [18:41:54.605] - Field: 'owner' [18:41:54.605] - Field: 'envir' [18:41:54.605] - Field: 'workers' [18:41:54.606] - Field: 'packages' [18:41:54.606] - Field: 'gc' [18:41:54.606] - Field: 'conditions' [18:41:54.606] - Field: 'persistent' [18:41:54.606] - Field: 'expr' [18:41:54.607] - Field: 'uuid' [18:41:54.607] - Field: 'seed' [18:41:54.607] - Field: 'version' [18:41:54.607] - Field: 'result' [18:41:54.607] - Field: 'asynchronous' [18:41:54.607] - Field: 'calls' [18:41:54.608] - Field: 'globals' [18:41:54.608] - Field: 'stdout' [18:41:54.608] - Field: 'earlySignal' [18:41:54.608] - Field: 'lazy' [18:41:54.608] - Field: 'state' [18:41:54.608] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.609] - Launch lazy future ... [18:41:54.609] Packages needed by the future expression (n = 0): [18:41:54.609] Packages needed by future strategies (n = 0): [18:41:54.610] { [18:41:54.610] { [18:41:54.610] { [18:41:54.610] ...future.startTime <- base::Sys.time() [18:41:54.610] { [18:41:54.610] { [18:41:54.610] { [18:41:54.610] { [18:41:54.610] base::local({ [18:41:54.610] has_future <- base::requireNamespace("future", [18:41:54.610] quietly = TRUE) [18:41:54.610] if (has_future) { [18:41:54.610] ns <- base::getNamespace("future") [18:41:54.610] version <- ns[[".package"]][["version"]] [18:41:54.610] if (is.null(version)) [18:41:54.610] version <- utils::packageVersion("future") [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] version <- NULL [18:41:54.610] } [18:41:54.610] if (!has_future || version < "1.8.0") { [18:41:54.610] info <- base::c(r_version = base::gsub("R version ", [18:41:54.610] "", base::R.version$version.string), [18:41:54.610] platform = base::sprintf("%s (%s-bit)", [18:41:54.610] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.610] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.610] "release", "version")], collapse = " "), [18:41:54.610] hostname = base::Sys.info()[["nodename"]]) [18:41:54.610] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.610] info) [18:41:54.610] info <- base::paste(info, collapse = "; ") [18:41:54.610] if (!has_future) { [18:41:54.610] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.610] info) [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.610] info, version) [18:41:54.610] } [18:41:54.610] base::stop(msg) [18:41:54.610] } [18:41:54.610] }) [18:41:54.610] } [18:41:54.610] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.610] base::options(mc.cores = 1L) [18:41:54.610] } [18:41:54.610] ...future.strategy.old <- future::plan("list") [18:41:54.610] options(future.plan = NULL) [18:41:54.610] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.610] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.610] } [18:41:54.610] ...future.workdir <- getwd() [18:41:54.610] } [18:41:54.610] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.610] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.610] } [18:41:54.610] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.610] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.610] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.610] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.610] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.610] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.610] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.610] base::names(...future.oldOptions)) [18:41:54.610] } [18:41:54.610] if (FALSE) { [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] if (TRUE) { [18:41:54.610] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.610] open = "w") [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.610] windows = "NUL", "/dev/null"), open = "w") [18:41:54.610] } [18:41:54.610] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.610] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.610] base::sink(type = "output", split = FALSE) [18:41:54.610] base::close(...future.stdout) [18:41:54.610] }, add = TRUE) [18:41:54.610] } [18:41:54.610] ...future.frame <- base::sys.nframe() [18:41:54.610] ...future.conditions <- base::list() [18:41:54.610] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.610] if (FALSE) { [18:41:54.610] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.610] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.610] } [18:41:54.610] ...future.result <- base::tryCatch({ [18:41:54.610] base::withCallingHandlers({ [18:41:54.610] ...future.value <- base::withVisible(base::local({ [18:41:54.610] ...future.makeSendCondition <- base::local({ [18:41:54.610] sendCondition <- NULL [18:41:54.610] function(frame = 1L) { [18:41:54.610] if (is.function(sendCondition)) [18:41:54.610] return(sendCondition) [18:41:54.610] ns <- getNamespace("parallel") [18:41:54.610] if (exists("sendData", mode = "function", [18:41:54.610] envir = ns)) { [18:41:54.610] parallel_sendData <- get("sendData", mode = "function", [18:41:54.610] envir = ns) [18:41:54.610] envir <- sys.frame(frame) [18:41:54.610] master <- NULL [18:41:54.610] while (!identical(envir, .GlobalEnv) && [18:41:54.610] !identical(envir, emptyenv())) { [18:41:54.610] if (exists("master", mode = "list", envir = envir, [18:41:54.610] inherits = FALSE)) { [18:41:54.610] master <- get("master", mode = "list", [18:41:54.610] envir = envir, inherits = FALSE) [18:41:54.610] if (inherits(master, c("SOCKnode", [18:41:54.610] "SOCK0node"))) { [18:41:54.610] sendCondition <<- function(cond) { [18:41:54.610] data <- list(type = "VALUE", value = cond, [18:41:54.610] success = TRUE) [18:41:54.610] parallel_sendData(master, data) [18:41:54.610] } [18:41:54.610] return(sendCondition) [18:41:54.610] } [18:41:54.610] } [18:41:54.610] frame <- frame + 1L [18:41:54.610] envir <- sys.frame(frame) [18:41:54.610] } [18:41:54.610] } [18:41:54.610] sendCondition <<- function(cond) NULL [18:41:54.610] } [18:41:54.610] }) [18:41:54.610] withCallingHandlers({ [18:41:54.610] { [18:41:54.610] do.call(function(...) { [18:41:54.610] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.610] if (!identical(...future.globals.maxSize.org, [18:41:54.610] ...future.globals.maxSize)) { [18:41:54.610] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.610] on.exit(options(oopts), add = TRUE) [18:41:54.610] } [18:41:54.610] { [18:41:54.610] lapply(seq_along(...future.elements_ii), [18:41:54.610] FUN = function(jj) { [18:41:54.610] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.610] ...future.FUN(...future.X_jj, ...) [18:41:54.610] }) [18:41:54.610] } [18:41:54.610] }, args = future.call.arguments) [18:41:54.610] } [18:41:54.610] }, immediateCondition = function(cond) { [18:41:54.610] sendCondition <- ...future.makeSendCondition() [18:41:54.610] sendCondition(cond) [18:41:54.610] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.610] { [18:41:54.610] inherits <- base::inherits [18:41:54.610] invokeRestart <- base::invokeRestart [18:41:54.610] is.null <- base::is.null [18:41:54.610] muffled <- FALSE [18:41:54.610] if (inherits(cond, "message")) { [18:41:54.610] muffled <- grepl(pattern, "muffleMessage") [18:41:54.610] if (muffled) [18:41:54.610] invokeRestart("muffleMessage") [18:41:54.610] } [18:41:54.610] else if (inherits(cond, "warning")) { [18:41:54.610] muffled <- grepl(pattern, "muffleWarning") [18:41:54.610] if (muffled) [18:41:54.610] invokeRestart("muffleWarning") [18:41:54.610] } [18:41:54.610] else if (inherits(cond, "condition")) { [18:41:54.610] if (!is.null(pattern)) { [18:41:54.610] computeRestarts <- base::computeRestarts [18:41:54.610] grepl <- base::grepl [18:41:54.610] restarts <- computeRestarts(cond) [18:41:54.610] for (restart in restarts) { [18:41:54.610] name <- restart$name [18:41:54.610] if (is.null(name)) [18:41:54.610] next [18:41:54.610] if (!grepl(pattern, name)) [18:41:54.610] next [18:41:54.610] invokeRestart(restart) [18:41:54.610] muffled <- TRUE [18:41:54.610] break [18:41:54.610] } [18:41:54.610] } [18:41:54.610] } [18:41:54.610] invisible(muffled) [18:41:54.610] } [18:41:54.610] muffleCondition(cond) [18:41:54.610] }) [18:41:54.610] })) [18:41:54.610] future::FutureResult(value = ...future.value$value, [18:41:54.610] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.610] ...future.rng), globalenv = if (FALSE) [18:41:54.610] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.610] ...future.globalenv.names)) [18:41:54.610] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.610] }, condition = base::local({ [18:41:54.610] c <- base::c [18:41:54.610] inherits <- base::inherits [18:41:54.610] invokeRestart <- base::invokeRestart [18:41:54.610] length <- base::length [18:41:54.610] list <- base::list [18:41:54.610] seq.int <- base::seq.int [18:41:54.610] signalCondition <- base::signalCondition [18:41:54.610] sys.calls <- base::sys.calls [18:41:54.610] `[[` <- base::`[[` [18:41:54.610] `+` <- base::`+` [18:41:54.610] `<<-` <- base::`<<-` [18:41:54.610] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.610] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.610] 3L)] [18:41:54.610] } [18:41:54.610] function(cond) { [18:41:54.610] is_error <- inherits(cond, "error") [18:41:54.610] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.610] NULL) [18:41:54.610] if (is_error) { [18:41:54.610] sessionInformation <- function() { [18:41:54.610] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.610] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.610] search = base::search(), system = base::Sys.info()) [18:41:54.610] } [18:41:54.610] ...future.conditions[[length(...future.conditions) + [18:41:54.610] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.610] cond$call), session = sessionInformation(), [18:41:54.610] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.610] signalCondition(cond) [18:41:54.610] } [18:41:54.610] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.610] "immediateCondition"))) { [18:41:54.610] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.610] ...future.conditions[[length(...future.conditions) + [18:41:54.610] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.610] if (TRUE && !signal) { [18:41:54.610] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.610] { [18:41:54.610] inherits <- base::inherits [18:41:54.610] invokeRestart <- base::invokeRestart [18:41:54.610] is.null <- base::is.null [18:41:54.610] muffled <- FALSE [18:41:54.610] if (inherits(cond, "message")) { [18:41:54.610] muffled <- grepl(pattern, "muffleMessage") [18:41:54.610] if (muffled) [18:41:54.610] invokeRestart("muffleMessage") [18:41:54.610] } [18:41:54.610] else if (inherits(cond, "warning")) { [18:41:54.610] muffled <- grepl(pattern, "muffleWarning") [18:41:54.610] if (muffled) [18:41:54.610] invokeRestart("muffleWarning") [18:41:54.610] } [18:41:54.610] else if (inherits(cond, "condition")) { [18:41:54.610] if (!is.null(pattern)) { [18:41:54.610] computeRestarts <- base::computeRestarts [18:41:54.610] grepl <- base::grepl [18:41:54.610] restarts <- computeRestarts(cond) [18:41:54.610] for (restart in restarts) { [18:41:54.610] name <- restart$name [18:41:54.610] if (is.null(name)) [18:41:54.610] next [18:41:54.610] if (!grepl(pattern, name)) [18:41:54.610] next [18:41:54.610] invokeRestart(restart) [18:41:54.610] muffled <- TRUE [18:41:54.610] break [18:41:54.610] } [18:41:54.610] } [18:41:54.610] } [18:41:54.610] invisible(muffled) [18:41:54.610] } [18:41:54.610] muffleCondition(cond, pattern = "^muffle") [18:41:54.610] } [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] if (TRUE) { [18:41:54.610] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.610] { [18:41:54.610] inherits <- base::inherits [18:41:54.610] invokeRestart <- base::invokeRestart [18:41:54.610] is.null <- base::is.null [18:41:54.610] muffled <- FALSE [18:41:54.610] if (inherits(cond, "message")) { [18:41:54.610] muffled <- grepl(pattern, "muffleMessage") [18:41:54.610] if (muffled) [18:41:54.610] invokeRestart("muffleMessage") [18:41:54.610] } [18:41:54.610] else if (inherits(cond, "warning")) { [18:41:54.610] muffled <- grepl(pattern, "muffleWarning") [18:41:54.610] if (muffled) [18:41:54.610] invokeRestart("muffleWarning") [18:41:54.610] } [18:41:54.610] else if (inherits(cond, "condition")) { [18:41:54.610] if (!is.null(pattern)) { [18:41:54.610] computeRestarts <- base::computeRestarts [18:41:54.610] grepl <- base::grepl [18:41:54.610] restarts <- computeRestarts(cond) [18:41:54.610] for (restart in restarts) { [18:41:54.610] name <- restart$name [18:41:54.610] if (is.null(name)) [18:41:54.610] next [18:41:54.610] if (!grepl(pattern, name)) [18:41:54.610] next [18:41:54.610] invokeRestart(restart) [18:41:54.610] muffled <- TRUE [18:41:54.610] break [18:41:54.610] } [18:41:54.610] } [18:41:54.610] } [18:41:54.610] invisible(muffled) [18:41:54.610] } [18:41:54.610] muffleCondition(cond, pattern = "^muffle") [18:41:54.610] } [18:41:54.610] } [18:41:54.610] } [18:41:54.610] })) [18:41:54.610] }, error = function(ex) { [18:41:54.610] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.610] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.610] ...future.rng), started = ...future.startTime, [18:41:54.610] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.610] version = "1.8"), class = "FutureResult") [18:41:54.610] }, finally = { [18:41:54.610] if (!identical(...future.workdir, getwd())) [18:41:54.610] setwd(...future.workdir) [18:41:54.610] { [18:41:54.610] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.610] ...future.oldOptions$nwarnings <- NULL [18:41:54.610] } [18:41:54.610] base::options(...future.oldOptions) [18:41:54.610] if (.Platform$OS.type == "windows") { [18:41:54.610] old_names <- names(...future.oldEnvVars) [18:41:54.610] envs <- base::Sys.getenv() [18:41:54.610] names <- names(envs) [18:41:54.610] common <- intersect(names, old_names) [18:41:54.610] added <- setdiff(names, old_names) [18:41:54.610] removed <- setdiff(old_names, names) [18:41:54.610] changed <- common[...future.oldEnvVars[common] != [18:41:54.610] envs[common]] [18:41:54.610] NAMES <- toupper(changed) [18:41:54.610] args <- list() [18:41:54.610] for (kk in seq_along(NAMES)) { [18:41:54.610] name <- changed[[kk]] [18:41:54.610] NAME <- NAMES[[kk]] [18:41:54.610] if (name != NAME && is.element(NAME, old_names)) [18:41:54.610] next [18:41:54.610] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.610] } [18:41:54.610] NAMES <- toupper(added) [18:41:54.610] for (kk in seq_along(NAMES)) { [18:41:54.610] name <- added[[kk]] [18:41:54.610] NAME <- NAMES[[kk]] [18:41:54.610] if (name != NAME && is.element(NAME, old_names)) [18:41:54.610] next [18:41:54.610] args[[name]] <- "" [18:41:54.610] } [18:41:54.610] NAMES <- toupper(removed) [18:41:54.610] for (kk in seq_along(NAMES)) { [18:41:54.610] name <- removed[[kk]] [18:41:54.610] NAME <- NAMES[[kk]] [18:41:54.610] if (name != NAME && is.element(NAME, old_names)) [18:41:54.610] next [18:41:54.610] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.610] } [18:41:54.610] if (length(args) > 0) [18:41:54.610] base::do.call(base::Sys.setenv, args = args) [18:41:54.610] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.610] } [18:41:54.610] { [18:41:54.610] if (base::length(...future.futureOptionsAdded) > [18:41:54.610] 0L) { [18:41:54.610] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.610] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.610] base::options(opts) [18:41:54.610] } [18:41:54.610] { [18:41:54.610] { [18:41:54.610] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.610] NULL [18:41:54.610] } [18:41:54.610] options(future.plan = NULL) [18:41:54.610] if (is.na(NA_character_)) [18:41:54.610] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.610] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.610] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.610] .init = FALSE) [18:41:54.610] } [18:41:54.610] } [18:41:54.610] } [18:41:54.610] }) [18:41:54.610] if (TRUE) { [18:41:54.610] base::sink(type = "output", split = FALSE) [18:41:54.610] if (TRUE) { [18:41:54.610] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.610] } [18:41:54.610] else { [18:41:54.610] ...future.result["stdout"] <- base::list(NULL) [18:41:54.610] } [18:41:54.610] base::close(...future.stdout) [18:41:54.610] ...future.stdout <- NULL [18:41:54.610] } [18:41:54.610] ...future.result$conditions <- ...future.conditions [18:41:54.610] ...future.result$finished <- base::Sys.time() [18:41:54.610] ...future.result [18:41:54.610] } [18:41:54.615] Exporting 5 global objects (864 bytes) to cluster node #1 ... [18:41:54.615] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.616] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.616] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.616] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.616] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:54.617] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:54.617] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.617] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.618] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.618] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.618] Exporting 5 global objects (864 bytes) to cluster node #1 ... DONE [18:41:54.619] MultisessionFuture started [18:41:54.619] - Launch lazy future ... done [18:41:54.619] run() for 'MultisessionFuture' ... done [18:41:54.619] Created future: [18:41:54.635] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.635] - Validating connection of MultisessionFuture [18:41:54.635] - received message: FutureResult [18:41:54.636] - Received FutureResult [18:41:54.636] - Erased future from FutureRegistry [18:41:54.636] result() for ClusterFuture ... [18:41:54.636] - result already collected: FutureResult [18:41:54.636] result() for ClusterFuture ... done [18:41:54.636] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.620] MultisessionFuture: [18:41:54.620] Label: 'future_sapply-2' [18:41:54.620] Expression: [18:41:54.620] { [18:41:54.620] do.call(function(...) { [18:41:54.620] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.620] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.620] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.620] on.exit(options(oopts), add = TRUE) [18:41:54.620] } [18:41:54.620] { [18:41:54.620] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.620] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.620] ...future.FUN(...future.X_jj, ...) [18:41:54.620] }) [18:41:54.620] } [18:41:54.620] }, args = future.call.arguments) [18:41:54.620] } [18:41:54.620] Lazy evaluation: FALSE [18:41:54.620] Asynchronous evaluation: TRUE [18:41:54.620] Local evaluation: TRUE [18:41:54.620] Environment: R_GlobalEnv [18:41:54.620] Capture standard output: TRUE [18:41:54.620] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.620] Globals: 5 objects totaling 401 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.620] Packages: [18:41:54.620] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.620] Resolved: TRUE [18:41:54.620] Value: [18:41:54.620] Conditions captured: [18:41:54.620] Early signaling: FALSE [18:41:54.620] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.620] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.637] Chunk #2 of 2 ... DONE [18:41:54.637] Launching 2 futures (chunks) ... DONE [18:41:54.637] Resolving 2 futures (chunks) ... [18:41:54.637] resolve() on list ... [18:41:54.637] recursive: 0 [18:41:54.638] length: 2 [18:41:54.638] [18:41:54.638] Future #1 [18:41:54.638] result() for ClusterFuture ... [18:41:54.638] - result already collected: FutureResult [18:41:54.638] result() for ClusterFuture ... done [18:41:54.639] result() for ClusterFuture ... [18:41:54.639] - result already collected: FutureResult [18:41:54.639] result() for ClusterFuture ... done [18:41:54.639] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.639] - nx: 2 [18:41:54.639] - relay: TRUE [18:41:54.640] - stdout: TRUE [18:41:54.640] - signal: TRUE [18:41:54.640] - resignal: FALSE [18:41:54.640] - force: TRUE [18:41:54.640] - relayed: [n=2] FALSE, FALSE [18:41:54.640] - queued futures: [n=2] FALSE, FALSE [18:41:54.640] - until=1 [18:41:54.641] - relaying element #1 [18:41:54.641] result() for ClusterFuture ... [18:41:54.641] - result already collected: FutureResult [18:41:54.641] result() for ClusterFuture ... done [18:41:54.641] result() for ClusterFuture ... [18:41:54.641] - result already collected: FutureResult [18:41:54.642] result() for ClusterFuture ... done [18:41:54.642] result() for ClusterFuture ... [18:41:54.642] - result already collected: FutureResult [18:41:54.642] result() for ClusterFuture ... done [18:41:54.642] result() for ClusterFuture ... [18:41:54.642] - result already collected: FutureResult [18:41:54.643] result() for ClusterFuture ... done [18:41:54.643] - relayed: [n=2] TRUE, FALSE [18:41:54.643] - queued futures: [n=2] TRUE, FALSE [18:41:54.643] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.643] length: 1 (resolved future 1) [18:41:54.643] Future #2 [18:41:54.644] result() for ClusterFuture ... [18:41:54.644] - result already collected: FutureResult [18:41:54.644] result() for ClusterFuture ... done [18:41:54.644] result() for ClusterFuture ... [18:41:54.644] - result already collected: FutureResult [18:41:54.644] result() for ClusterFuture ... done [18:41:54.645] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.645] - nx: 2 [18:41:54.645] - relay: TRUE [18:41:54.645] - stdout: TRUE [18:41:54.645] - signal: TRUE [18:41:54.645] - resignal: FALSE [18:41:54.645] - force: TRUE [18:41:54.646] - relayed: [n=2] TRUE, FALSE [18:41:54.646] - queued futures: [n=2] TRUE, FALSE [18:41:54.646] - until=2 [18:41:54.646] - relaying element #2 [18:41:54.646] result() for ClusterFuture ... [18:41:54.646] - result already collected: FutureResult [18:41:54.647] result() for ClusterFuture ... done [18:41:54.647] result() for ClusterFuture ... [18:41:54.647] - result already collected: FutureResult [18:41:54.647] result() for ClusterFuture ... done [18:41:54.647] result() for ClusterFuture ... [18:41:54.647] - result already collected: FutureResult [18:41:54.648] result() for ClusterFuture ... done [18:41:54.648] result() for ClusterFuture ... [18:41:54.648] - result already collected: FutureResult [18:41:54.648] result() for ClusterFuture ... done [18:41:54.648] - relayed: [n=2] TRUE, TRUE [18:41:54.648] - queued futures: [n=2] TRUE, TRUE [18:41:54.648] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.649] length: 0 (resolved future 2) [18:41:54.649] Relaying remaining futures [18:41:54.649] signalConditionsASAP(NULL, pos=0) ... [18:41:54.649] - nx: 2 [18:41:54.649] - relay: TRUE [18:41:54.649] - stdout: TRUE [18:41:54.650] - signal: TRUE [18:41:54.650] - resignal: FALSE [18:41:54.650] - force: TRUE [18:41:54.650] - relayed: [n=2] TRUE, TRUE [18:41:54.650] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.650] - relayed: [n=2] TRUE, TRUE [18:41:54.651] - queued futures: [n=2] TRUE, TRUE [18:41:54.651] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.651] resolve() on list ... DONE [18:41:54.651] result() for ClusterFuture ... [18:41:54.651] - result already collected: FutureResult [18:41:54.651] result() for ClusterFuture ... done [18:41:54.651] result() for ClusterFuture ... [18:41:54.652] - result already collected: FutureResult [18:41:54.652] result() for ClusterFuture ... done [18:41:54.652] result() for ClusterFuture ... [18:41:54.652] - result already collected: FutureResult [18:41:54.652] result() for ClusterFuture ... done [18:41:54.652] result() for ClusterFuture ... [18:41:54.653] - result already collected: FutureResult [18:41:54.653] result() for ClusterFuture ... done [18:41:54.653] - Number of value chunks collected: 2 [18:41:54.653] Resolving 2 futures (chunks) ... DONE [18:41:54.653] Reducing values from 2 chunks ... [18:41:54.653] - Number of values collected after concatenation: 3 [18:41:54.654] - Number of values expected: 3 [18:41:54.654] Reducing values from 2 chunks ... DONE [18:41:54.654] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:54.656] future_lapply() ... [18:41:54.659] Number of chunks: 2 [18:41:54.659] getGlobalsAndPackagesXApply() ... [18:41:54.659] - future.globals: TRUE [18:41:54.659] getGlobalsAndPackages() ... [18:41:54.659] Searching for globals... [18:41:54.661] - globals found: [2] 'FUN', 'UseMethod' [18:41:54.661] Searching for globals ... DONE [18:41:54.661] Resolving globals: FALSE [18:41:54.662] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:54.662] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:54.663] - globals: [1] 'FUN' [18:41:54.663] [18:41:54.663] getGlobalsAndPackages() ... DONE [18:41:54.663] - globals found/used: [n=1] 'FUN' [18:41:54.663] - needed namespaces: [n=0] [18:41:54.663] Finding globals ... DONE [18:41:54.664] - use_args: TRUE [18:41:54.664] - Getting '...' globals ... [18:41:54.664] resolve() on list ... [18:41:54.664] recursive: 0 [18:41:54.665] length: 1 [18:41:54.665] elements: '...' [18:41:54.665] length: 0 (resolved future 1) [18:41:54.665] resolve() on list ... DONE [18:41:54.665] - '...' content: [n=0] [18:41:54.666] List of 1 [18:41:54.666] $ ...: list() [18:41:54.666] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.666] - attr(*, "where")=List of 1 [18:41:54.666] ..$ ...: [18:41:54.666] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.666] - attr(*, "resolved")= logi TRUE [18:41:54.666] - attr(*, "total_size")= num NA [18:41:54.669] - Getting '...' globals ... DONE [18:41:54.669] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.669] List of 2 [18:41:54.669] $ ...future.FUN:function (x, ...) [18:41:54.669] $ ... : list() [18:41:54.669] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.669] - attr(*, "where")=List of 2 [18:41:54.669] ..$ ...future.FUN: [18:41:54.669] ..$ ... : [18:41:54.669] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.669] - attr(*, "resolved")= logi FALSE [18:41:54.669] - attr(*, "total_size")= int 5028 [18:41:54.673] Packages to be attached in all futures: [n=0] [18:41:54.673] getGlobalsAndPackagesXApply() ... DONE [18:41:54.673] Number of futures (= number of chunks): 2 [18:41:54.673] Launching 2 futures (chunks) ... [18:41:54.674] Chunk #1 of 2 ... [18:41:54.674] - Finding globals in 'X' for chunk #1 ... [18:41:54.674] getGlobalsAndPackages() ... [18:41:54.674] Searching for globals... [18:41:54.674] [18:41:54.675] Searching for globals ... DONE [18:41:54.675] - globals: [0] [18:41:54.675] getGlobalsAndPackages() ... DONE [18:41:54.675] + additional globals found: [n=0] [18:41:54.675] + additional namespaces needed: [n=0] [18:41:54.675] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.676] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.676] - seeds: [18:41:54.676] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.676] getGlobalsAndPackages() ... [18:41:54.676] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.677] Resolving globals: FALSE [18:41:54.677] Tweak future expression to call with '...' arguments ... [18:41:54.677] { [18:41:54.677] do.call(function(...) { [18:41:54.677] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.677] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.677] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.677] on.exit(options(oopts), add = TRUE) [18:41:54.677] } [18:41:54.677] { [18:41:54.677] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.677] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.677] ...future.FUN(...future.X_jj, ...) [18:41:54.677] }) [18:41:54.677] } [18:41:54.677] }, args = future.call.arguments) [18:41:54.677] } [18:41:54.677] Tweak future expression to call with '...' arguments ... DONE [18:41:54.678] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.678] [18:41:54.678] getGlobalsAndPackages() ... DONE [18:41:54.679] run() for 'Future' ... [18:41:54.679] - state: 'created' [18:41:54.679] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.695] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.695] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.695] - Field: 'node' [18:41:54.695] - Field: 'label' [18:41:54.695] - Field: 'local' [18:41:54.696] - Field: 'owner' [18:41:54.696] - Field: 'envir' [18:41:54.696] - Field: 'workers' [18:41:54.696] - Field: 'packages' [18:41:54.696] - Field: 'gc' [18:41:54.696] - Field: 'conditions' [18:41:54.697] - Field: 'persistent' [18:41:54.697] - Field: 'expr' [18:41:54.697] - Field: 'uuid' [18:41:54.697] - Field: 'seed' [18:41:54.697] - Field: 'version' [18:41:54.697] - Field: 'result' [18:41:54.698] - Field: 'asynchronous' [18:41:54.698] - Field: 'calls' [18:41:54.698] - Field: 'globals' [18:41:54.698] - Field: 'stdout' [18:41:54.698] - Field: 'earlySignal' [18:41:54.699] - Field: 'lazy' [18:41:54.699] - Field: 'state' [18:41:54.699] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.699] - Launch lazy future ... [18:41:54.699] Packages needed by the future expression (n = 0): [18:41:54.700] Packages needed by future strategies (n = 0): [18:41:54.700] { [18:41:54.700] { [18:41:54.700] { [18:41:54.700] ...future.startTime <- base::Sys.time() [18:41:54.700] { [18:41:54.700] { [18:41:54.700] { [18:41:54.700] { [18:41:54.700] base::local({ [18:41:54.700] has_future <- base::requireNamespace("future", [18:41:54.700] quietly = TRUE) [18:41:54.700] if (has_future) { [18:41:54.700] ns <- base::getNamespace("future") [18:41:54.700] version <- ns[[".package"]][["version"]] [18:41:54.700] if (is.null(version)) [18:41:54.700] version <- utils::packageVersion("future") [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] version <- NULL [18:41:54.700] } [18:41:54.700] if (!has_future || version < "1.8.0") { [18:41:54.700] info <- base::c(r_version = base::gsub("R version ", [18:41:54.700] "", base::R.version$version.string), [18:41:54.700] platform = base::sprintf("%s (%s-bit)", [18:41:54.700] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.700] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.700] "release", "version")], collapse = " "), [18:41:54.700] hostname = base::Sys.info()[["nodename"]]) [18:41:54.700] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.700] info) [18:41:54.700] info <- base::paste(info, collapse = "; ") [18:41:54.700] if (!has_future) { [18:41:54.700] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.700] info) [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.700] info, version) [18:41:54.700] } [18:41:54.700] base::stop(msg) [18:41:54.700] } [18:41:54.700] }) [18:41:54.700] } [18:41:54.700] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.700] base::options(mc.cores = 1L) [18:41:54.700] } [18:41:54.700] ...future.strategy.old <- future::plan("list") [18:41:54.700] options(future.plan = NULL) [18:41:54.700] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.700] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.700] } [18:41:54.700] ...future.workdir <- getwd() [18:41:54.700] } [18:41:54.700] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.700] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.700] } [18:41:54.700] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.700] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.700] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.700] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.700] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.700] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.700] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.700] base::names(...future.oldOptions)) [18:41:54.700] } [18:41:54.700] if (FALSE) { [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] if (TRUE) { [18:41:54.700] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.700] open = "w") [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.700] windows = "NUL", "/dev/null"), open = "w") [18:41:54.700] } [18:41:54.700] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.700] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.700] base::sink(type = "output", split = FALSE) [18:41:54.700] base::close(...future.stdout) [18:41:54.700] }, add = TRUE) [18:41:54.700] } [18:41:54.700] ...future.frame <- base::sys.nframe() [18:41:54.700] ...future.conditions <- base::list() [18:41:54.700] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.700] if (FALSE) { [18:41:54.700] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.700] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.700] } [18:41:54.700] ...future.result <- base::tryCatch({ [18:41:54.700] base::withCallingHandlers({ [18:41:54.700] ...future.value <- base::withVisible(base::local({ [18:41:54.700] ...future.makeSendCondition <- base::local({ [18:41:54.700] sendCondition <- NULL [18:41:54.700] function(frame = 1L) { [18:41:54.700] if (is.function(sendCondition)) [18:41:54.700] return(sendCondition) [18:41:54.700] ns <- getNamespace("parallel") [18:41:54.700] if (exists("sendData", mode = "function", [18:41:54.700] envir = ns)) { [18:41:54.700] parallel_sendData <- get("sendData", mode = "function", [18:41:54.700] envir = ns) [18:41:54.700] envir <- sys.frame(frame) [18:41:54.700] master <- NULL [18:41:54.700] while (!identical(envir, .GlobalEnv) && [18:41:54.700] !identical(envir, emptyenv())) { [18:41:54.700] if (exists("master", mode = "list", envir = envir, [18:41:54.700] inherits = FALSE)) { [18:41:54.700] master <- get("master", mode = "list", [18:41:54.700] envir = envir, inherits = FALSE) [18:41:54.700] if (inherits(master, c("SOCKnode", [18:41:54.700] "SOCK0node"))) { [18:41:54.700] sendCondition <<- function(cond) { [18:41:54.700] data <- list(type = "VALUE", value = cond, [18:41:54.700] success = TRUE) [18:41:54.700] parallel_sendData(master, data) [18:41:54.700] } [18:41:54.700] return(sendCondition) [18:41:54.700] } [18:41:54.700] } [18:41:54.700] frame <- frame + 1L [18:41:54.700] envir <- sys.frame(frame) [18:41:54.700] } [18:41:54.700] } [18:41:54.700] sendCondition <<- function(cond) NULL [18:41:54.700] } [18:41:54.700] }) [18:41:54.700] withCallingHandlers({ [18:41:54.700] { [18:41:54.700] do.call(function(...) { [18:41:54.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.700] if (!identical(...future.globals.maxSize.org, [18:41:54.700] ...future.globals.maxSize)) { [18:41:54.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.700] on.exit(options(oopts), add = TRUE) [18:41:54.700] } [18:41:54.700] { [18:41:54.700] lapply(seq_along(...future.elements_ii), [18:41:54.700] FUN = function(jj) { [18:41:54.700] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.700] ...future.FUN(...future.X_jj, ...) [18:41:54.700] }) [18:41:54.700] } [18:41:54.700] }, args = future.call.arguments) [18:41:54.700] } [18:41:54.700] }, immediateCondition = function(cond) { [18:41:54.700] sendCondition <- ...future.makeSendCondition() [18:41:54.700] sendCondition(cond) [18:41:54.700] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.700] { [18:41:54.700] inherits <- base::inherits [18:41:54.700] invokeRestart <- base::invokeRestart [18:41:54.700] is.null <- base::is.null [18:41:54.700] muffled <- FALSE [18:41:54.700] if (inherits(cond, "message")) { [18:41:54.700] muffled <- grepl(pattern, "muffleMessage") [18:41:54.700] if (muffled) [18:41:54.700] invokeRestart("muffleMessage") [18:41:54.700] } [18:41:54.700] else if (inherits(cond, "warning")) { [18:41:54.700] muffled <- grepl(pattern, "muffleWarning") [18:41:54.700] if (muffled) [18:41:54.700] invokeRestart("muffleWarning") [18:41:54.700] } [18:41:54.700] else if (inherits(cond, "condition")) { [18:41:54.700] if (!is.null(pattern)) { [18:41:54.700] computeRestarts <- base::computeRestarts [18:41:54.700] grepl <- base::grepl [18:41:54.700] restarts <- computeRestarts(cond) [18:41:54.700] for (restart in restarts) { [18:41:54.700] name <- restart$name [18:41:54.700] if (is.null(name)) [18:41:54.700] next [18:41:54.700] if (!grepl(pattern, name)) [18:41:54.700] next [18:41:54.700] invokeRestart(restart) [18:41:54.700] muffled <- TRUE [18:41:54.700] break [18:41:54.700] } [18:41:54.700] } [18:41:54.700] } [18:41:54.700] invisible(muffled) [18:41:54.700] } [18:41:54.700] muffleCondition(cond) [18:41:54.700] }) [18:41:54.700] })) [18:41:54.700] future::FutureResult(value = ...future.value$value, [18:41:54.700] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.700] ...future.rng), globalenv = if (FALSE) [18:41:54.700] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.700] ...future.globalenv.names)) [18:41:54.700] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.700] }, condition = base::local({ [18:41:54.700] c <- base::c [18:41:54.700] inherits <- base::inherits [18:41:54.700] invokeRestart <- base::invokeRestart [18:41:54.700] length <- base::length [18:41:54.700] list <- base::list [18:41:54.700] seq.int <- base::seq.int [18:41:54.700] signalCondition <- base::signalCondition [18:41:54.700] sys.calls <- base::sys.calls [18:41:54.700] `[[` <- base::`[[` [18:41:54.700] `+` <- base::`+` [18:41:54.700] `<<-` <- base::`<<-` [18:41:54.700] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.700] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.700] 3L)] [18:41:54.700] } [18:41:54.700] function(cond) { [18:41:54.700] is_error <- inherits(cond, "error") [18:41:54.700] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.700] NULL) [18:41:54.700] if (is_error) { [18:41:54.700] sessionInformation <- function() { [18:41:54.700] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.700] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.700] search = base::search(), system = base::Sys.info()) [18:41:54.700] } [18:41:54.700] ...future.conditions[[length(...future.conditions) + [18:41:54.700] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.700] cond$call), session = sessionInformation(), [18:41:54.700] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.700] signalCondition(cond) [18:41:54.700] } [18:41:54.700] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.700] "immediateCondition"))) { [18:41:54.700] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.700] ...future.conditions[[length(...future.conditions) + [18:41:54.700] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.700] if (TRUE && !signal) { [18:41:54.700] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.700] { [18:41:54.700] inherits <- base::inherits [18:41:54.700] invokeRestart <- base::invokeRestart [18:41:54.700] is.null <- base::is.null [18:41:54.700] muffled <- FALSE [18:41:54.700] if (inherits(cond, "message")) { [18:41:54.700] muffled <- grepl(pattern, "muffleMessage") [18:41:54.700] if (muffled) [18:41:54.700] invokeRestart("muffleMessage") [18:41:54.700] } [18:41:54.700] else if (inherits(cond, "warning")) { [18:41:54.700] muffled <- grepl(pattern, "muffleWarning") [18:41:54.700] if (muffled) [18:41:54.700] invokeRestart("muffleWarning") [18:41:54.700] } [18:41:54.700] else if (inherits(cond, "condition")) { [18:41:54.700] if (!is.null(pattern)) { [18:41:54.700] computeRestarts <- base::computeRestarts [18:41:54.700] grepl <- base::grepl [18:41:54.700] restarts <- computeRestarts(cond) [18:41:54.700] for (restart in restarts) { [18:41:54.700] name <- restart$name [18:41:54.700] if (is.null(name)) [18:41:54.700] next [18:41:54.700] if (!grepl(pattern, name)) [18:41:54.700] next [18:41:54.700] invokeRestart(restart) [18:41:54.700] muffled <- TRUE [18:41:54.700] break [18:41:54.700] } [18:41:54.700] } [18:41:54.700] } [18:41:54.700] invisible(muffled) [18:41:54.700] } [18:41:54.700] muffleCondition(cond, pattern = "^muffle") [18:41:54.700] } [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] if (TRUE) { [18:41:54.700] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.700] { [18:41:54.700] inherits <- base::inherits [18:41:54.700] invokeRestart <- base::invokeRestart [18:41:54.700] is.null <- base::is.null [18:41:54.700] muffled <- FALSE [18:41:54.700] if (inherits(cond, "message")) { [18:41:54.700] muffled <- grepl(pattern, "muffleMessage") [18:41:54.700] if (muffled) [18:41:54.700] invokeRestart("muffleMessage") [18:41:54.700] } [18:41:54.700] else if (inherits(cond, "warning")) { [18:41:54.700] muffled <- grepl(pattern, "muffleWarning") [18:41:54.700] if (muffled) [18:41:54.700] invokeRestart("muffleWarning") [18:41:54.700] } [18:41:54.700] else if (inherits(cond, "condition")) { [18:41:54.700] if (!is.null(pattern)) { [18:41:54.700] computeRestarts <- base::computeRestarts [18:41:54.700] grepl <- base::grepl [18:41:54.700] restarts <- computeRestarts(cond) [18:41:54.700] for (restart in restarts) { [18:41:54.700] name <- restart$name [18:41:54.700] if (is.null(name)) [18:41:54.700] next [18:41:54.700] if (!grepl(pattern, name)) [18:41:54.700] next [18:41:54.700] invokeRestart(restart) [18:41:54.700] muffled <- TRUE [18:41:54.700] break [18:41:54.700] } [18:41:54.700] } [18:41:54.700] } [18:41:54.700] invisible(muffled) [18:41:54.700] } [18:41:54.700] muffleCondition(cond, pattern = "^muffle") [18:41:54.700] } [18:41:54.700] } [18:41:54.700] } [18:41:54.700] })) [18:41:54.700] }, error = function(ex) { [18:41:54.700] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.700] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.700] ...future.rng), started = ...future.startTime, [18:41:54.700] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.700] version = "1.8"), class = "FutureResult") [18:41:54.700] }, finally = { [18:41:54.700] if (!identical(...future.workdir, getwd())) [18:41:54.700] setwd(...future.workdir) [18:41:54.700] { [18:41:54.700] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.700] ...future.oldOptions$nwarnings <- NULL [18:41:54.700] } [18:41:54.700] base::options(...future.oldOptions) [18:41:54.700] if (.Platform$OS.type == "windows") { [18:41:54.700] old_names <- names(...future.oldEnvVars) [18:41:54.700] envs <- base::Sys.getenv() [18:41:54.700] names <- names(envs) [18:41:54.700] common <- intersect(names, old_names) [18:41:54.700] added <- setdiff(names, old_names) [18:41:54.700] removed <- setdiff(old_names, names) [18:41:54.700] changed <- common[...future.oldEnvVars[common] != [18:41:54.700] envs[common]] [18:41:54.700] NAMES <- toupper(changed) [18:41:54.700] args <- list() [18:41:54.700] for (kk in seq_along(NAMES)) { [18:41:54.700] name <- changed[[kk]] [18:41:54.700] NAME <- NAMES[[kk]] [18:41:54.700] if (name != NAME && is.element(NAME, old_names)) [18:41:54.700] next [18:41:54.700] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.700] } [18:41:54.700] NAMES <- toupper(added) [18:41:54.700] for (kk in seq_along(NAMES)) { [18:41:54.700] name <- added[[kk]] [18:41:54.700] NAME <- NAMES[[kk]] [18:41:54.700] if (name != NAME && is.element(NAME, old_names)) [18:41:54.700] next [18:41:54.700] args[[name]] <- "" [18:41:54.700] } [18:41:54.700] NAMES <- toupper(removed) [18:41:54.700] for (kk in seq_along(NAMES)) { [18:41:54.700] name <- removed[[kk]] [18:41:54.700] NAME <- NAMES[[kk]] [18:41:54.700] if (name != NAME && is.element(NAME, old_names)) [18:41:54.700] next [18:41:54.700] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.700] } [18:41:54.700] if (length(args) > 0) [18:41:54.700] base::do.call(base::Sys.setenv, args = args) [18:41:54.700] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.700] } [18:41:54.700] { [18:41:54.700] if (base::length(...future.futureOptionsAdded) > [18:41:54.700] 0L) { [18:41:54.700] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.700] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.700] base::options(opts) [18:41:54.700] } [18:41:54.700] { [18:41:54.700] { [18:41:54.700] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.700] NULL [18:41:54.700] } [18:41:54.700] options(future.plan = NULL) [18:41:54.700] if (is.na(NA_character_)) [18:41:54.700] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.700] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.700] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.700] .init = FALSE) [18:41:54.700] } [18:41:54.700] } [18:41:54.700] } [18:41:54.700] }) [18:41:54.700] if (TRUE) { [18:41:54.700] base::sink(type = "output", split = FALSE) [18:41:54.700] if (TRUE) { [18:41:54.700] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.700] } [18:41:54.700] else { [18:41:54.700] ...future.result["stdout"] <- base::list(NULL) [18:41:54.700] } [18:41:54.700] base::close(...future.stdout) [18:41:54.700] ...future.stdout <- NULL [18:41:54.700] } [18:41:54.700] ...future.result$conditions <- ...future.conditions [18:41:54.700] ...future.result$finished <- base::Sys.time() [18:41:54.700] ...future.result [18:41:54.700] } [18:41:54.706] Exporting 5 global objects (940 bytes) to cluster node #1 ... [18:41:54.706] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:54.706] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:54.707] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.707] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.707] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... [18:41:54.708] Exporting '...future.elements_ii' (48 bytes) to cluster node #1 ... DONE [18:41:54.708] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.708] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.708] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.709] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.709] Exporting 5 global objects (940 bytes) to cluster node #1 ... DONE [18:41:54.710] MultisessionFuture started [18:41:54.710] - Launch lazy future ... done [18:41:54.710] run() for 'MultisessionFuture' ... done [18:41:54.710] Created future: [18:41:54.728] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.728] - Validating connection of MultisessionFuture [18:41:54.728] - received message: FutureResult [18:41:54.728] - Received FutureResult [18:41:54.729] - Erased future from FutureRegistry [18:41:54.729] result() for ClusterFuture ... [18:41:54.729] - result already collected: FutureResult [18:41:54.729] result() for ClusterFuture ... done [18:41:54.729] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.710] MultisessionFuture: [18:41:54.710] Label: 'future_sapply-1' [18:41:54.710] Expression: [18:41:54.710] { [18:41:54.710] do.call(function(...) { [18:41:54.710] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.710] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.710] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.710] on.exit(options(oopts), add = TRUE) [18:41:54.710] } [18:41:54.710] { [18:41:54.710] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.710] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.710] ...future.FUN(...future.X_jj, ...) [18:41:54.710] }) [18:41:54.710] } [18:41:54.710] }, args = future.call.arguments) [18:41:54.710] } [18:41:54.710] Lazy evaluation: FALSE [18:41:54.710] Asynchronous evaluation: TRUE [18:41:54.710] Local evaluation: TRUE [18:41:54.710] Environment: R_GlobalEnv [18:41:54.710] Capture standard output: TRUE [18:41:54.710] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.710] Globals: 5 objects totaling 477 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 48 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.710] Packages: [18:41:54.710] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.710] Resolved: TRUE [18:41:54.710] Value: [18:41:54.710] Conditions captured: [18:41:54.710] Early signaling: FALSE [18:41:54.710] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.710] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.730] Chunk #1 of 2 ... DONE [18:41:54.730] Chunk #2 of 2 ... [18:41:54.730] - Finding globals in 'X' for chunk #2 ... [18:41:54.730] getGlobalsAndPackages() ... [18:41:54.730] Searching for globals... [18:41:54.731] [18:41:54.731] Searching for globals ... DONE [18:41:54.731] - globals: [0] [18:41:54.731] getGlobalsAndPackages() ... DONE [18:41:54.731] + additional globals found: [n=0] [18:41:54.731] + additional namespaces needed: [n=0] [18:41:54.732] - Finding globals in 'X' for chunk #2 ... DONE [18:41:54.732] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.732] - seeds: [18:41:54.732] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.732] getGlobalsAndPackages() ... [18:41:54.732] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.733] Resolving globals: FALSE [18:41:54.733] Tweak future expression to call with '...' arguments ... [18:41:54.733] { [18:41:54.733] do.call(function(...) { [18:41:54.733] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.733] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.733] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.733] on.exit(options(oopts), add = TRUE) [18:41:54.733] } [18:41:54.733] { [18:41:54.733] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.733] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.733] ...future.FUN(...future.X_jj, ...) [18:41:54.733] }) [18:41:54.733] } [18:41:54.733] }, args = future.call.arguments) [18:41:54.733] } [18:41:54.733] Tweak future expression to call with '...' arguments ... DONE [18:41:54.734] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.734] [18:41:54.734] getGlobalsAndPackages() ... DONE [18:41:54.735] run() for 'Future' ... [18:41:54.735] - state: 'created' [18:41:54.735] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.750] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.750] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.750] - Field: 'node' [18:41:54.750] - Field: 'label' [18:41:54.751] - Field: 'local' [18:41:54.751] - Field: 'owner' [18:41:54.751] - Field: 'envir' [18:41:54.751] - Field: 'workers' [18:41:54.751] - Field: 'packages' [18:41:54.751] - Field: 'gc' [18:41:54.752] - Field: 'conditions' [18:41:54.752] - Field: 'persistent' [18:41:54.752] - Field: 'expr' [18:41:54.752] - Field: 'uuid' [18:41:54.752] - Field: 'seed' [18:41:54.753] - Field: 'version' [18:41:54.753] - Field: 'result' [18:41:54.753] - Field: 'asynchronous' [18:41:54.753] - Field: 'calls' [18:41:54.753] - Field: 'globals' [18:41:54.753] - Field: 'stdout' [18:41:54.754] - Field: 'earlySignal' [18:41:54.754] - Field: 'lazy' [18:41:54.754] - Field: 'state' [18:41:54.754] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.754] - Launch lazy future ... [18:41:54.755] Packages needed by the future expression (n = 0): [18:41:54.755] Packages needed by future strategies (n = 0): [18:41:54.755] { [18:41:54.755] { [18:41:54.755] { [18:41:54.755] ...future.startTime <- base::Sys.time() [18:41:54.755] { [18:41:54.755] { [18:41:54.755] { [18:41:54.755] { [18:41:54.755] base::local({ [18:41:54.755] has_future <- base::requireNamespace("future", [18:41:54.755] quietly = TRUE) [18:41:54.755] if (has_future) { [18:41:54.755] ns <- base::getNamespace("future") [18:41:54.755] version <- ns[[".package"]][["version"]] [18:41:54.755] if (is.null(version)) [18:41:54.755] version <- utils::packageVersion("future") [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] version <- NULL [18:41:54.755] } [18:41:54.755] if (!has_future || version < "1.8.0") { [18:41:54.755] info <- base::c(r_version = base::gsub("R version ", [18:41:54.755] "", base::R.version$version.string), [18:41:54.755] platform = base::sprintf("%s (%s-bit)", [18:41:54.755] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.755] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.755] "release", "version")], collapse = " "), [18:41:54.755] hostname = base::Sys.info()[["nodename"]]) [18:41:54.755] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.755] info) [18:41:54.755] info <- base::paste(info, collapse = "; ") [18:41:54.755] if (!has_future) { [18:41:54.755] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.755] info) [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.755] info, version) [18:41:54.755] } [18:41:54.755] base::stop(msg) [18:41:54.755] } [18:41:54.755] }) [18:41:54.755] } [18:41:54.755] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.755] base::options(mc.cores = 1L) [18:41:54.755] } [18:41:54.755] ...future.strategy.old <- future::plan("list") [18:41:54.755] options(future.plan = NULL) [18:41:54.755] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.755] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.755] } [18:41:54.755] ...future.workdir <- getwd() [18:41:54.755] } [18:41:54.755] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.755] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.755] } [18:41:54.755] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.755] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.755] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.755] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.755] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.755] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.755] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.755] base::names(...future.oldOptions)) [18:41:54.755] } [18:41:54.755] if (FALSE) { [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] if (TRUE) { [18:41:54.755] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.755] open = "w") [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.755] windows = "NUL", "/dev/null"), open = "w") [18:41:54.755] } [18:41:54.755] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.755] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.755] base::sink(type = "output", split = FALSE) [18:41:54.755] base::close(...future.stdout) [18:41:54.755] }, add = TRUE) [18:41:54.755] } [18:41:54.755] ...future.frame <- base::sys.nframe() [18:41:54.755] ...future.conditions <- base::list() [18:41:54.755] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.755] if (FALSE) { [18:41:54.755] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.755] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.755] } [18:41:54.755] ...future.result <- base::tryCatch({ [18:41:54.755] base::withCallingHandlers({ [18:41:54.755] ...future.value <- base::withVisible(base::local({ [18:41:54.755] ...future.makeSendCondition <- base::local({ [18:41:54.755] sendCondition <- NULL [18:41:54.755] function(frame = 1L) { [18:41:54.755] if (is.function(sendCondition)) [18:41:54.755] return(sendCondition) [18:41:54.755] ns <- getNamespace("parallel") [18:41:54.755] if (exists("sendData", mode = "function", [18:41:54.755] envir = ns)) { [18:41:54.755] parallel_sendData <- get("sendData", mode = "function", [18:41:54.755] envir = ns) [18:41:54.755] envir <- sys.frame(frame) [18:41:54.755] master <- NULL [18:41:54.755] while (!identical(envir, .GlobalEnv) && [18:41:54.755] !identical(envir, emptyenv())) { [18:41:54.755] if (exists("master", mode = "list", envir = envir, [18:41:54.755] inherits = FALSE)) { [18:41:54.755] master <- get("master", mode = "list", [18:41:54.755] envir = envir, inherits = FALSE) [18:41:54.755] if (inherits(master, c("SOCKnode", [18:41:54.755] "SOCK0node"))) { [18:41:54.755] sendCondition <<- function(cond) { [18:41:54.755] data <- list(type = "VALUE", value = cond, [18:41:54.755] success = TRUE) [18:41:54.755] parallel_sendData(master, data) [18:41:54.755] } [18:41:54.755] return(sendCondition) [18:41:54.755] } [18:41:54.755] } [18:41:54.755] frame <- frame + 1L [18:41:54.755] envir <- sys.frame(frame) [18:41:54.755] } [18:41:54.755] } [18:41:54.755] sendCondition <<- function(cond) NULL [18:41:54.755] } [18:41:54.755] }) [18:41:54.755] withCallingHandlers({ [18:41:54.755] { [18:41:54.755] do.call(function(...) { [18:41:54.755] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.755] if (!identical(...future.globals.maxSize.org, [18:41:54.755] ...future.globals.maxSize)) { [18:41:54.755] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.755] on.exit(options(oopts), add = TRUE) [18:41:54.755] } [18:41:54.755] { [18:41:54.755] lapply(seq_along(...future.elements_ii), [18:41:54.755] FUN = function(jj) { [18:41:54.755] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.755] ...future.FUN(...future.X_jj, ...) [18:41:54.755] }) [18:41:54.755] } [18:41:54.755] }, args = future.call.arguments) [18:41:54.755] } [18:41:54.755] }, immediateCondition = function(cond) { [18:41:54.755] sendCondition <- ...future.makeSendCondition() [18:41:54.755] sendCondition(cond) [18:41:54.755] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.755] { [18:41:54.755] inherits <- base::inherits [18:41:54.755] invokeRestart <- base::invokeRestart [18:41:54.755] is.null <- base::is.null [18:41:54.755] muffled <- FALSE [18:41:54.755] if (inherits(cond, "message")) { [18:41:54.755] muffled <- grepl(pattern, "muffleMessage") [18:41:54.755] if (muffled) [18:41:54.755] invokeRestart("muffleMessage") [18:41:54.755] } [18:41:54.755] else if (inherits(cond, "warning")) { [18:41:54.755] muffled <- grepl(pattern, "muffleWarning") [18:41:54.755] if (muffled) [18:41:54.755] invokeRestart("muffleWarning") [18:41:54.755] } [18:41:54.755] else if (inherits(cond, "condition")) { [18:41:54.755] if (!is.null(pattern)) { [18:41:54.755] computeRestarts <- base::computeRestarts [18:41:54.755] grepl <- base::grepl [18:41:54.755] restarts <- computeRestarts(cond) [18:41:54.755] for (restart in restarts) { [18:41:54.755] name <- restart$name [18:41:54.755] if (is.null(name)) [18:41:54.755] next [18:41:54.755] if (!grepl(pattern, name)) [18:41:54.755] next [18:41:54.755] invokeRestart(restart) [18:41:54.755] muffled <- TRUE [18:41:54.755] break [18:41:54.755] } [18:41:54.755] } [18:41:54.755] } [18:41:54.755] invisible(muffled) [18:41:54.755] } [18:41:54.755] muffleCondition(cond) [18:41:54.755] }) [18:41:54.755] })) [18:41:54.755] future::FutureResult(value = ...future.value$value, [18:41:54.755] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.755] ...future.rng), globalenv = if (FALSE) [18:41:54.755] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.755] ...future.globalenv.names)) [18:41:54.755] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.755] }, condition = base::local({ [18:41:54.755] c <- base::c [18:41:54.755] inherits <- base::inherits [18:41:54.755] invokeRestart <- base::invokeRestart [18:41:54.755] length <- base::length [18:41:54.755] list <- base::list [18:41:54.755] seq.int <- base::seq.int [18:41:54.755] signalCondition <- base::signalCondition [18:41:54.755] sys.calls <- base::sys.calls [18:41:54.755] `[[` <- base::`[[` [18:41:54.755] `+` <- base::`+` [18:41:54.755] `<<-` <- base::`<<-` [18:41:54.755] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.755] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.755] 3L)] [18:41:54.755] } [18:41:54.755] function(cond) { [18:41:54.755] is_error <- inherits(cond, "error") [18:41:54.755] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.755] NULL) [18:41:54.755] if (is_error) { [18:41:54.755] sessionInformation <- function() { [18:41:54.755] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.755] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.755] search = base::search(), system = base::Sys.info()) [18:41:54.755] } [18:41:54.755] ...future.conditions[[length(...future.conditions) + [18:41:54.755] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.755] cond$call), session = sessionInformation(), [18:41:54.755] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.755] signalCondition(cond) [18:41:54.755] } [18:41:54.755] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.755] "immediateCondition"))) { [18:41:54.755] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.755] ...future.conditions[[length(...future.conditions) + [18:41:54.755] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.755] if (TRUE && !signal) { [18:41:54.755] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.755] { [18:41:54.755] inherits <- base::inherits [18:41:54.755] invokeRestart <- base::invokeRestart [18:41:54.755] is.null <- base::is.null [18:41:54.755] muffled <- FALSE [18:41:54.755] if (inherits(cond, "message")) { [18:41:54.755] muffled <- grepl(pattern, "muffleMessage") [18:41:54.755] if (muffled) [18:41:54.755] invokeRestart("muffleMessage") [18:41:54.755] } [18:41:54.755] else if (inherits(cond, "warning")) { [18:41:54.755] muffled <- grepl(pattern, "muffleWarning") [18:41:54.755] if (muffled) [18:41:54.755] invokeRestart("muffleWarning") [18:41:54.755] } [18:41:54.755] else if (inherits(cond, "condition")) { [18:41:54.755] if (!is.null(pattern)) { [18:41:54.755] computeRestarts <- base::computeRestarts [18:41:54.755] grepl <- base::grepl [18:41:54.755] restarts <- computeRestarts(cond) [18:41:54.755] for (restart in restarts) { [18:41:54.755] name <- restart$name [18:41:54.755] if (is.null(name)) [18:41:54.755] next [18:41:54.755] if (!grepl(pattern, name)) [18:41:54.755] next [18:41:54.755] invokeRestart(restart) [18:41:54.755] muffled <- TRUE [18:41:54.755] break [18:41:54.755] } [18:41:54.755] } [18:41:54.755] } [18:41:54.755] invisible(muffled) [18:41:54.755] } [18:41:54.755] muffleCondition(cond, pattern = "^muffle") [18:41:54.755] } [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] if (TRUE) { [18:41:54.755] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.755] { [18:41:54.755] inherits <- base::inherits [18:41:54.755] invokeRestart <- base::invokeRestart [18:41:54.755] is.null <- base::is.null [18:41:54.755] muffled <- FALSE [18:41:54.755] if (inherits(cond, "message")) { [18:41:54.755] muffled <- grepl(pattern, "muffleMessage") [18:41:54.755] if (muffled) [18:41:54.755] invokeRestart("muffleMessage") [18:41:54.755] } [18:41:54.755] else if (inherits(cond, "warning")) { [18:41:54.755] muffled <- grepl(pattern, "muffleWarning") [18:41:54.755] if (muffled) [18:41:54.755] invokeRestart("muffleWarning") [18:41:54.755] } [18:41:54.755] else if (inherits(cond, "condition")) { [18:41:54.755] if (!is.null(pattern)) { [18:41:54.755] computeRestarts <- base::computeRestarts [18:41:54.755] grepl <- base::grepl [18:41:54.755] restarts <- computeRestarts(cond) [18:41:54.755] for (restart in restarts) { [18:41:54.755] name <- restart$name [18:41:54.755] if (is.null(name)) [18:41:54.755] next [18:41:54.755] if (!grepl(pattern, name)) [18:41:54.755] next [18:41:54.755] invokeRestart(restart) [18:41:54.755] muffled <- TRUE [18:41:54.755] break [18:41:54.755] } [18:41:54.755] } [18:41:54.755] } [18:41:54.755] invisible(muffled) [18:41:54.755] } [18:41:54.755] muffleCondition(cond, pattern = "^muffle") [18:41:54.755] } [18:41:54.755] } [18:41:54.755] } [18:41:54.755] })) [18:41:54.755] }, error = function(ex) { [18:41:54.755] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.755] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.755] ...future.rng), started = ...future.startTime, [18:41:54.755] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.755] version = "1.8"), class = "FutureResult") [18:41:54.755] }, finally = { [18:41:54.755] if (!identical(...future.workdir, getwd())) [18:41:54.755] setwd(...future.workdir) [18:41:54.755] { [18:41:54.755] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.755] ...future.oldOptions$nwarnings <- NULL [18:41:54.755] } [18:41:54.755] base::options(...future.oldOptions) [18:41:54.755] if (.Platform$OS.type == "windows") { [18:41:54.755] old_names <- names(...future.oldEnvVars) [18:41:54.755] envs <- base::Sys.getenv() [18:41:54.755] names <- names(envs) [18:41:54.755] common <- intersect(names, old_names) [18:41:54.755] added <- setdiff(names, old_names) [18:41:54.755] removed <- setdiff(old_names, names) [18:41:54.755] changed <- common[...future.oldEnvVars[common] != [18:41:54.755] envs[common]] [18:41:54.755] NAMES <- toupper(changed) [18:41:54.755] args <- list() [18:41:54.755] for (kk in seq_along(NAMES)) { [18:41:54.755] name <- changed[[kk]] [18:41:54.755] NAME <- NAMES[[kk]] [18:41:54.755] if (name != NAME && is.element(NAME, old_names)) [18:41:54.755] next [18:41:54.755] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.755] } [18:41:54.755] NAMES <- toupper(added) [18:41:54.755] for (kk in seq_along(NAMES)) { [18:41:54.755] name <- added[[kk]] [18:41:54.755] NAME <- NAMES[[kk]] [18:41:54.755] if (name != NAME && is.element(NAME, old_names)) [18:41:54.755] next [18:41:54.755] args[[name]] <- "" [18:41:54.755] } [18:41:54.755] NAMES <- toupper(removed) [18:41:54.755] for (kk in seq_along(NAMES)) { [18:41:54.755] name <- removed[[kk]] [18:41:54.755] NAME <- NAMES[[kk]] [18:41:54.755] if (name != NAME && is.element(NAME, old_names)) [18:41:54.755] next [18:41:54.755] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.755] } [18:41:54.755] if (length(args) > 0) [18:41:54.755] base::do.call(base::Sys.setenv, args = args) [18:41:54.755] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.755] } [18:41:54.755] { [18:41:54.755] if (base::length(...future.futureOptionsAdded) > [18:41:54.755] 0L) { [18:41:54.755] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.755] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.755] base::options(opts) [18:41:54.755] } [18:41:54.755] { [18:41:54.755] { [18:41:54.755] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.755] NULL [18:41:54.755] } [18:41:54.755] options(future.plan = NULL) [18:41:54.755] if (is.na(NA_character_)) [18:41:54.755] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.755] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.755] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.755] .init = FALSE) [18:41:54.755] } [18:41:54.755] } [18:41:54.755] } [18:41:54.755] }) [18:41:54.755] if (TRUE) { [18:41:54.755] base::sink(type = "output", split = FALSE) [18:41:54.755] if (TRUE) { [18:41:54.755] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.755] } [18:41:54.755] else { [18:41:54.755] ...future.result["stdout"] <- base::list(NULL) [18:41:54.755] } [18:41:54.755] base::close(...future.stdout) [18:41:54.755] ...future.stdout <- NULL [18:41:54.755] } [18:41:54.755] ...future.result$conditions <- ...future.conditions [18:41:54.755] ...future.result$finished <- base::Sys.time() [18:41:54.755] ...future.result [18:41:54.755] } [18:41:54.761] Exporting 5 global objects (957 bytes) to cluster node #1 ... [18:41:54.761] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:54.761] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:54.762] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.762] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.762] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... [18:41:54.763] Exporting '...future.elements_ii' (65 bytes) to cluster node #1 ... DONE [18:41:54.763] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.763] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.763] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.764] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.764] Exporting 5 global objects (957 bytes) to cluster node #1 ... DONE [18:41:54.765] MultisessionFuture started [18:41:54.765] - Launch lazy future ... done [18:41:54.765] run() for 'MultisessionFuture' ... done [18:41:54.765] Created future: [18:41:54.782] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.782] - Validating connection of MultisessionFuture [18:41:54.782] - received message: FutureResult [18:41:54.782] - Received FutureResult [18:41:54.783] - Erased future from FutureRegistry [18:41:54.783] result() for ClusterFuture ... [18:41:54.783] - result already collected: FutureResult [18:41:54.783] result() for ClusterFuture ... done [18:41:54.783] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.765] MultisessionFuture: [18:41:54.765] Label: 'future_sapply-2' [18:41:54.765] Expression: [18:41:54.765] { [18:41:54.765] do.call(function(...) { [18:41:54.765] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.765] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.765] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.765] on.exit(options(oopts), add = TRUE) [18:41:54.765] } [18:41:54.765] { [18:41:54.765] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.765] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.765] ...future.FUN(...future.X_jj, ...) [18:41:54.765] }) [18:41:54.765] } [18:41:54.765] }, args = future.call.arguments) [18:41:54.765] } [18:41:54.765] Lazy evaluation: FALSE [18:41:54.765] Asynchronous evaluation: TRUE [18:41:54.765] Local evaluation: TRUE [18:41:54.765] Environment: R_GlobalEnv [18:41:54.765] Capture standard output: TRUE [18:41:54.765] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.765] Globals: 5 objects totaling 494 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 65 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.765] Packages: [18:41:54.765] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.765] Resolved: TRUE [18:41:54.765] Value: [18:41:54.765] Conditions captured: [18:41:54.765] Early signaling: FALSE [18:41:54.765] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.765] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.784] Chunk #2 of 2 ... DONE [18:41:54.784] Launching 2 futures (chunks) ... DONE [18:41:54.784] Resolving 2 futures (chunks) ... [18:41:54.784] resolve() on list ... [18:41:54.784] recursive: 0 [18:41:54.785] length: 2 [18:41:54.785] [18:41:54.789] Future #1 [18:41:54.789] result() for ClusterFuture ... [18:41:54.790] - result already collected: FutureResult [18:41:54.790] result() for ClusterFuture ... done [18:41:54.790] result() for ClusterFuture ... [18:41:54.790] - result already collected: FutureResult [18:41:54.790] result() for ClusterFuture ... done [18:41:54.791] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.791] - nx: 2 [18:41:54.791] - relay: TRUE [18:41:54.791] - stdout: TRUE [18:41:54.791] - signal: TRUE [18:41:54.791] - resignal: FALSE [18:41:54.791] - force: TRUE [18:41:54.792] - relayed: [n=2] FALSE, FALSE [18:41:54.792] - queued futures: [n=2] FALSE, FALSE [18:41:54.792] - until=1 [18:41:54.792] - relaying element #1 [18:41:54.792] result() for ClusterFuture ... [18:41:54.792] - result already collected: FutureResult [18:41:54.793] result() for ClusterFuture ... done [18:41:54.793] result() for ClusterFuture ... [18:41:54.793] - result already collected: FutureResult [18:41:54.793] result() for ClusterFuture ... done [18:41:54.793] result() for ClusterFuture ... [18:41:54.793] - result already collected: FutureResult [18:41:54.794] result() for ClusterFuture ... done [18:41:54.794] result() for ClusterFuture ... [18:41:54.794] - result already collected: FutureResult [18:41:54.794] result() for ClusterFuture ... done [18:41:54.794] - relayed: [n=2] TRUE, FALSE [18:41:54.794] - queued futures: [n=2] TRUE, FALSE [18:41:54.794] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.795] length: 1 (resolved future 1) [18:41:54.795] Future #2 [18:41:54.795] result() for ClusterFuture ... [18:41:54.795] - result already collected: FutureResult [18:41:54.795] result() for ClusterFuture ... done [18:41:54.795] result() for ClusterFuture ... [18:41:54.796] - result already collected: FutureResult [18:41:54.796] result() for ClusterFuture ... done [18:41:54.796] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.796] - nx: 2 [18:41:54.796] - relay: TRUE [18:41:54.796] - stdout: TRUE [18:41:54.797] - signal: TRUE [18:41:54.797] - resignal: FALSE [18:41:54.797] - force: TRUE [18:41:54.797] - relayed: [n=2] TRUE, FALSE [18:41:54.797] - queued futures: [n=2] TRUE, FALSE [18:41:54.797] - until=2 [18:41:54.797] - relaying element #2 [18:41:54.798] result() for ClusterFuture ... [18:41:54.798] - result already collected: FutureResult [18:41:54.798] result() for ClusterFuture ... done [18:41:54.798] result() for ClusterFuture ... [18:41:54.798] - result already collected: FutureResult [18:41:54.798] result() for ClusterFuture ... done [18:41:54.799] result() for ClusterFuture ... [18:41:54.799] - result already collected: FutureResult [18:41:54.799] result() for ClusterFuture ... done [18:41:54.799] result() for ClusterFuture ... [18:41:54.799] - result already collected: FutureResult [18:41:54.799] result() for ClusterFuture ... done [18:41:54.799] - relayed: [n=2] TRUE, TRUE [18:41:54.800] - queued futures: [n=2] TRUE, TRUE [18:41:54.800] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.800] length: 0 (resolved future 2) [18:41:54.800] Relaying remaining futures [18:41:54.800] signalConditionsASAP(NULL, pos=0) ... [18:41:54.800] - nx: 2 [18:41:54.801] - relay: TRUE [18:41:54.801] - stdout: TRUE [18:41:54.801] - signal: TRUE [18:41:54.801] - resignal: FALSE [18:41:54.801] - force: TRUE [18:41:54.801] - relayed: [n=2] TRUE, TRUE [18:41:54.801] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.802] - relayed: [n=2] TRUE, TRUE [18:41:54.802] - queued futures: [n=2] TRUE, TRUE [18:41:54.802] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.802] resolve() on list ... DONE [18:41:54.802] result() for ClusterFuture ... [18:41:54.803] - result already collected: FutureResult [18:41:54.803] result() for ClusterFuture ... done [18:41:54.803] result() for ClusterFuture ... [18:41:54.803] - result already collected: FutureResult [18:41:54.803] result() for ClusterFuture ... done [18:41:54.803] result() for ClusterFuture ... [18:41:54.803] - result already collected: FutureResult [18:41:54.804] result() for ClusterFuture ... done [18:41:54.804] result() for ClusterFuture ... [18:41:54.804] - result already collected: FutureResult [18:41:54.804] result() for ClusterFuture ... done [18:41:54.804] - Number of value chunks collected: 2 [18:41:54.804] Resolving 2 futures (chunks) ... DONE [18:41:54.805] Reducing values from 2 chunks ... [18:41:54.805] - Number of values collected after concatenation: 3 [18:41:54.805] - Number of values expected: 3 [18:41:54.805] Reducing values from 2 chunks ... DONE [18:41:54.805] future_lapply() ... DONE List of 2 $ y0: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" $ y1: Named chr [1:3] "a" "b" "c" ..- attr(*, "names")= chr [1:3] "a" "b" "c" [18:41:54.807] future_lapply() ... [18:41:54.810] Number of chunks: 2 [18:41:54.810] getGlobalsAndPackagesXApply() ... [18:41:54.810] - future.globals: TRUE [18:41:54.810] getGlobalsAndPackages() ... [18:41:54.811] Searching for globals... [18:41:54.812] - globals found: [1] 'FUN' [18:41:54.812] Searching for globals ... DONE [18:41:54.812] Resolving globals: FALSE [18:41:54.812] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:54.813] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:54.813] - globals: [1] 'FUN' [18:41:54.813] [18:41:54.813] getGlobalsAndPackages() ... DONE [18:41:54.814] - globals found/used: [n=1] 'FUN' [18:41:54.814] - needed namespaces: [n=0] [18:41:54.814] Finding globals ... DONE [18:41:54.814] - use_args: TRUE [18:41:54.814] - Getting '...' globals ... [18:41:54.815] resolve() on list ... [18:41:54.815] recursive: 0 [18:41:54.815] length: 1 [18:41:54.815] elements: '...' [18:41:54.815] length: 0 (resolved future 1) [18:41:54.815] resolve() on list ... DONE [18:41:54.816] - '...' content: [n=0] [18:41:54.816] List of 1 [18:41:54.816] $ ...: list() [18:41:54.816] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.816] - attr(*, "where")=List of 1 [18:41:54.816] ..$ ...: [18:41:54.816] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.816] - attr(*, "resolved")= logi TRUE [18:41:54.816] - attr(*, "total_size")= num NA [18:41:54.819] - Getting '...' globals ... DONE [18:41:54.819] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.819] List of 2 [18:41:54.819] $ ...future.FUN:function (x) [18:41:54.819] $ ... : list() [18:41:54.819] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.819] - attr(*, "where")=List of 2 [18:41:54.819] ..$ ...future.FUN: [18:41:54.819] ..$ ... : [18:41:54.819] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.819] - attr(*, "resolved")= logi FALSE [18:41:54.819] - attr(*, "total_size")= int 4910 [18:41:54.822] Packages to be attached in all futures: [n=0] [18:41:54.823] getGlobalsAndPackagesXApply() ... DONE [18:41:54.823] Number of futures (= number of chunks): 2 [18:41:54.823] Launching 2 futures (chunks) ... [18:41:54.823] Chunk #1 of 2 ... [18:41:54.823] - Finding globals in 'X' for chunk #1 ... [18:41:54.824] getGlobalsAndPackages() ... [18:41:54.824] Searching for globals... [18:41:54.824] [18:41:54.824] Searching for globals ... DONE [18:41:54.824] - globals: [0] [18:41:54.825] getGlobalsAndPackages() ... DONE [18:41:54.825] + additional globals found: [n=0] [18:41:54.825] + additional namespaces needed: [n=0] [18:41:54.825] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.825] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.825] - seeds: [18:41:54.826] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.826] getGlobalsAndPackages() ... [18:41:54.826] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.826] Resolving globals: FALSE [18:41:54.826] Tweak future expression to call with '...' arguments ... [18:41:54.826] { [18:41:54.826] do.call(function(...) { [18:41:54.826] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.826] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.826] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.826] on.exit(options(oopts), add = TRUE) [18:41:54.826] } [18:41:54.826] { [18:41:54.826] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.826] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.826] ...future.FUN(...future.X_jj, ...) [18:41:54.826] }) [18:41:54.826] } [18:41:54.826] }, args = future.call.arguments) [18:41:54.826] } [18:41:54.827] Tweak future expression to call with '...' arguments ... DONE [18:41:54.827] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.828] [18:41:54.828] getGlobalsAndPackages() ... DONE [18:41:54.828] run() for 'Future' ... [18:41:54.828] - state: 'created' [18:41:54.828] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.844] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.844] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.844] - Field: 'node' [18:41:54.844] - Field: 'label' [18:41:54.844] - Field: 'local' [18:41:54.845] - Field: 'owner' [18:41:54.845] - Field: 'envir' [18:41:54.845] - Field: 'workers' [18:41:54.845] - Field: 'packages' [18:41:54.845] - Field: 'gc' [18:41:54.845] - Field: 'conditions' [18:41:54.846] - Field: 'persistent' [18:41:54.846] - Field: 'expr' [18:41:54.846] - Field: 'uuid' [18:41:54.846] - Field: 'seed' [18:41:54.846] - Field: 'version' [18:41:54.846] - Field: 'result' [18:41:54.847] - Field: 'asynchronous' [18:41:54.847] - Field: 'calls' [18:41:54.847] - Field: 'globals' [18:41:54.847] - Field: 'stdout' [18:41:54.847] - Field: 'earlySignal' [18:41:54.848] - Field: 'lazy' [18:41:54.848] - Field: 'state' [18:41:54.848] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.848] - Launch lazy future ... [18:41:54.848] Packages needed by the future expression (n = 0): [18:41:54.849] Packages needed by future strategies (n = 0): [18:41:54.849] { [18:41:54.849] { [18:41:54.849] { [18:41:54.849] ...future.startTime <- base::Sys.time() [18:41:54.849] { [18:41:54.849] { [18:41:54.849] { [18:41:54.849] { [18:41:54.849] base::local({ [18:41:54.849] has_future <- base::requireNamespace("future", [18:41:54.849] quietly = TRUE) [18:41:54.849] if (has_future) { [18:41:54.849] ns <- base::getNamespace("future") [18:41:54.849] version <- ns[[".package"]][["version"]] [18:41:54.849] if (is.null(version)) [18:41:54.849] version <- utils::packageVersion("future") [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] version <- NULL [18:41:54.849] } [18:41:54.849] if (!has_future || version < "1.8.0") { [18:41:54.849] info <- base::c(r_version = base::gsub("R version ", [18:41:54.849] "", base::R.version$version.string), [18:41:54.849] platform = base::sprintf("%s (%s-bit)", [18:41:54.849] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.849] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.849] "release", "version")], collapse = " "), [18:41:54.849] hostname = base::Sys.info()[["nodename"]]) [18:41:54.849] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.849] info) [18:41:54.849] info <- base::paste(info, collapse = "; ") [18:41:54.849] if (!has_future) { [18:41:54.849] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.849] info) [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.849] info, version) [18:41:54.849] } [18:41:54.849] base::stop(msg) [18:41:54.849] } [18:41:54.849] }) [18:41:54.849] } [18:41:54.849] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.849] base::options(mc.cores = 1L) [18:41:54.849] } [18:41:54.849] ...future.strategy.old <- future::plan("list") [18:41:54.849] options(future.plan = NULL) [18:41:54.849] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.849] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.849] } [18:41:54.849] ...future.workdir <- getwd() [18:41:54.849] } [18:41:54.849] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.849] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.849] } [18:41:54.849] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.849] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.849] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.849] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.849] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.849] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.849] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.849] base::names(...future.oldOptions)) [18:41:54.849] } [18:41:54.849] if (FALSE) { [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] if (TRUE) { [18:41:54.849] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.849] open = "w") [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.849] windows = "NUL", "/dev/null"), open = "w") [18:41:54.849] } [18:41:54.849] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.849] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.849] base::sink(type = "output", split = FALSE) [18:41:54.849] base::close(...future.stdout) [18:41:54.849] }, add = TRUE) [18:41:54.849] } [18:41:54.849] ...future.frame <- base::sys.nframe() [18:41:54.849] ...future.conditions <- base::list() [18:41:54.849] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.849] if (FALSE) { [18:41:54.849] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.849] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.849] } [18:41:54.849] ...future.result <- base::tryCatch({ [18:41:54.849] base::withCallingHandlers({ [18:41:54.849] ...future.value <- base::withVisible(base::local({ [18:41:54.849] ...future.makeSendCondition <- base::local({ [18:41:54.849] sendCondition <- NULL [18:41:54.849] function(frame = 1L) { [18:41:54.849] if (is.function(sendCondition)) [18:41:54.849] return(sendCondition) [18:41:54.849] ns <- getNamespace("parallel") [18:41:54.849] if (exists("sendData", mode = "function", [18:41:54.849] envir = ns)) { [18:41:54.849] parallel_sendData <- get("sendData", mode = "function", [18:41:54.849] envir = ns) [18:41:54.849] envir <- sys.frame(frame) [18:41:54.849] master <- NULL [18:41:54.849] while (!identical(envir, .GlobalEnv) && [18:41:54.849] !identical(envir, emptyenv())) { [18:41:54.849] if (exists("master", mode = "list", envir = envir, [18:41:54.849] inherits = FALSE)) { [18:41:54.849] master <- get("master", mode = "list", [18:41:54.849] envir = envir, inherits = FALSE) [18:41:54.849] if (inherits(master, c("SOCKnode", [18:41:54.849] "SOCK0node"))) { [18:41:54.849] sendCondition <<- function(cond) { [18:41:54.849] data <- list(type = "VALUE", value = cond, [18:41:54.849] success = TRUE) [18:41:54.849] parallel_sendData(master, data) [18:41:54.849] } [18:41:54.849] return(sendCondition) [18:41:54.849] } [18:41:54.849] } [18:41:54.849] frame <- frame + 1L [18:41:54.849] envir <- sys.frame(frame) [18:41:54.849] } [18:41:54.849] } [18:41:54.849] sendCondition <<- function(cond) NULL [18:41:54.849] } [18:41:54.849] }) [18:41:54.849] withCallingHandlers({ [18:41:54.849] { [18:41:54.849] do.call(function(...) { [18:41:54.849] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.849] if (!identical(...future.globals.maxSize.org, [18:41:54.849] ...future.globals.maxSize)) { [18:41:54.849] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.849] on.exit(options(oopts), add = TRUE) [18:41:54.849] } [18:41:54.849] { [18:41:54.849] lapply(seq_along(...future.elements_ii), [18:41:54.849] FUN = function(jj) { [18:41:54.849] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.849] ...future.FUN(...future.X_jj, ...) [18:41:54.849] }) [18:41:54.849] } [18:41:54.849] }, args = future.call.arguments) [18:41:54.849] } [18:41:54.849] }, immediateCondition = function(cond) { [18:41:54.849] sendCondition <- ...future.makeSendCondition() [18:41:54.849] sendCondition(cond) [18:41:54.849] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.849] { [18:41:54.849] inherits <- base::inherits [18:41:54.849] invokeRestart <- base::invokeRestart [18:41:54.849] is.null <- base::is.null [18:41:54.849] muffled <- FALSE [18:41:54.849] if (inherits(cond, "message")) { [18:41:54.849] muffled <- grepl(pattern, "muffleMessage") [18:41:54.849] if (muffled) [18:41:54.849] invokeRestart("muffleMessage") [18:41:54.849] } [18:41:54.849] else if (inherits(cond, "warning")) { [18:41:54.849] muffled <- grepl(pattern, "muffleWarning") [18:41:54.849] if (muffled) [18:41:54.849] invokeRestart("muffleWarning") [18:41:54.849] } [18:41:54.849] else if (inherits(cond, "condition")) { [18:41:54.849] if (!is.null(pattern)) { [18:41:54.849] computeRestarts <- base::computeRestarts [18:41:54.849] grepl <- base::grepl [18:41:54.849] restarts <- computeRestarts(cond) [18:41:54.849] for (restart in restarts) { [18:41:54.849] name <- restart$name [18:41:54.849] if (is.null(name)) [18:41:54.849] next [18:41:54.849] if (!grepl(pattern, name)) [18:41:54.849] next [18:41:54.849] invokeRestart(restart) [18:41:54.849] muffled <- TRUE [18:41:54.849] break [18:41:54.849] } [18:41:54.849] } [18:41:54.849] } [18:41:54.849] invisible(muffled) [18:41:54.849] } [18:41:54.849] muffleCondition(cond) [18:41:54.849] }) [18:41:54.849] })) [18:41:54.849] future::FutureResult(value = ...future.value$value, [18:41:54.849] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.849] ...future.rng), globalenv = if (FALSE) [18:41:54.849] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.849] ...future.globalenv.names)) [18:41:54.849] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.849] }, condition = base::local({ [18:41:54.849] c <- base::c [18:41:54.849] inherits <- base::inherits [18:41:54.849] invokeRestart <- base::invokeRestart [18:41:54.849] length <- base::length [18:41:54.849] list <- base::list [18:41:54.849] seq.int <- base::seq.int [18:41:54.849] signalCondition <- base::signalCondition [18:41:54.849] sys.calls <- base::sys.calls [18:41:54.849] `[[` <- base::`[[` [18:41:54.849] `+` <- base::`+` [18:41:54.849] `<<-` <- base::`<<-` [18:41:54.849] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.849] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.849] 3L)] [18:41:54.849] } [18:41:54.849] function(cond) { [18:41:54.849] is_error <- inherits(cond, "error") [18:41:54.849] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.849] NULL) [18:41:54.849] if (is_error) { [18:41:54.849] sessionInformation <- function() { [18:41:54.849] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.849] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.849] search = base::search(), system = base::Sys.info()) [18:41:54.849] } [18:41:54.849] ...future.conditions[[length(...future.conditions) + [18:41:54.849] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.849] cond$call), session = sessionInformation(), [18:41:54.849] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.849] signalCondition(cond) [18:41:54.849] } [18:41:54.849] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.849] "immediateCondition"))) { [18:41:54.849] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.849] ...future.conditions[[length(...future.conditions) + [18:41:54.849] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.849] if (TRUE && !signal) { [18:41:54.849] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.849] { [18:41:54.849] inherits <- base::inherits [18:41:54.849] invokeRestart <- base::invokeRestart [18:41:54.849] is.null <- base::is.null [18:41:54.849] muffled <- FALSE [18:41:54.849] if (inherits(cond, "message")) { [18:41:54.849] muffled <- grepl(pattern, "muffleMessage") [18:41:54.849] if (muffled) [18:41:54.849] invokeRestart("muffleMessage") [18:41:54.849] } [18:41:54.849] else if (inherits(cond, "warning")) { [18:41:54.849] muffled <- grepl(pattern, "muffleWarning") [18:41:54.849] if (muffled) [18:41:54.849] invokeRestart("muffleWarning") [18:41:54.849] } [18:41:54.849] else if (inherits(cond, "condition")) { [18:41:54.849] if (!is.null(pattern)) { [18:41:54.849] computeRestarts <- base::computeRestarts [18:41:54.849] grepl <- base::grepl [18:41:54.849] restarts <- computeRestarts(cond) [18:41:54.849] for (restart in restarts) { [18:41:54.849] name <- restart$name [18:41:54.849] if (is.null(name)) [18:41:54.849] next [18:41:54.849] if (!grepl(pattern, name)) [18:41:54.849] next [18:41:54.849] invokeRestart(restart) [18:41:54.849] muffled <- TRUE [18:41:54.849] break [18:41:54.849] } [18:41:54.849] } [18:41:54.849] } [18:41:54.849] invisible(muffled) [18:41:54.849] } [18:41:54.849] muffleCondition(cond, pattern = "^muffle") [18:41:54.849] } [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] if (TRUE) { [18:41:54.849] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.849] { [18:41:54.849] inherits <- base::inherits [18:41:54.849] invokeRestart <- base::invokeRestart [18:41:54.849] is.null <- base::is.null [18:41:54.849] muffled <- FALSE [18:41:54.849] if (inherits(cond, "message")) { [18:41:54.849] muffled <- grepl(pattern, "muffleMessage") [18:41:54.849] if (muffled) [18:41:54.849] invokeRestart("muffleMessage") [18:41:54.849] } [18:41:54.849] else if (inherits(cond, "warning")) { [18:41:54.849] muffled <- grepl(pattern, "muffleWarning") [18:41:54.849] if (muffled) [18:41:54.849] invokeRestart("muffleWarning") [18:41:54.849] } [18:41:54.849] else if (inherits(cond, "condition")) { [18:41:54.849] if (!is.null(pattern)) { [18:41:54.849] computeRestarts <- base::computeRestarts [18:41:54.849] grepl <- base::grepl [18:41:54.849] restarts <- computeRestarts(cond) [18:41:54.849] for (restart in restarts) { [18:41:54.849] name <- restart$name [18:41:54.849] if (is.null(name)) [18:41:54.849] next [18:41:54.849] if (!grepl(pattern, name)) [18:41:54.849] next [18:41:54.849] invokeRestart(restart) [18:41:54.849] muffled <- TRUE [18:41:54.849] break [18:41:54.849] } [18:41:54.849] } [18:41:54.849] } [18:41:54.849] invisible(muffled) [18:41:54.849] } [18:41:54.849] muffleCondition(cond, pattern = "^muffle") [18:41:54.849] } [18:41:54.849] } [18:41:54.849] } [18:41:54.849] })) [18:41:54.849] }, error = function(ex) { [18:41:54.849] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.849] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.849] ...future.rng), started = ...future.startTime, [18:41:54.849] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.849] version = "1.8"), class = "FutureResult") [18:41:54.849] }, finally = { [18:41:54.849] if (!identical(...future.workdir, getwd())) [18:41:54.849] setwd(...future.workdir) [18:41:54.849] { [18:41:54.849] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.849] ...future.oldOptions$nwarnings <- NULL [18:41:54.849] } [18:41:54.849] base::options(...future.oldOptions) [18:41:54.849] if (.Platform$OS.type == "windows") { [18:41:54.849] old_names <- names(...future.oldEnvVars) [18:41:54.849] envs <- base::Sys.getenv() [18:41:54.849] names <- names(envs) [18:41:54.849] common <- intersect(names, old_names) [18:41:54.849] added <- setdiff(names, old_names) [18:41:54.849] removed <- setdiff(old_names, names) [18:41:54.849] changed <- common[...future.oldEnvVars[common] != [18:41:54.849] envs[common]] [18:41:54.849] NAMES <- toupper(changed) [18:41:54.849] args <- list() [18:41:54.849] for (kk in seq_along(NAMES)) { [18:41:54.849] name <- changed[[kk]] [18:41:54.849] NAME <- NAMES[[kk]] [18:41:54.849] if (name != NAME && is.element(NAME, old_names)) [18:41:54.849] next [18:41:54.849] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.849] } [18:41:54.849] NAMES <- toupper(added) [18:41:54.849] for (kk in seq_along(NAMES)) { [18:41:54.849] name <- added[[kk]] [18:41:54.849] NAME <- NAMES[[kk]] [18:41:54.849] if (name != NAME && is.element(NAME, old_names)) [18:41:54.849] next [18:41:54.849] args[[name]] <- "" [18:41:54.849] } [18:41:54.849] NAMES <- toupper(removed) [18:41:54.849] for (kk in seq_along(NAMES)) { [18:41:54.849] name <- removed[[kk]] [18:41:54.849] NAME <- NAMES[[kk]] [18:41:54.849] if (name != NAME && is.element(NAME, old_names)) [18:41:54.849] next [18:41:54.849] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.849] } [18:41:54.849] if (length(args) > 0) [18:41:54.849] base::do.call(base::Sys.setenv, args = args) [18:41:54.849] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.849] } [18:41:54.849] { [18:41:54.849] if (base::length(...future.futureOptionsAdded) > [18:41:54.849] 0L) { [18:41:54.849] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.849] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.849] base::options(opts) [18:41:54.849] } [18:41:54.849] { [18:41:54.849] { [18:41:54.849] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.849] NULL [18:41:54.849] } [18:41:54.849] options(future.plan = NULL) [18:41:54.849] if (is.na(NA_character_)) [18:41:54.849] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.849] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.849] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.849] .init = FALSE) [18:41:54.849] } [18:41:54.849] } [18:41:54.849] } [18:41:54.849] }) [18:41:54.849] if (TRUE) { [18:41:54.849] base::sink(type = "output", split = FALSE) [18:41:54.849] if (TRUE) { [18:41:54.849] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.849] } [18:41:54.849] else { [18:41:54.849] ...future.result["stdout"] <- base::list(NULL) [18:41:54.849] } [18:41:54.849] base::close(...future.stdout) [18:41:54.849] ...future.stdout <- NULL [18:41:54.849] } [18:41:54.849] ...future.result$conditions <- ...future.conditions [18:41:54.849] ...future.result$finished <- base::Sys.time() [18:41:54.849] ...future.result [18:41:54.849] } [18:41:54.854] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:54.855] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.855] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.855] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.856] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.856] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:54.856] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:54.857] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.857] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.857] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.858] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.858] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:54.859] MultisessionFuture started [18:41:54.859] - Launch lazy future ... done [18:41:54.859] run() for 'MultisessionFuture' ... done [18:41:54.859] Created future: [18:41:54.875] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.876] - Validating connection of MultisessionFuture [18:41:54.876] - received message: FutureResult [18:41:54.876] - Received FutureResult [18:41:54.876] - Erased future from FutureRegistry [18:41:54.877] result() for ClusterFuture ... [18:41:54.877] - result already collected: FutureResult [18:41:54.877] result() for ClusterFuture ... done [18:41:54.877] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.859] MultisessionFuture: [18:41:54.859] Label: 'future_sapply-1' [18:41:54.859] Expression: [18:41:54.859] { [18:41:54.859] do.call(function(...) { [18:41:54.859] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.859] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.859] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.859] on.exit(options(oopts), add = TRUE) [18:41:54.859] } [18:41:54.859] { [18:41:54.859] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.859] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.859] ...future.FUN(...future.X_jj, ...) [18:41:54.859] }) [18:41:54.859] } [18:41:54.859] }, args = future.call.arguments) [18:41:54.859] } [18:41:54.859] Lazy evaluation: FALSE [18:41:54.859] Asynchronous evaluation: TRUE [18:41:54.859] Local evaluation: TRUE [18:41:54.859] Environment: R_GlobalEnv [18:41:54.859] Capture standard output: TRUE [18:41:54.859] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.859] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.859] Packages: [18:41:54.859] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.859] Resolved: TRUE [18:41:54.859] Value: [18:41:54.859] Conditions captured: [18:41:54.859] Early signaling: FALSE [18:41:54.859] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.859] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.878] Chunk #1 of 2 ... DONE [18:41:54.878] Chunk #2 of 2 ... [18:41:54.878] - Finding globals in 'X' for chunk #2 ... [18:41:54.878] getGlobalsAndPackages() ... [18:41:54.878] Searching for globals... [18:41:54.879] [18:41:54.879] Searching for globals ... DONE [18:41:54.879] - globals: [0] [18:41:54.879] getGlobalsAndPackages() ... DONE [18:41:54.879] + additional globals found: [n=0] [18:41:54.879] + additional namespaces needed: [n=0] [18:41:54.880] - Finding globals in 'X' for chunk #2 ... DONE [18:41:54.880] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.880] - seeds: [18:41:54.880] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.880] getGlobalsAndPackages() ... [18:41:54.880] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.881] Resolving globals: FALSE [18:41:54.881] Tweak future expression to call with '...' arguments ... [18:41:54.881] { [18:41:54.881] do.call(function(...) { [18:41:54.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.881] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.881] on.exit(options(oopts), add = TRUE) [18:41:54.881] } [18:41:54.881] { [18:41:54.881] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.881] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.881] ...future.FUN(...future.X_jj, ...) [18:41:54.881] }) [18:41:54.881] } [18:41:54.881] }, args = future.call.arguments) [18:41:54.881] } [18:41:54.881] Tweak future expression to call with '...' arguments ... DONE [18:41:54.882] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.882] [18:41:54.882] getGlobalsAndPackages() ... DONE [18:41:54.883] run() for 'Future' ... [18:41:54.883] - state: 'created' [18:41:54.883] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.898] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.898] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.899] - Field: 'node' [18:41:54.899] - Field: 'label' [18:41:54.899] - Field: 'local' [18:41:54.899] - Field: 'owner' [18:41:54.899] - Field: 'envir' [18:41:54.900] - Field: 'workers' [18:41:54.900] - Field: 'packages' [18:41:54.900] - Field: 'gc' [18:41:54.900] - Field: 'conditions' [18:41:54.900] - Field: 'persistent' [18:41:54.900] - Field: 'expr' [18:41:54.901] - Field: 'uuid' [18:41:54.901] - Field: 'seed' [18:41:54.901] - Field: 'version' [18:41:54.901] - Field: 'result' [18:41:54.901] - Field: 'asynchronous' [18:41:54.902] - Field: 'calls' [18:41:54.902] - Field: 'globals' [18:41:54.902] - Field: 'stdout' [18:41:54.902] - Field: 'earlySignal' [18:41:54.902] - Field: 'lazy' [18:41:54.902] - Field: 'state' [18:41:54.903] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:54.903] - Launch lazy future ... [18:41:54.903] Packages needed by the future expression (n = 0): [18:41:54.903] Packages needed by future strategies (n = 0): [18:41:54.904] { [18:41:54.904] { [18:41:54.904] { [18:41:54.904] ...future.startTime <- base::Sys.time() [18:41:54.904] { [18:41:54.904] { [18:41:54.904] { [18:41:54.904] { [18:41:54.904] base::local({ [18:41:54.904] has_future <- base::requireNamespace("future", [18:41:54.904] quietly = TRUE) [18:41:54.904] if (has_future) { [18:41:54.904] ns <- base::getNamespace("future") [18:41:54.904] version <- ns[[".package"]][["version"]] [18:41:54.904] if (is.null(version)) [18:41:54.904] version <- utils::packageVersion("future") [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] version <- NULL [18:41:54.904] } [18:41:54.904] if (!has_future || version < "1.8.0") { [18:41:54.904] info <- base::c(r_version = base::gsub("R version ", [18:41:54.904] "", base::R.version$version.string), [18:41:54.904] platform = base::sprintf("%s (%s-bit)", [18:41:54.904] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:54.904] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:54.904] "release", "version")], collapse = " "), [18:41:54.904] hostname = base::Sys.info()[["nodename"]]) [18:41:54.904] info <- base::sprintf("%s: %s", base::names(info), [18:41:54.904] info) [18:41:54.904] info <- base::paste(info, collapse = "; ") [18:41:54.904] if (!has_future) { [18:41:54.904] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:54.904] info) [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:54.904] info, version) [18:41:54.904] } [18:41:54.904] base::stop(msg) [18:41:54.904] } [18:41:54.904] }) [18:41:54.904] } [18:41:54.904] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:54.904] base::options(mc.cores = 1L) [18:41:54.904] } [18:41:54.904] ...future.strategy.old <- future::plan("list") [18:41:54.904] options(future.plan = NULL) [18:41:54.904] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.904] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:54.904] } [18:41:54.904] ...future.workdir <- getwd() [18:41:54.904] } [18:41:54.904] ...future.oldOptions <- base::as.list(base::.Options) [18:41:54.904] ...future.oldEnvVars <- base::Sys.getenv() [18:41:54.904] } [18:41:54.904] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:54.904] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:54.904] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:54.904] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:54.904] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:54.904] future.stdout.windows.reencode = NULL, width = 80L) [18:41:54.904] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:54.904] base::names(...future.oldOptions)) [18:41:54.904] } [18:41:54.904] if (FALSE) { [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] if (TRUE) { [18:41:54.904] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:54.904] open = "w") [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:54.904] windows = "NUL", "/dev/null"), open = "w") [18:41:54.904] } [18:41:54.904] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:54.904] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:54.904] base::sink(type = "output", split = FALSE) [18:41:54.904] base::close(...future.stdout) [18:41:54.904] }, add = TRUE) [18:41:54.904] } [18:41:54.904] ...future.frame <- base::sys.nframe() [18:41:54.904] ...future.conditions <- base::list() [18:41:54.904] ...future.rng <- base::globalenv()$.Random.seed [18:41:54.904] if (FALSE) { [18:41:54.904] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:54.904] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:54.904] } [18:41:54.904] ...future.result <- base::tryCatch({ [18:41:54.904] base::withCallingHandlers({ [18:41:54.904] ...future.value <- base::withVisible(base::local({ [18:41:54.904] ...future.makeSendCondition <- base::local({ [18:41:54.904] sendCondition <- NULL [18:41:54.904] function(frame = 1L) { [18:41:54.904] if (is.function(sendCondition)) [18:41:54.904] return(sendCondition) [18:41:54.904] ns <- getNamespace("parallel") [18:41:54.904] if (exists("sendData", mode = "function", [18:41:54.904] envir = ns)) { [18:41:54.904] parallel_sendData <- get("sendData", mode = "function", [18:41:54.904] envir = ns) [18:41:54.904] envir <- sys.frame(frame) [18:41:54.904] master <- NULL [18:41:54.904] while (!identical(envir, .GlobalEnv) && [18:41:54.904] !identical(envir, emptyenv())) { [18:41:54.904] if (exists("master", mode = "list", envir = envir, [18:41:54.904] inherits = FALSE)) { [18:41:54.904] master <- get("master", mode = "list", [18:41:54.904] envir = envir, inherits = FALSE) [18:41:54.904] if (inherits(master, c("SOCKnode", [18:41:54.904] "SOCK0node"))) { [18:41:54.904] sendCondition <<- function(cond) { [18:41:54.904] data <- list(type = "VALUE", value = cond, [18:41:54.904] success = TRUE) [18:41:54.904] parallel_sendData(master, data) [18:41:54.904] } [18:41:54.904] return(sendCondition) [18:41:54.904] } [18:41:54.904] } [18:41:54.904] frame <- frame + 1L [18:41:54.904] envir <- sys.frame(frame) [18:41:54.904] } [18:41:54.904] } [18:41:54.904] sendCondition <<- function(cond) NULL [18:41:54.904] } [18:41:54.904] }) [18:41:54.904] withCallingHandlers({ [18:41:54.904] { [18:41:54.904] do.call(function(...) { [18:41:54.904] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.904] if (!identical(...future.globals.maxSize.org, [18:41:54.904] ...future.globals.maxSize)) { [18:41:54.904] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.904] on.exit(options(oopts), add = TRUE) [18:41:54.904] } [18:41:54.904] { [18:41:54.904] lapply(seq_along(...future.elements_ii), [18:41:54.904] FUN = function(jj) { [18:41:54.904] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.904] ...future.FUN(...future.X_jj, ...) [18:41:54.904] }) [18:41:54.904] } [18:41:54.904] }, args = future.call.arguments) [18:41:54.904] } [18:41:54.904] }, immediateCondition = function(cond) { [18:41:54.904] sendCondition <- ...future.makeSendCondition() [18:41:54.904] sendCondition(cond) [18:41:54.904] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.904] { [18:41:54.904] inherits <- base::inherits [18:41:54.904] invokeRestart <- base::invokeRestart [18:41:54.904] is.null <- base::is.null [18:41:54.904] muffled <- FALSE [18:41:54.904] if (inherits(cond, "message")) { [18:41:54.904] muffled <- grepl(pattern, "muffleMessage") [18:41:54.904] if (muffled) [18:41:54.904] invokeRestart("muffleMessage") [18:41:54.904] } [18:41:54.904] else if (inherits(cond, "warning")) { [18:41:54.904] muffled <- grepl(pattern, "muffleWarning") [18:41:54.904] if (muffled) [18:41:54.904] invokeRestart("muffleWarning") [18:41:54.904] } [18:41:54.904] else if (inherits(cond, "condition")) { [18:41:54.904] if (!is.null(pattern)) { [18:41:54.904] computeRestarts <- base::computeRestarts [18:41:54.904] grepl <- base::grepl [18:41:54.904] restarts <- computeRestarts(cond) [18:41:54.904] for (restart in restarts) { [18:41:54.904] name <- restart$name [18:41:54.904] if (is.null(name)) [18:41:54.904] next [18:41:54.904] if (!grepl(pattern, name)) [18:41:54.904] next [18:41:54.904] invokeRestart(restart) [18:41:54.904] muffled <- TRUE [18:41:54.904] break [18:41:54.904] } [18:41:54.904] } [18:41:54.904] } [18:41:54.904] invisible(muffled) [18:41:54.904] } [18:41:54.904] muffleCondition(cond) [18:41:54.904] }) [18:41:54.904] })) [18:41:54.904] future::FutureResult(value = ...future.value$value, [18:41:54.904] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.904] ...future.rng), globalenv = if (FALSE) [18:41:54.904] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:54.904] ...future.globalenv.names)) [18:41:54.904] else NULL, started = ...future.startTime, version = "1.8") [18:41:54.904] }, condition = base::local({ [18:41:54.904] c <- base::c [18:41:54.904] inherits <- base::inherits [18:41:54.904] invokeRestart <- base::invokeRestart [18:41:54.904] length <- base::length [18:41:54.904] list <- base::list [18:41:54.904] seq.int <- base::seq.int [18:41:54.904] signalCondition <- base::signalCondition [18:41:54.904] sys.calls <- base::sys.calls [18:41:54.904] `[[` <- base::`[[` [18:41:54.904] `+` <- base::`+` [18:41:54.904] `<<-` <- base::`<<-` [18:41:54.904] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:54.904] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:54.904] 3L)] [18:41:54.904] } [18:41:54.904] function(cond) { [18:41:54.904] is_error <- inherits(cond, "error") [18:41:54.904] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:54.904] NULL) [18:41:54.904] if (is_error) { [18:41:54.904] sessionInformation <- function() { [18:41:54.904] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:54.904] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:54.904] search = base::search(), system = base::Sys.info()) [18:41:54.904] } [18:41:54.904] ...future.conditions[[length(...future.conditions) + [18:41:54.904] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:54.904] cond$call), session = sessionInformation(), [18:41:54.904] timestamp = base::Sys.time(), signaled = 0L) [18:41:54.904] signalCondition(cond) [18:41:54.904] } [18:41:54.904] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:54.904] "immediateCondition"))) { [18:41:54.904] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:54.904] ...future.conditions[[length(...future.conditions) + [18:41:54.904] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:54.904] if (TRUE && !signal) { [18:41:54.904] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.904] { [18:41:54.904] inherits <- base::inherits [18:41:54.904] invokeRestart <- base::invokeRestart [18:41:54.904] is.null <- base::is.null [18:41:54.904] muffled <- FALSE [18:41:54.904] if (inherits(cond, "message")) { [18:41:54.904] muffled <- grepl(pattern, "muffleMessage") [18:41:54.904] if (muffled) [18:41:54.904] invokeRestart("muffleMessage") [18:41:54.904] } [18:41:54.904] else if (inherits(cond, "warning")) { [18:41:54.904] muffled <- grepl(pattern, "muffleWarning") [18:41:54.904] if (muffled) [18:41:54.904] invokeRestart("muffleWarning") [18:41:54.904] } [18:41:54.904] else if (inherits(cond, "condition")) { [18:41:54.904] if (!is.null(pattern)) { [18:41:54.904] computeRestarts <- base::computeRestarts [18:41:54.904] grepl <- base::grepl [18:41:54.904] restarts <- computeRestarts(cond) [18:41:54.904] for (restart in restarts) { [18:41:54.904] name <- restart$name [18:41:54.904] if (is.null(name)) [18:41:54.904] next [18:41:54.904] if (!grepl(pattern, name)) [18:41:54.904] next [18:41:54.904] invokeRestart(restart) [18:41:54.904] muffled <- TRUE [18:41:54.904] break [18:41:54.904] } [18:41:54.904] } [18:41:54.904] } [18:41:54.904] invisible(muffled) [18:41:54.904] } [18:41:54.904] muffleCondition(cond, pattern = "^muffle") [18:41:54.904] } [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] if (TRUE) { [18:41:54.904] muffleCondition <- function (cond, pattern = "^muffle") [18:41:54.904] { [18:41:54.904] inherits <- base::inherits [18:41:54.904] invokeRestart <- base::invokeRestart [18:41:54.904] is.null <- base::is.null [18:41:54.904] muffled <- FALSE [18:41:54.904] if (inherits(cond, "message")) { [18:41:54.904] muffled <- grepl(pattern, "muffleMessage") [18:41:54.904] if (muffled) [18:41:54.904] invokeRestart("muffleMessage") [18:41:54.904] } [18:41:54.904] else if (inherits(cond, "warning")) { [18:41:54.904] muffled <- grepl(pattern, "muffleWarning") [18:41:54.904] if (muffled) [18:41:54.904] invokeRestart("muffleWarning") [18:41:54.904] } [18:41:54.904] else if (inherits(cond, "condition")) { [18:41:54.904] if (!is.null(pattern)) { [18:41:54.904] computeRestarts <- base::computeRestarts [18:41:54.904] grepl <- base::grepl [18:41:54.904] restarts <- computeRestarts(cond) [18:41:54.904] for (restart in restarts) { [18:41:54.904] name <- restart$name [18:41:54.904] if (is.null(name)) [18:41:54.904] next [18:41:54.904] if (!grepl(pattern, name)) [18:41:54.904] next [18:41:54.904] invokeRestart(restart) [18:41:54.904] muffled <- TRUE [18:41:54.904] break [18:41:54.904] } [18:41:54.904] } [18:41:54.904] } [18:41:54.904] invisible(muffled) [18:41:54.904] } [18:41:54.904] muffleCondition(cond, pattern = "^muffle") [18:41:54.904] } [18:41:54.904] } [18:41:54.904] } [18:41:54.904] })) [18:41:54.904] }, error = function(ex) { [18:41:54.904] base::structure(base::list(value = NULL, visible = NULL, [18:41:54.904] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:54.904] ...future.rng), started = ...future.startTime, [18:41:54.904] finished = Sys.time(), session_uuid = NA_character_, [18:41:54.904] version = "1.8"), class = "FutureResult") [18:41:54.904] }, finally = { [18:41:54.904] if (!identical(...future.workdir, getwd())) [18:41:54.904] setwd(...future.workdir) [18:41:54.904] { [18:41:54.904] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:54.904] ...future.oldOptions$nwarnings <- NULL [18:41:54.904] } [18:41:54.904] base::options(...future.oldOptions) [18:41:54.904] if (.Platform$OS.type == "windows") { [18:41:54.904] old_names <- names(...future.oldEnvVars) [18:41:54.904] envs <- base::Sys.getenv() [18:41:54.904] names <- names(envs) [18:41:54.904] common <- intersect(names, old_names) [18:41:54.904] added <- setdiff(names, old_names) [18:41:54.904] removed <- setdiff(old_names, names) [18:41:54.904] changed <- common[...future.oldEnvVars[common] != [18:41:54.904] envs[common]] [18:41:54.904] NAMES <- toupper(changed) [18:41:54.904] args <- list() [18:41:54.904] for (kk in seq_along(NAMES)) { [18:41:54.904] name <- changed[[kk]] [18:41:54.904] NAME <- NAMES[[kk]] [18:41:54.904] if (name != NAME && is.element(NAME, old_names)) [18:41:54.904] next [18:41:54.904] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.904] } [18:41:54.904] NAMES <- toupper(added) [18:41:54.904] for (kk in seq_along(NAMES)) { [18:41:54.904] name <- added[[kk]] [18:41:54.904] NAME <- NAMES[[kk]] [18:41:54.904] if (name != NAME && is.element(NAME, old_names)) [18:41:54.904] next [18:41:54.904] args[[name]] <- "" [18:41:54.904] } [18:41:54.904] NAMES <- toupper(removed) [18:41:54.904] for (kk in seq_along(NAMES)) { [18:41:54.904] name <- removed[[kk]] [18:41:54.904] NAME <- NAMES[[kk]] [18:41:54.904] if (name != NAME && is.element(NAME, old_names)) [18:41:54.904] next [18:41:54.904] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:54.904] } [18:41:54.904] if (length(args) > 0) [18:41:54.904] base::do.call(base::Sys.setenv, args = args) [18:41:54.904] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:54.904] } [18:41:54.904] { [18:41:54.904] if (base::length(...future.futureOptionsAdded) > [18:41:54.904] 0L) { [18:41:54.904] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:54.904] base::names(opts) <- ...future.futureOptionsAdded [18:41:54.904] base::options(opts) [18:41:54.904] } [18:41:54.904] { [18:41:54.904] { [18:41:54.904] base::options(mc.cores = ...future.mc.cores.old) [18:41:54.904] NULL [18:41:54.904] } [18:41:54.904] options(future.plan = NULL) [18:41:54.904] if (is.na(NA_character_)) [18:41:54.904] Sys.unsetenv("R_FUTURE_PLAN") [18:41:54.904] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:54.904] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:54.904] .init = FALSE) [18:41:54.904] } [18:41:54.904] } [18:41:54.904] } [18:41:54.904] }) [18:41:54.904] if (TRUE) { [18:41:54.904] base::sink(type = "output", split = FALSE) [18:41:54.904] if (TRUE) { [18:41:54.904] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:54.904] } [18:41:54.904] else { [18:41:54.904] ...future.result["stdout"] <- base::list(NULL) [18:41:54.904] } [18:41:54.904] base::close(...future.stdout) [18:41:54.904] ...future.stdout <- NULL [18:41:54.904] } [18:41:54.904] ...future.result$conditions <- ...future.conditions [18:41:54.904] ...future.result$finished <- base::Sys.time() [18:41:54.904] ...future.result [18:41:54.904] } [18:41:54.909] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:54.909] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:54.910] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:54.910] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:54.910] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:54.911] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:54.911] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:54.911] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:54.912] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:54.912] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:54.912] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:54.912] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:54.913] MultisessionFuture started [18:41:54.913] - Launch lazy future ... done [18:41:54.913] run() for 'MultisessionFuture' ... done [18:41:54.914] Created future: [18:41:54.928] receiveMessageFromWorker() for ClusterFuture ... [18:41:54.929] - Validating connection of MultisessionFuture [18:41:54.929] - received message: FutureResult [18:41:54.929] - Received FutureResult [18:41:54.929] - Erased future from FutureRegistry [18:41:54.930] result() for ClusterFuture ... [18:41:54.930] - result already collected: FutureResult [18:41:54.930] result() for ClusterFuture ... done [18:41:54.930] receiveMessageFromWorker() for ClusterFuture ... done [18:41:54.914] MultisessionFuture: [18:41:54.914] Label: 'future_sapply-2' [18:41:54.914] Expression: [18:41:54.914] { [18:41:54.914] do.call(function(...) { [18:41:54.914] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.914] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.914] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.914] on.exit(options(oopts), add = TRUE) [18:41:54.914] } [18:41:54.914] { [18:41:54.914] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.914] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.914] ...future.FUN(...future.X_jj, ...) [18:41:54.914] }) [18:41:54.914] } [18:41:54.914] }, args = future.call.arguments) [18:41:54.914] } [18:41:54.914] Lazy evaluation: FALSE [18:41:54.914] Asynchronous evaluation: TRUE [18:41:54.914] Local evaluation: TRUE [18:41:54.914] Environment: R_GlobalEnv [18:41:54.914] Capture standard output: TRUE [18:41:54.914] Capture condition classes: 'condition' (excluding 'nothing') [18:41:54.914] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:54.914] Packages: [18:41:54.914] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:54.914] Resolved: TRUE [18:41:54.914] Value: [18:41:54.914] Conditions captured: [18:41:54.914] Early signaling: FALSE [18:41:54.914] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:54.914] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.931] Chunk #2 of 2 ... DONE [18:41:54.931] Launching 2 futures (chunks) ... DONE [18:41:54.931] Resolving 2 futures (chunks) ... [18:41:54.931] resolve() on list ... [18:41:54.931] recursive: 0 [18:41:54.931] length: 2 [18:41:54.931] [18:41:54.932] Future #1 [18:41:54.932] result() for ClusterFuture ... [18:41:54.932] - result already collected: FutureResult [18:41:54.932] result() for ClusterFuture ... done [18:41:54.932] result() for ClusterFuture ... [18:41:54.932] - result already collected: FutureResult [18:41:54.933] result() for ClusterFuture ... done [18:41:54.933] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:54.933] - nx: 2 [18:41:54.933] - relay: TRUE [18:41:54.933] - stdout: TRUE [18:41:54.933] - signal: TRUE [18:41:54.934] - resignal: FALSE [18:41:54.934] - force: TRUE [18:41:54.934] - relayed: [n=2] FALSE, FALSE [18:41:54.934] - queued futures: [n=2] FALSE, FALSE [18:41:54.934] - until=1 [18:41:54.934] - relaying element #1 [18:41:54.935] result() for ClusterFuture ... [18:41:54.935] - result already collected: FutureResult [18:41:54.935] result() for ClusterFuture ... done [18:41:54.935] result() for ClusterFuture ... [18:41:54.935] - result already collected: FutureResult [18:41:54.935] result() for ClusterFuture ... done [18:41:54.936] result() for ClusterFuture ... [18:41:54.936] - result already collected: FutureResult [18:41:54.936] result() for ClusterFuture ... done [18:41:54.936] result() for ClusterFuture ... [18:41:54.936] - result already collected: FutureResult [18:41:54.936] result() for ClusterFuture ... done [18:41:54.937] - relayed: [n=2] TRUE, FALSE [18:41:54.937] - queued futures: [n=2] TRUE, FALSE [18:41:54.937] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:54.937] length: 1 (resolved future 1) [18:41:54.937] Future #2 [18:41:54.937] result() for ClusterFuture ... [18:41:54.938] - result already collected: FutureResult [18:41:54.938] result() for ClusterFuture ... done [18:41:54.938] result() for ClusterFuture ... [18:41:54.938] - result already collected: FutureResult [18:41:54.938] result() for ClusterFuture ... done [18:41:54.938] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:54.939] - nx: 2 [18:41:54.939] - relay: TRUE [18:41:54.939] - stdout: TRUE [18:41:54.939] - signal: TRUE [18:41:54.939] - resignal: FALSE [18:41:54.939] - force: TRUE [18:41:54.939] - relayed: [n=2] TRUE, FALSE [18:41:54.940] - queued futures: [n=2] TRUE, FALSE [18:41:54.940] - until=2 [18:41:54.940] - relaying element #2 [18:41:54.940] result() for ClusterFuture ... [18:41:54.940] - result already collected: FutureResult [18:41:54.940] result() for ClusterFuture ... done [18:41:54.941] result() for ClusterFuture ... [18:41:54.941] - result already collected: FutureResult [18:41:54.941] result() for ClusterFuture ... done [18:41:54.941] result() for ClusterFuture ... [18:41:54.941] - result already collected: FutureResult [18:41:54.941] result() for ClusterFuture ... done [18:41:54.942] result() for ClusterFuture ... [18:41:54.942] - result already collected: FutureResult [18:41:54.942] result() for ClusterFuture ... done [18:41:54.942] - relayed: [n=2] TRUE, TRUE [18:41:54.942] - queued futures: [n=2] TRUE, TRUE [18:41:54.942] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:54.943] length: 0 (resolved future 2) [18:41:54.943] Relaying remaining futures [18:41:54.943] signalConditionsASAP(NULL, pos=0) ... [18:41:54.943] - nx: 2 [18:41:54.943] - relay: TRUE [18:41:54.943] - stdout: TRUE [18:41:54.943] - signal: TRUE [18:41:54.944] - resignal: FALSE [18:41:54.944] - force: TRUE [18:41:54.944] - relayed: [n=2] TRUE, TRUE [18:41:54.944] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:54.944] - relayed: [n=2] TRUE, TRUE [18:41:54.944] - queued futures: [n=2] TRUE, TRUE [18:41:54.945] signalConditionsASAP(NULL, pos=0) ... done [18:41:54.945] resolve() on list ... DONE [18:41:54.945] result() for ClusterFuture ... [18:41:54.945] - result already collected: FutureResult [18:41:54.945] result() for ClusterFuture ... done [18:41:54.945] result() for ClusterFuture ... [18:41:54.946] - result already collected: FutureResult [18:41:54.946] result() for ClusterFuture ... done [18:41:54.946] result() for ClusterFuture ... [18:41:54.946] - result already collected: FutureResult [18:41:54.946] result() for ClusterFuture ... done [18:41:54.946] result() for ClusterFuture ... [18:41:54.947] - result already collected: FutureResult [18:41:54.947] result() for ClusterFuture ... done [18:41:54.947] - Number of value chunks collected: 2 [18:41:54.947] Resolving 2 futures (chunks) ... DONE [18:41:54.947] Reducing values from 2 chunks ... [18:41:54.947] - Number of values collected after concatenation: 4 [18:41:54.948] - Number of values expected: 4 [18:41:54.948] Reducing values from 2 chunks ... DONE [18:41:54.948] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y1:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y2:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 [18:41:54.960] future_lapply() ... [18:41:54.962] Number of chunks: 2 [18:41:54.963] getGlobalsAndPackagesXApply() ... [18:41:54.963] - future.globals: TRUE [18:41:54.963] getGlobalsAndPackages() ... [18:41:54.963] Searching for globals... [18:41:54.964] - globals found: [2] 'FUN', 'UseMethod' [18:41:54.965] Searching for globals ... DONE [18:41:54.965] Resolving globals: FALSE [18:41:54.965] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:54.966] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:54.966] - globals: [1] 'FUN' [18:41:54.966] [18:41:54.966] getGlobalsAndPackages() ... DONE [18:41:54.966] - globals found/used: [n=1] 'FUN' [18:41:54.967] - needed namespaces: [n=0] [18:41:54.967] Finding globals ... DONE [18:41:54.967] - use_args: TRUE [18:41:54.967] - Getting '...' globals ... [18:41:54.968] resolve() on list ... [18:41:54.968] recursive: 0 [18:41:54.968] length: 1 [18:41:54.968] elements: '...' [18:41:54.968] length: 0 (resolved future 1) [18:41:54.968] resolve() on list ... DONE [18:41:54.969] - '...' content: [n=0] [18:41:54.969] List of 1 [18:41:54.969] $ ...: list() [18:41:54.969] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.969] - attr(*, "where")=List of 1 [18:41:54.969] ..$ ...: [18:41:54.969] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.969] - attr(*, "resolved")= logi TRUE [18:41:54.969] - attr(*, "total_size")= num NA [18:41:54.972] - Getting '...' globals ... DONE [18:41:54.972] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:54.972] List of 2 [18:41:54.972] $ ...future.FUN:function (x, ...) [18:41:54.972] $ ... : list() [18:41:54.972] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:54.972] - attr(*, "where")=List of 2 [18:41:54.972] ..$ ...future.FUN: [18:41:54.972] ..$ ... : [18:41:54.972] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:54.972] - attr(*, "resolved")= logi FALSE [18:41:54.972] - attr(*, "total_size")= int 5150 [18:41:54.975] Packages to be attached in all futures: [n=0] [18:41:54.976] getGlobalsAndPackagesXApply() ... DONE [18:41:54.976] Number of futures (= number of chunks): 2 [18:41:54.976] Launching 2 futures (chunks) ... [18:41:54.976] Chunk #1 of 2 ... [18:41:54.976] - Finding globals in 'X' for chunk #1 ... [18:41:54.977] getGlobalsAndPackages() ... [18:41:54.977] Searching for globals... [18:41:54.977] [18:41:54.977] Searching for globals ... DONE [18:41:54.977] - globals: [0] [18:41:54.978] getGlobalsAndPackages() ... DONE [18:41:54.978] + additional globals found: [n=0] [18:41:54.978] + additional namespaces needed: [n=0] [18:41:54.978] - Finding globals in 'X' for chunk #1 ... DONE [18:41:54.978] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:54.978] - seeds: [18:41:54.979] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.979] getGlobalsAndPackages() ... [18:41:54.979] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.979] Resolving globals: FALSE [18:41:54.979] Tweak future expression to call with '...' arguments ... [18:41:54.979] { [18:41:54.979] do.call(function(...) { [18:41:54.979] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:54.979] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:54.979] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:54.979] on.exit(options(oopts), add = TRUE) [18:41:54.979] } [18:41:54.979] { [18:41:54.979] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:54.979] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:54.979] ...future.FUN(...future.X_jj, ...) [18:41:54.979] }) [18:41:54.979] } [18:41:54.979] }, args = future.call.arguments) [18:41:54.979] } [18:41:54.980] Tweak future expression to call with '...' arguments ... DONE [18:41:54.980] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:54.981] [18:41:54.981] getGlobalsAndPackages() ... DONE [18:41:54.981] run() for 'Future' ... [18:41:54.981] - state: 'created' [18:41:54.981] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:54.997] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:54.998] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:54.998] - Field: 'node' [18:41:54.998] - Field: 'label' [18:41:54.998] - Field: 'local' [18:41:54.998] - Field: 'owner' [18:41:54.999] - Field: 'envir' [18:41:54.999] - Field: 'workers' [18:41:54.999] - Field: 'packages' [18:41:54.999] - Field: 'gc' [18:41:54.999] - Field: 'conditions' [18:41:54.999] - Field: 'persistent' [18:41:55.000] - Field: 'expr' [18:41:55.000] - Field: 'uuid' [18:41:55.000] - Field: 'seed' [18:41:55.000] - Field: 'version' [18:41:55.000] - Field: 'result' [18:41:55.000] - Field: 'asynchronous' [18:41:55.001] - Field: 'calls' [18:41:55.001] - Field: 'globals' [18:41:55.001] - Field: 'stdout' [18:41:55.001] - Field: 'earlySignal' [18:41:55.001] - Field: 'lazy' [18:41:55.002] - Field: 'state' [18:41:55.002] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.002] - Launch lazy future ... [18:41:55.002] Packages needed by the future expression (n = 0): [18:41:55.002] Packages needed by future strategies (n = 0): [18:41:55.003] { [18:41:55.003] { [18:41:55.003] { [18:41:55.003] ...future.startTime <- base::Sys.time() [18:41:55.003] { [18:41:55.003] { [18:41:55.003] { [18:41:55.003] { [18:41:55.003] base::local({ [18:41:55.003] has_future <- base::requireNamespace("future", [18:41:55.003] quietly = TRUE) [18:41:55.003] if (has_future) { [18:41:55.003] ns <- base::getNamespace("future") [18:41:55.003] version <- ns[[".package"]][["version"]] [18:41:55.003] if (is.null(version)) [18:41:55.003] version <- utils::packageVersion("future") [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] version <- NULL [18:41:55.003] } [18:41:55.003] if (!has_future || version < "1.8.0") { [18:41:55.003] info <- base::c(r_version = base::gsub("R version ", [18:41:55.003] "", base::R.version$version.string), [18:41:55.003] platform = base::sprintf("%s (%s-bit)", [18:41:55.003] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.003] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.003] "release", "version")], collapse = " "), [18:41:55.003] hostname = base::Sys.info()[["nodename"]]) [18:41:55.003] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.003] info) [18:41:55.003] info <- base::paste(info, collapse = "; ") [18:41:55.003] if (!has_future) { [18:41:55.003] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.003] info) [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.003] info, version) [18:41:55.003] } [18:41:55.003] base::stop(msg) [18:41:55.003] } [18:41:55.003] }) [18:41:55.003] } [18:41:55.003] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.003] base::options(mc.cores = 1L) [18:41:55.003] } [18:41:55.003] ...future.strategy.old <- future::plan("list") [18:41:55.003] options(future.plan = NULL) [18:41:55.003] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.003] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.003] } [18:41:55.003] ...future.workdir <- getwd() [18:41:55.003] } [18:41:55.003] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.003] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.003] } [18:41:55.003] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.003] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.003] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.003] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.003] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.003] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.003] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.003] base::names(...future.oldOptions)) [18:41:55.003] } [18:41:55.003] if (FALSE) { [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] if (TRUE) { [18:41:55.003] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.003] open = "w") [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.003] windows = "NUL", "/dev/null"), open = "w") [18:41:55.003] } [18:41:55.003] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.003] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.003] base::sink(type = "output", split = FALSE) [18:41:55.003] base::close(...future.stdout) [18:41:55.003] }, add = TRUE) [18:41:55.003] } [18:41:55.003] ...future.frame <- base::sys.nframe() [18:41:55.003] ...future.conditions <- base::list() [18:41:55.003] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.003] if (FALSE) { [18:41:55.003] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.003] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.003] } [18:41:55.003] ...future.result <- base::tryCatch({ [18:41:55.003] base::withCallingHandlers({ [18:41:55.003] ...future.value <- base::withVisible(base::local({ [18:41:55.003] ...future.makeSendCondition <- base::local({ [18:41:55.003] sendCondition <- NULL [18:41:55.003] function(frame = 1L) { [18:41:55.003] if (is.function(sendCondition)) [18:41:55.003] return(sendCondition) [18:41:55.003] ns <- getNamespace("parallel") [18:41:55.003] if (exists("sendData", mode = "function", [18:41:55.003] envir = ns)) { [18:41:55.003] parallel_sendData <- get("sendData", mode = "function", [18:41:55.003] envir = ns) [18:41:55.003] envir <- sys.frame(frame) [18:41:55.003] master <- NULL [18:41:55.003] while (!identical(envir, .GlobalEnv) && [18:41:55.003] !identical(envir, emptyenv())) { [18:41:55.003] if (exists("master", mode = "list", envir = envir, [18:41:55.003] inherits = FALSE)) { [18:41:55.003] master <- get("master", mode = "list", [18:41:55.003] envir = envir, inherits = FALSE) [18:41:55.003] if (inherits(master, c("SOCKnode", [18:41:55.003] "SOCK0node"))) { [18:41:55.003] sendCondition <<- function(cond) { [18:41:55.003] data <- list(type = "VALUE", value = cond, [18:41:55.003] success = TRUE) [18:41:55.003] parallel_sendData(master, data) [18:41:55.003] } [18:41:55.003] return(sendCondition) [18:41:55.003] } [18:41:55.003] } [18:41:55.003] frame <- frame + 1L [18:41:55.003] envir <- sys.frame(frame) [18:41:55.003] } [18:41:55.003] } [18:41:55.003] sendCondition <<- function(cond) NULL [18:41:55.003] } [18:41:55.003] }) [18:41:55.003] withCallingHandlers({ [18:41:55.003] { [18:41:55.003] do.call(function(...) { [18:41:55.003] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.003] if (!identical(...future.globals.maxSize.org, [18:41:55.003] ...future.globals.maxSize)) { [18:41:55.003] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.003] on.exit(options(oopts), add = TRUE) [18:41:55.003] } [18:41:55.003] { [18:41:55.003] lapply(seq_along(...future.elements_ii), [18:41:55.003] FUN = function(jj) { [18:41:55.003] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.003] ...future.FUN(...future.X_jj, ...) [18:41:55.003] }) [18:41:55.003] } [18:41:55.003] }, args = future.call.arguments) [18:41:55.003] } [18:41:55.003] }, immediateCondition = function(cond) { [18:41:55.003] sendCondition <- ...future.makeSendCondition() [18:41:55.003] sendCondition(cond) [18:41:55.003] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.003] { [18:41:55.003] inherits <- base::inherits [18:41:55.003] invokeRestart <- base::invokeRestart [18:41:55.003] is.null <- base::is.null [18:41:55.003] muffled <- FALSE [18:41:55.003] if (inherits(cond, "message")) { [18:41:55.003] muffled <- grepl(pattern, "muffleMessage") [18:41:55.003] if (muffled) [18:41:55.003] invokeRestart("muffleMessage") [18:41:55.003] } [18:41:55.003] else if (inherits(cond, "warning")) { [18:41:55.003] muffled <- grepl(pattern, "muffleWarning") [18:41:55.003] if (muffled) [18:41:55.003] invokeRestart("muffleWarning") [18:41:55.003] } [18:41:55.003] else if (inherits(cond, "condition")) { [18:41:55.003] if (!is.null(pattern)) { [18:41:55.003] computeRestarts <- base::computeRestarts [18:41:55.003] grepl <- base::grepl [18:41:55.003] restarts <- computeRestarts(cond) [18:41:55.003] for (restart in restarts) { [18:41:55.003] name <- restart$name [18:41:55.003] if (is.null(name)) [18:41:55.003] next [18:41:55.003] if (!grepl(pattern, name)) [18:41:55.003] next [18:41:55.003] invokeRestart(restart) [18:41:55.003] muffled <- TRUE [18:41:55.003] break [18:41:55.003] } [18:41:55.003] } [18:41:55.003] } [18:41:55.003] invisible(muffled) [18:41:55.003] } [18:41:55.003] muffleCondition(cond) [18:41:55.003] }) [18:41:55.003] })) [18:41:55.003] future::FutureResult(value = ...future.value$value, [18:41:55.003] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.003] ...future.rng), globalenv = if (FALSE) [18:41:55.003] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.003] ...future.globalenv.names)) [18:41:55.003] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.003] }, condition = base::local({ [18:41:55.003] c <- base::c [18:41:55.003] inherits <- base::inherits [18:41:55.003] invokeRestart <- base::invokeRestart [18:41:55.003] length <- base::length [18:41:55.003] list <- base::list [18:41:55.003] seq.int <- base::seq.int [18:41:55.003] signalCondition <- base::signalCondition [18:41:55.003] sys.calls <- base::sys.calls [18:41:55.003] `[[` <- base::`[[` [18:41:55.003] `+` <- base::`+` [18:41:55.003] `<<-` <- base::`<<-` [18:41:55.003] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.003] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.003] 3L)] [18:41:55.003] } [18:41:55.003] function(cond) { [18:41:55.003] is_error <- inherits(cond, "error") [18:41:55.003] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.003] NULL) [18:41:55.003] if (is_error) { [18:41:55.003] sessionInformation <- function() { [18:41:55.003] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.003] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.003] search = base::search(), system = base::Sys.info()) [18:41:55.003] } [18:41:55.003] ...future.conditions[[length(...future.conditions) + [18:41:55.003] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.003] cond$call), session = sessionInformation(), [18:41:55.003] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.003] signalCondition(cond) [18:41:55.003] } [18:41:55.003] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.003] "immediateCondition"))) { [18:41:55.003] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.003] ...future.conditions[[length(...future.conditions) + [18:41:55.003] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.003] if (TRUE && !signal) { [18:41:55.003] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.003] { [18:41:55.003] inherits <- base::inherits [18:41:55.003] invokeRestart <- base::invokeRestart [18:41:55.003] is.null <- base::is.null [18:41:55.003] muffled <- FALSE [18:41:55.003] if (inherits(cond, "message")) { [18:41:55.003] muffled <- grepl(pattern, "muffleMessage") [18:41:55.003] if (muffled) [18:41:55.003] invokeRestart("muffleMessage") [18:41:55.003] } [18:41:55.003] else if (inherits(cond, "warning")) { [18:41:55.003] muffled <- grepl(pattern, "muffleWarning") [18:41:55.003] if (muffled) [18:41:55.003] invokeRestart("muffleWarning") [18:41:55.003] } [18:41:55.003] else if (inherits(cond, "condition")) { [18:41:55.003] if (!is.null(pattern)) { [18:41:55.003] computeRestarts <- base::computeRestarts [18:41:55.003] grepl <- base::grepl [18:41:55.003] restarts <- computeRestarts(cond) [18:41:55.003] for (restart in restarts) { [18:41:55.003] name <- restart$name [18:41:55.003] if (is.null(name)) [18:41:55.003] next [18:41:55.003] if (!grepl(pattern, name)) [18:41:55.003] next [18:41:55.003] invokeRestart(restart) [18:41:55.003] muffled <- TRUE [18:41:55.003] break [18:41:55.003] } [18:41:55.003] } [18:41:55.003] } [18:41:55.003] invisible(muffled) [18:41:55.003] } [18:41:55.003] muffleCondition(cond, pattern = "^muffle") [18:41:55.003] } [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] if (TRUE) { [18:41:55.003] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.003] { [18:41:55.003] inherits <- base::inherits [18:41:55.003] invokeRestart <- base::invokeRestart [18:41:55.003] is.null <- base::is.null [18:41:55.003] muffled <- FALSE [18:41:55.003] if (inherits(cond, "message")) { [18:41:55.003] muffled <- grepl(pattern, "muffleMessage") [18:41:55.003] if (muffled) [18:41:55.003] invokeRestart("muffleMessage") [18:41:55.003] } [18:41:55.003] else if (inherits(cond, "warning")) { [18:41:55.003] muffled <- grepl(pattern, "muffleWarning") [18:41:55.003] if (muffled) [18:41:55.003] invokeRestart("muffleWarning") [18:41:55.003] } [18:41:55.003] else if (inherits(cond, "condition")) { [18:41:55.003] if (!is.null(pattern)) { [18:41:55.003] computeRestarts <- base::computeRestarts [18:41:55.003] grepl <- base::grepl [18:41:55.003] restarts <- computeRestarts(cond) [18:41:55.003] for (restart in restarts) { [18:41:55.003] name <- restart$name [18:41:55.003] if (is.null(name)) [18:41:55.003] next [18:41:55.003] if (!grepl(pattern, name)) [18:41:55.003] next [18:41:55.003] invokeRestart(restart) [18:41:55.003] muffled <- TRUE [18:41:55.003] break [18:41:55.003] } [18:41:55.003] } [18:41:55.003] } [18:41:55.003] invisible(muffled) [18:41:55.003] } [18:41:55.003] muffleCondition(cond, pattern = "^muffle") [18:41:55.003] } [18:41:55.003] } [18:41:55.003] } [18:41:55.003] })) [18:41:55.003] }, error = function(ex) { [18:41:55.003] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.003] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.003] ...future.rng), started = ...future.startTime, [18:41:55.003] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.003] version = "1.8"), class = "FutureResult") [18:41:55.003] }, finally = { [18:41:55.003] if (!identical(...future.workdir, getwd())) [18:41:55.003] setwd(...future.workdir) [18:41:55.003] { [18:41:55.003] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.003] ...future.oldOptions$nwarnings <- NULL [18:41:55.003] } [18:41:55.003] base::options(...future.oldOptions) [18:41:55.003] if (.Platform$OS.type == "windows") { [18:41:55.003] old_names <- names(...future.oldEnvVars) [18:41:55.003] envs <- base::Sys.getenv() [18:41:55.003] names <- names(envs) [18:41:55.003] common <- intersect(names, old_names) [18:41:55.003] added <- setdiff(names, old_names) [18:41:55.003] removed <- setdiff(old_names, names) [18:41:55.003] changed <- common[...future.oldEnvVars[common] != [18:41:55.003] envs[common]] [18:41:55.003] NAMES <- toupper(changed) [18:41:55.003] args <- list() [18:41:55.003] for (kk in seq_along(NAMES)) { [18:41:55.003] name <- changed[[kk]] [18:41:55.003] NAME <- NAMES[[kk]] [18:41:55.003] if (name != NAME && is.element(NAME, old_names)) [18:41:55.003] next [18:41:55.003] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.003] } [18:41:55.003] NAMES <- toupper(added) [18:41:55.003] for (kk in seq_along(NAMES)) { [18:41:55.003] name <- added[[kk]] [18:41:55.003] NAME <- NAMES[[kk]] [18:41:55.003] if (name != NAME && is.element(NAME, old_names)) [18:41:55.003] next [18:41:55.003] args[[name]] <- "" [18:41:55.003] } [18:41:55.003] NAMES <- toupper(removed) [18:41:55.003] for (kk in seq_along(NAMES)) { [18:41:55.003] name <- removed[[kk]] [18:41:55.003] NAME <- NAMES[[kk]] [18:41:55.003] if (name != NAME && is.element(NAME, old_names)) [18:41:55.003] next [18:41:55.003] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.003] } [18:41:55.003] if (length(args) > 0) [18:41:55.003] base::do.call(base::Sys.setenv, args = args) [18:41:55.003] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.003] } [18:41:55.003] { [18:41:55.003] if (base::length(...future.futureOptionsAdded) > [18:41:55.003] 0L) { [18:41:55.003] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.003] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.003] base::options(opts) [18:41:55.003] } [18:41:55.003] { [18:41:55.003] { [18:41:55.003] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.003] NULL [18:41:55.003] } [18:41:55.003] options(future.plan = NULL) [18:41:55.003] if (is.na(NA_character_)) [18:41:55.003] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.003] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.003] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.003] .init = FALSE) [18:41:55.003] } [18:41:55.003] } [18:41:55.003] } [18:41:55.003] }) [18:41:55.003] if (TRUE) { [18:41:55.003] base::sink(type = "output", split = FALSE) [18:41:55.003] if (TRUE) { [18:41:55.003] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.003] } [18:41:55.003] else { [18:41:55.003] ...future.result["stdout"] <- base::list(NULL) [18:41:55.003] } [18:41:55.003] base::close(...future.stdout) [18:41:55.003] ...future.stdout <- NULL [18:41:55.003] } [18:41:55.003] ...future.result$conditions <- ...future.conditions [18:41:55.003] ...future.result$finished <- base::Sys.time() [18:41:55.003] ...future.result [18:41:55.003] } [18:41:55.008] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:55.008] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:55.009] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:55.009] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.009] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.010] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.010] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.010] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.011] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.011] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.011] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.011] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:55.012] MultisessionFuture started [18:41:55.012] - Launch lazy future ... done [18:41:55.012] run() for 'MultisessionFuture' ... done [18:41:55.013] Created future: [18:41:55.027] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.027] - Validating connection of MultisessionFuture [18:41:55.027] - received message: FutureResult [18:41:55.028] - Received FutureResult [18:41:55.028] - Erased future from FutureRegistry [18:41:55.028] result() for ClusterFuture ... [18:41:55.028] - result already collected: FutureResult [18:41:55.028] result() for ClusterFuture ... done [18:41:55.029] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.013] MultisessionFuture: [18:41:55.013] Label: 'future_sapply-1' [18:41:55.013] Expression: [18:41:55.013] { [18:41:55.013] do.call(function(...) { [18:41:55.013] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.013] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.013] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.013] on.exit(options(oopts), add = TRUE) [18:41:55.013] } [18:41:55.013] { [18:41:55.013] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.013] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.013] ...future.FUN(...future.X_jj, ...) [18:41:55.013] }) [18:41:55.013] } [18:41:55.013] }, args = future.call.arguments) [18:41:55.013] } [18:41:55.013] Lazy evaluation: FALSE [18:41:55.013] Asynchronous evaluation: TRUE [18:41:55.013] Local evaluation: TRUE [18:41:55.013] Environment: R_GlobalEnv [18:41:55.013] Capture standard output: TRUE [18:41:55.013] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.013] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.013] Packages: [18:41:55.013] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.013] Resolved: TRUE [18:41:55.013] Value: [18:41:55.013] Conditions captured: [18:41:55.013] Early signaling: FALSE [18:41:55.013] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.013] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.029] Chunk #1 of 2 ... DONE [18:41:55.029] Chunk #2 of 2 ... [18:41:55.029] - Finding globals in 'X' for chunk #2 ... [18:41:55.029] getGlobalsAndPackages() ... [18:41:55.030] Searching for globals... [18:41:55.030] [18:41:55.030] Searching for globals ... DONE [18:41:55.030] - globals: [0] [18:41:55.030] getGlobalsAndPackages() ... DONE [18:41:55.031] + additional globals found: [n=0] [18:41:55.031] + additional namespaces needed: [n=0] [18:41:55.031] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.031] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.031] - seeds: [18:41:55.031] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.032] getGlobalsAndPackages() ... [18:41:55.032] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.032] Resolving globals: FALSE [18:41:55.032] Tweak future expression to call with '...' arguments ... [18:41:55.032] { [18:41:55.032] do.call(function(...) { [18:41:55.032] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.032] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.032] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.032] on.exit(options(oopts), add = TRUE) [18:41:55.032] } [18:41:55.032] { [18:41:55.032] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.032] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.032] ...future.FUN(...future.X_jj, ...) [18:41:55.032] }) [18:41:55.032] } [18:41:55.032] }, args = future.call.arguments) [18:41:55.032] } [18:41:55.033] Tweak future expression to call with '...' arguments ... DONE [18:41:55.033] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.033] [18:41:55.034] getGlobalsAndPackages() ... DONE [18:41:55.034] run() for 'Future' ... [18:41:55.034] - state: 'created' [18:41:55.034] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.050] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.050] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.050] - Field: 'node' [18:41:55.050] - Field: 'label' [18:41:55.050] - Field: 'local' [18:41:55.051] - Field: 'owner' [18:41:55.051] - Field: 'envir' [18:41:55.051] - Field: 'workers' [18:41:55.051] - Field: 'packages' [18:41:55.051] - Field: 'gc' [18:41:55.051] - Field: 'conditions' [18:41:55.052] - Field: 'persistent' [18:41:55.052] - Field: 'expr' [18:41:55.052] - Field: 'uuid' [18:41:55.052] - Field: 'seed' [18:41:55.052] - Field: 'version' [18:41:55.053] - Field: 'result' [18:41:55.053] - Field: 'asynchronous' [18:41:55.053] - Field: 'calls' [18:41:55.053] - Field: 'globals' [18:41:55.053] - Field: 'stdout' [18:41:55.053] - Field: 'earlySignal' [18:41:55.054] - Field: 'lazy' [18:41:55.054] - Field: 'state' [18:41:55.054] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.054] - Launch lazy future ... [18:41:55.054] Packages needed by the future expression (n = 0): [18:41:55.055] Packages needed by future strategies (n = 0): [18:41:55.055] { [18:41:55.055] { [18:41:55.055] { [18:41:55.055] ...future.startTime <- base::Sys.time() [18:41:55.055] { [18:41:55.055] { [18:41:55.055] { [18:41:55.055] { [18:41:55.055] base::local({ [18:41:55.055] has_future <- base::requireNamespace("future", [18:41:55.055] quietly = TRUE) [18:41:55.055] if (has_future) { [18:41:55.055] ns <- base::getNamespace("future") [18:41:55.055] version <- ns[[".package"]][["version"]] [18:41:55.055] if (is.null(version)) [18:41:55.055] version <- utils::packageVersion("future") [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] version <- NULL [18:41:55.055] } [18:41:55.055] if (!has_future || version < "1.8.0") { [18:41:55.055] info <- base::c(r_version = base::gsub("R version ", [18:41:55.055] "", base::R.version$version.string), [18:41:55.055] platform = base::sprintf("%s (%s-bit)", [18:41:55.055] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.055] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.055] "release", "version")], collapse = " "), [18:41:55.055] hostname = base::Sys.info()[["nodename"]]) [18:41:55.055] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.055] info) [18:41:55.055] info <- base::paste(info, collapse = "; ") [18:41:55.055] if (!has_future) { [18:41:55.055] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.055] info) [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.055] info, version) [18:41:55.055] } [18:41:55.055] base::stop(msg) [18:41:55.055] } [18:41:55.055] }) [18:41:55.055] } [18:41:55.055] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.055] base::options(mc.cores = 1L) [18:41:55.055] } [18:41:55.055] ...future.strategy.old <- future::plan("list") [18:41:55.055] options(future.plan = NULL) [18:41:55.055] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.055] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.055] } [18:41:55.055] ...future.workdir <- getwd() [18:41:55.055] } [18:41:55.055] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.055] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.055] } [18:41:55.055] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.055] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.055] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.055] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.055] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.055] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.055] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.055] base::names(...future.oldOptions)) [18:41:55.055] } [18:41:55.055] if (FALSE) { [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] if (TRUE) { [18:41:55.055] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.055] open = "w") [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.055] windows = "NUL", "/dev/null"), open = "w") [18:41:55.055] } [18:41:55.055] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.055] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.055] base::sink(type = "output", split = FALSE) [18:41:55.055] base::close(...future.stdout) [18:41:55.055] }, add = TRUE) [18:41:55.055] } [18:41:55.055] ...future.frame <- base::sys.nframe() [18:41:55.055] ...future.conditions <- base::list() [18:41:55.055] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.055] if (FALSE) { [18:41:55.055] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.055] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.055] } [18:41:55.055] ...future.result <- base::tryCatch({ [18:41:55.055] base::withCallingHandlers({ [18:41:55.055] ...future.value <- base::withVisible(base::local({ [18:41:55.055] ...future.makeSendCondition <- base::local({ [18:41:55.055] sendCondition <- NULL [18:41:55.055] function(frame = 1L) { [18:41:55.055] if (is.function(sendCondition)) [18:41:55.055] return(sendCondition) [18:41:55.055] ns <- getNamespace("parallel") [18:41:55.055] if (exists("sendData", mode = "function", [18:41:55.055] envir = ns)) { [18:41:55.055] parallel_sendData <- get("sendData", mode = "function", [18:41:55.055] envir = ns) [18:41:55.055] envir <- sys.frame(frame) [18:41:55.055] master <- NULL [18:41:55.055] while (!identical(envir, .GlobalEnv) && [18:41:55.055] !identical(envir, emptyenv())) { [18:41:55.055] if (exists("master", mode = "list", envir = envir, [18:41:55.055] inherits = FALSE)) { [18:41:55.055] master <- get("master", mode = "list", [18:41:55.055] envir = envir, inherits = FALSE) [18:41:55.055] if (inherits(master, c("SOCKnode", [18:41:55.055] "SOCK0node"))) { [18:41:55.055] sendCondition <<- function(cond) { [18:41:55.055] data <- list(type = "VALUE", value = cond, [18:41:55.055] success = TRUE) [18:41:55.055] parallel_sendData(master, data) [18:41:55.055] } [18:41:55.055] return(sendCondition) [18:41:55.055] } [18:41:55.055] } [18:41:55.055] frame <- frame + 1L [18:41:55.055] envir <- sys.frame(frame) [18:41:55.055] } [18:41:55.055] } [18:41:55.055] sendCondition <<- function(cond) NULL [18:41:55.055] } [18:41:55.055] }) [18:41:55.055] withCallingHandlers({ [18:41:55.055] { [18:41:55.055] do.call(function(...) { [18:41:55.055] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.055] if (!identical(...future.globals.maxSize.org, [18:41:55.055] ...future.globals.maxSize)) { [18:41:55.055] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.055] on.exit(options(oopts), add = TRUE) [18:41:55.055] } [18:41:55.055] { [18:41:55.055] lapply(seq_along(...future.elements_ii), [18:41:55.055] FUN = function(jj) { [18:41:55.055] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.055] ...future.FUN(...future.X_jj, ...) [18:41:55.055] }) [18:41:55.055] } [18:41:55.055] }, args = future.call.arguments) [18:41:55.055] } [18:41:55.055] }, immediateCondition = function(cond) { [18:41:55.055] sendCondition <- ...future.makeSendCondition() [18:41:55.055] sendCondition(cond) [18:41:55.055] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.055] { [18:41:55.055] inherits <- base::inherits [18:41:55.055] invokeRestart <- base::invokeRestart [18:41:55.055] is.null <- base::is.null [18:41:55.055] muffled <- FALSE [18:41:55.055] if (inherits(cond, "message")) { [18:41:55.055] muffled <- grepl(pattern, "muffleMessage") [18:41:55.055] if (muffled) [18:41:55.055] invokeRestart("muffleMessage") [18:41:55.055] } [18:41:55.055] else if (inherits(cond, "warning")) { [18:41:55.055] muffled <- grepl(pattern, "muffleWarning") [18:41:55.055] if (muffled) [18:41:55.055] invokeRestart("muffleWarning") [18:41:55.055] } [18:41:55.055] else if (inherits(cond, "condition")) { [18:41:55.055] if (!is.null(pattern)) { [18:41:55.055] computeRestarts <- base::computeRestarts [18:41:55.055] grepl <- base::grepl [18:41:55.055] restarts <- computeRestarts(cond) [18:41:55.055] for (restart in restarts) { [18:41:55.055] name <- restart$name [18:41:55.055] if (is.null(name)) [18:41:55.055] next [18:41:55.055] if (!grepl(pattern, name)) [18:41:55.055] next [18:41:55.055] invokeRestart(restart) [18:41:55.055] muffled <- TRUE [18:41:55.055] break [18:41:55.055] } [18:41:55.055] } [18:41:55.055] } [18:41:55.055] invisible(muffled) [18:41:55.055] } [18:41:55.055] muffleCondition(cond) [18:41:55.055] }) [18:41:55.055] })) [18:41:55.055] future::FutureResult(value = ...future.value$value, [18:41:55.055] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.055] ...future.rng), globalenv = if (FALSE) [18:41:55.055] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.055] ...future.globalenv.names)) [18:41:55.055] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.055] }, condition = base::local({ [18:41:55.055] c <- base::c [18:41:55.055] inherits <- base::inherits [18:41:55.055] invokeRestart <- base::invokeRestart [18:41:55.055] length <- base::length [18:41:55.055] list <- base::list [18:41:55.055] seq.int <- base::seq.int [18:41:55.055] signalCondition <- base::signalCondition [18:41:55.055] sys.calls <- base::sys.calls [18:41:55.055] `[[` <- base::`[[` [18:41:55.055] `+` <- base::`+` [18:41:55.055] `<<-` <- base::`<<-` [18:41:55.055] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.055] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.055] 3L)] [18:41:55.055] } [18:41:55.055] function(cond) { [18:41:55.055] is_error <- inherits(cond, "error") [18:41:55.055] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.055] NULL) [18:41:55.055] if (is_error) { [18:41:55.055] sessionInformation <- function() { [18:41:55.055] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.055] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.055] search = base::search(), system = base::Sys.info()) [18:41:55.055] } [18:41:55.055] ...future.conditions[[length(...future.conditions) + [18:41:55.055] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.055] cond$call), session = sessionInformation(), [18:41:55.055] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.055] signalCondition(cond) [18:41:55.055] } [18:41:55.055] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.055] "immediateCondition"))) { [18:41:55.055] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.055] ...future.conditions[[length(...future.conditions) + [18:41:55.055] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.055] if (TRUE && !signal) { [18:41:55.055] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.055] { [18:41:55.055] inherits <- base::inherits [18:41:55.055] invokeRestart <- base::invokeRestart [18:41:55.055] is.null <- base::is.null [18:41:55.055] muffled <- FALSE [18:41:55.055] if (inherits(cond, "message")) { [18:41:55.055] muffled <- grepl(pattern, "muffleMessage") [18:41:55.055] if (muffled) [18:41:55.055] invokeRestart("muffleMessage") [18:41:55.055] } [18:41:55.055] else if (inherits(cond, "warning")) { [18:41:55.055] muffled <- grepl(pattern, "muffleWarning") [18:41:55.055] if (muffled) [18:41:55.055] invokeRestart("muffleWarning") [18:41:55.055] } [18:41:55.055] else if (inherits(cond, "condition")) { [18:41:55.055] if (!is.null(pattern)) { [18:41:55.055] computeRestarts <- base::computeRestarts [18:41:55.055] grepl <- base::grepl [18:41:55.055] restarts <- computeRestarts(cond) [18:41:55.055] for (restart in restarts) { [18:41:55.055] name <- restart$name [18:41:55.055] if (is.null(name)) [18:41:55.055] next [18:41:55.055] if (!grepl(pattern, name)) [18:41:55.055] next [18:41:55.055] invokeRestart(restart) [18:41:55.055] muffled <- TRUE [18:41:55.055] break [18:41:55.055] } [18:41:55.055] } [18:41:55.055] } [18:41:55.055] invisible(muffled) [18:41:55.055] } [18:41:55.055] muffleCondition(cond, pattern = "^muffle") [18:41:55.055] } [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] if (TRUE) { [18:41:55.055] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.055] { [18:41:55.055] inherits <- base::inherits [18:41:55.055] invokeRestart <- base::invokeRestart [18:41:55.055] is.null <- base::is.null [18:41:55.055] muffled <- FALSE [18:41:55.055] if (inherits(cond, "message")) { [18:41:55.055] muffled <- grepl(pattern, "muffleMessage") [18:41:55.055] if (muffled) [18:41:55.055] invokeRestart("muffleMessage") [18:41:55.055] } [18:41:55.055] else if (inherits(cond, "warning")) { [18:41:55.055] muffled <- grepl(pattern, "muffleWarning") [18:41:55.055] if (muffled) [18:41:55.055] invokeRestart("muffleWarning") [18:41:55.055] } [18:41:55.055] else if (inherits(cond, "condition")) { [18:41:55.055] if (!is.null(pattern)) { [18:41:55.055] computeRestarts <- base::computeRestarts [18:41:55.055] grepl <- base::grepl [18:41:55.055] restarts <- computeRestarts(cond) [18:41:55.055] for (restart in restarts) { [18:41:55.055] name <- restart$name [18:41:55.055] if (is.null(name)) [18:41:55.055] next [18:41:55.055] if (!grepl(pattern, name)) [18:41:55.055] next [18:41:55.055] invokeRestart(restart) [18:41:55.055] muffled <- TRUE [18:41:55.055] break [18:41:55.055] } [18:41:55.055] } [18:41:55.055] } [18:41:55.055] invisible(muffled) [18:41:55.055] } [18:41:55.055] muffleCondition(cond, pattern = "^muffle") [18:41:55.055] } [18:41:55.055] } [18:41:55.055] } [18:41:55.055] })) [18:41:55.055] }, error = function(ex) { [18:41:55.055] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.055] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.055] ...future.rng), started = ...future.startTime, [18:41:55.055] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.055] version = "1.8"), class = "FutureResult") [18:41:55.055] }, finally = { [18:41:55.055] if (!identical(...future.workdir, getwd())) [18:41:55.055] setwd(...future.workdir) [18:41:55.055] { [18:41:55.055] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.055] ...future.oldOptions$nwarnings <- NULL [18:41:55.055] } [18:41:55.055] base::options(...future.oldOptions) [18:41:55.055] if (.Platform$OS.type == "windows") { [18:41:55.055] old_names <- names(...future.oldEnvVars) [18:41:55.055] envs <- base::Sys.getenv() [18:41:55.055] names <- names(envs) [18:41:55.055] common <- intersect(names, old_names) [18:41:55.055] added <- setdiff(names, old_names) [18:41:55.055] removed <- setdiff(old_names, names) [18:41:55.055] changed <- common[...future.oldEnvVars[common] != [18:41:55.055] envs[common]] [18:41:55.055] NAMES <- toupper(changed) [18:41:55.055] args <- list() [18:41:55.055] for (kk in seq_along(NAMES)) { [18:41:55.055] name <- changed[[kk]] [18:41:55.055] NAME <- NAMES[[kk]] [18:41:55.055] if (name != NAME && is.element(NAME, old_names)) [18:41:55.055] next [18:41:55.055] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.055] } [18:41:55.055] NAMES <- toupper(added) [18:41:55.055] for (kk in seq_along(NAMES)) { [18:41:55.055] name <- added[[kk]] [18:41:55.055] NAME <- NAMES[[kk]] [18:41:55.055] if (name != NAME && is.element(NAME, old_names)) [18:41:55.055] next [18:41:55.055] args[[name]] <- "" [18:41:55.055] } [18:41:55.055] NAMES <- toupper(removed) [18:41:55.055] for (kk in seq_along(NAMES)) { [18:41:55.055] name <- removed[[kk]] [18:41:55.055] NAME <- NAMES[[kk]] [18:41:55.055] if (name != NAME && is.element(NAME, old_names)) [18:41:55.055] next [18:41:55.055] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.055] } [18:41:55.055] if (length(args) > 0) [18:41:55.055] base::do.call(base::Sys.setenv, args = args) [18:41:55.055] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.055] } [18:41:55.055] { [18:41:55.055] if (base::length(...future.futureOptionsAdded) > [18:41:55.055] 0L) { [18:41:55.055] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.055] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.055] base::options(opts) [18:41:55.055] } [18:41:55.055] { [18:41:55.055] { [18:41:55.055] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.055] NULL [18:41:55.055] } [18:41:55.055] options(future.plan = NULL) [18:41:55.055] if (is.na(NA_character_)) [18:41:55.055] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.055] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.055] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.055] .init = FALSE) [18:41:55.055] } [18:41:55.055] } [18:41:55.055] } [18:41:55.055] }) [18:41:55.055] if (TRUE) { [18:41:55.055] base::sink(type = "output", split = FALSE) [18:41:55.055] if (TRUE) { [18:41:55.055] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.055] } [18:41:55.055] else { [18:41:55.055] ...future.result["stdout"] <- base::list(NULL) [18:41:55.055] } [18:41:55.055] base::close(...future.stdout) [18:41:55.055] ...future.stdout <- NULL [18:41:55.055] } [18:41:55.055] ...future.result$conditions <- ...future.conditions [18:41:55.055] ...future.result$finished <- base::Sys.time() [18:41:55.055] ...future.result [18:41:55.055] } [18:41:55.061] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:55.061] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:55.061] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:55.061] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.062] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.062] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.062] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.063] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.063] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.063] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.064] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.064] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:55.064] MultisessionFuture started [18:41:55.065] - Launch lazy future ... done [18:41:55.065] run() for 'MultisessionFuture' ... done [18:41:55.065] Created future: [18:41:55.079] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.079] - Validating connection of MultisessionFuture [18:41:55.079] - received message: FutureResult [18:41:55.080] - Received FutureResult [18:41:55.080] - Erased future from FutureRegistry [18:41:55.080] result() for ClusterFuture ... [18:41:55.080] - result already collected: FutureResult [18:41:55.080] result() for ClusterFuture ... done [18:41:55.080] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.065] MultisessionFuture: [18:41:55.065] Label: 'future_sapply-2' [18:41:55.065] Expression: [18:41:55.065] { [18:41:55.065] do.call(function(...) { [18:41:55.065] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.065] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.065] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.065] on.exit(options(oopts), add = TRUE) [18:41:55.065] } [18:41:55.065] { [18:41:55.065] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.065] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.065] ...future.FUN(...future.X_jj, ...) [18:41:55.065] }) [18:41:55.065] } [18:41:55.065] }, args = future.call.arguments) [18:41:55.065] } [18:41:55.065] Lazy evaluation: FALSE [18:41:55.065] Asynchronous evaluation: TRUE [18:41:55.065] Local evaluation: TRUE [18:41:55.065] Environment: R_GlobalEnv [18:41:55.065] Capture standard output: TRUE [18:41:55.065] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.065] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.065] Packages: [18:41:55.065] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.065] Resolved: TRUE [18:41:55.065] Value: [18:41:55.065] Conditions captured: [18:41:55.065] Early signaling: FALSE [18:41:55.065] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.065] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.081] Chunk #2 of 2 ... DONE [18:41:55.081] Launching 2 futures (chunks) ... DONE [18:41:55.081] Resolving 2 futures (chunks) ... [18:41:55.081] resolve() on list ... [18:41:55.082] recursive: 0 [18:41:55.082] length: 2 [18:41:55.082] [18:41:55.082] Future #1 [18:41:55.082] result() for ClusterFuture ... [18:41:55.082] - result already collected: FutureResult [18:41:55.083] result() for ClusterFuture ... done [18:41:55.083] result() for ClusterFuture ... [18:41:55.083] - result already collected: FutureResult [18:41:55.084] result() for ClusterFuture ... done [18:41:55.084] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:55.084] - nx: 2 [18:41:55.085] - relay: TRUE [18:41:55.085] - stdout: TRUE [18:41:55.085] - signal: TRUE [18:41:55.086] - resignal: FALSE [18:41:55.086] - force: TRUE [18:41:55.086] - relayed: [n=2] FALSE, FALSE [18:41:55.086] - queued futures: [n=2] FALSE, FALSE [18:41:55.087] - until=1 [18:41:55.087] - relaying element #1 [18:41:55.087] result() for ClusterFuture ... [18:41:55.088] - result already collected: FutureResult [18:41:55.088] result() for ClusterFuture ... done [18:41:55.088] result() for ClusterFuture ... [18:41:55.088] - result already collected: FutureResult [18:41:55.089] result() for ClusterFuture ... done [18:41:55.089] result() for ClusterFuture ... [18:41:55.089] - result already collected: FutureResult [18:41:55.090] result() for ClusterFuture ... done [18:41:55.090] result() for ClusterFuture ... [18:41:55.090] - result already collected: FutureResult [18:41:55.091] result() for ClusterFuture ... done [18:41:55.091] - relayed: [n=2] TRUE, FALSE [18:41:55.091] - queued futures: [n=2] TRUE, FALSE [18:41:55.091] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:55.092] length: 1 (resolved future 1) [18:41:55.092] Future #2 [18:41:55.092] result() for ClusterFuture ... [18:41:55.093] - result already collected: FutureResult [18:41:55.093] result() for ClusterFuture ... done [18:41:55.093] result() for ClusterFuture ... [18:41:55.094] - result already collected: FutureResult [18:41:55.094] result() for ClusterFuture ... done [18:41:55.094] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:55.094] - nx: 2 [18:41:55.095] - relay: TRUE [18:41:55.095] - stdout: TRUE [18:41:55.095] - signal: TRUE [18:41:55.096] - resignal: FALSE [18:41:55.096] - force: TRUE [18:41:55.096] - relayed: [n=2] TRUE, FALSE [18:41:55.096] - queued futures: [n=2] TRUE, FALSE [18:41:55.097] - until=2 [18:41:55.097] - relaying element #2 [18:41:55.097] result() for ClusterFuture ... [18:41:55.098] - result already collected: FutureResult [18:41:55.098] result() for ClusterFuture ... done [18:41:55.098] result() for ClusterFuture ... [18:41:55.099] - result already collected: FutureResult [18:41:55.099] result() for ClusterFuture ... done [18:41:55.099] result() for ClusterFuture ... [18:41:55.100] - result already collected: FutureResult [18:41:55.100] result() for ClusterFuture ... done [18:41:55.100] result() for ClusterFuture ... [18:41:55.100] - result already collected: FutureResult [18:41:55.101] result() for ClusterFuture ... done [18:41:55.101] - relayed: [n=2] TRUE, TRUE [18:41:55.101] - queued futures: [n=2] TRUE, TRUE [18:41:55.102] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:55.102] length: 0 (resolved future 2) [18:41:55.102] Relaying remaining futures [18:41:55.103] signalConditionsASAP(NULL, pos=0) ... [18:41:55.103] - nx: 2 [18:41:55.103] - relay: TRUE [18:41:55.103] - stdout: TRUE [18:41:55.104] - signal: TRUE [18:41:55.104] - resignal: FALSE [18:41:55.104] - force: TRUE [18:41:55.104] - relayed: [n=2] TRUE, TRUE [18:41:55.105] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:55.105] - relayed: [n=2] TRUE, TRUE [18:41:55.106] - queued futures: [n=2] TRUE, TRUE [18:41:55.106] signalConditionsASAP(NULL, pos=0) ... done [18:41:55.106] resolve() on list ... DONE [18:41:55.106] result() for ClusterFuture ... [18:41:55.107] - result already collected: FutureResult [18:41:55.107] result() for ClusterFuture ... done [18:41:55.107] result() for ClusterFuture ... [18:41:55.108] - result already collected: FutureResult [18:41:55.108] result() for ClusterFuture ... done [18:41:55.108] result() for ClusterFuture ... [18:41:55.108] - result already collected: FutureResult [18:41:55.109] result() for ClusterFuture ... done [18:41:55.109] result() for ClusterFuture ... [18:41:55.109] - result already collected: FutureResult [18:41:55.110] result() for ClusterFuture ... done [18:41:55.110] - Number of value chunks collected: 2 [18:41:55.110] Resolving 2 futures (chunks) ... DONE [18:41:55.110] Reducing values from 2 chunks ... [18:41:55.111] - Number of values collected after concatenation: 4 [18:41:55.111] - Number of values expected: 4 [18:41:55.111] Reducing values from 2 chunks ... DONE [18:41:55.112] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y1:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y2:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 [18:41:55.134] future_lapply() ... [18:41:55.140] Number of chunks: 2 [18:41:55.140] getGlobalsAndPackagesXApply() ... [18:41:55.141] - future.globals: TRUE [18:41:55.141] getGlobalsAndPackages() ... [18:41:55.141] Searching for globals... [18:41:55.144] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:55.145] Searching for globals ... DONE [18:41:55.145] Resolving globals: FALSE [18:41:55.146] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:55.147] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:55.147] - globals: [1] 'FUN' [18:41:55.148] [18:41:55.148] getGlobalsAndPackages() ... DONE [18:41:55.148] - globals found/used: [n=1] 'FUN' [18:41:55.148] - needed namespaces: [n=0] [18:41:55.149] Finding globals ... DONE [18:41:55.149] - use_args: TRUE [18:41:55.149] - Getting '...' globals ... [18:41:55.150] resolve() on list ... [18:41:55.150] recursive: 0 [18:41:55.151] length: 1 [18:41:55.151] elements: '...' [18:41:55.151] length: 0 (resolved future 1) [18:41:55.152] resolve() on list ... DONE [18:41:55.152] - '...' content: [n=0] [18:41:55.152] List of 1 [18:41:55.152] $ ...: list() [18:41:55.152] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.152] - attr(*, "where")=List of 1 [18:41:55.152] ..$ ...: [18:41:55.152] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.152] - attr(*, "resolved")= logi TRUE [18:41:55.152] - attr(*, "total_size")= num NA [18:41:55.157] - Getting '...' globals ... DONE [18:41:55.158] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:55.158] List of 2 [18:41:55.158] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:55.158] $ ... : list() [18:41:55.158] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.158] - attr(*, "where")=List of 2 [18:41:55.158] ..$ ...future.FUN: [18:41:55.158] ..$ ... : [18:41:55.158] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.158] - attr(*, "resolved")= logi FALSE [18:41:55.158] - attr(*, "total_size")= int 6632 [18:41:55.164] Packages to be attached in all futures: [n=0] [18:41:55.165] getGlobalsAndPackagesXApply() ... DONE [18:41:55.165] Number of futures (= number of chunks): 2 [18:41:55.165] Launching 2 futures (chunks) ... [18:41:55.166] Chunk #1 of 2 ... [18:41:55.166] - Finding globals in 'X' for chunk #1 ... [18:41:55.166] getGlobalsAndPackages() ... [18:41:55.167] Searching for globals... [18:41:55.167] [18:41:55.168] Searching for globals ... DONE [18:41:55.168] - globals: [0] [18:41:55.168] getGlobalsAndPackages() ... DONE [18:41:55.168] + additional globals found: [n=0] [18:41:55.169] + additional namespaces needed: [n=0] [18:41:55.169] - Finding globals in 'X' for chunk #1 ... DONE [18:41:55.169] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.170] - seeds: [18:41:55.170] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.170] getGlobalsAndPackages() ... [18:41:55.170] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.171] Resolving globals: FALSE [18:41:55.171] Tweak future expression to call with '...' arguments ... [18:41:55.171] { [18:41:55.171] do.call(function(...) { [18:41:55.171] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.171] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.171] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.171] on.exit(options(oopts), add = TRUE) [18:41:55.171] } [18:41:55.171] { [18:41:55.171] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.171] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.171] ...future.FUN(...future.X_jj, ...) [18:41:55.171] }) [18:41:55.171] } [18:41:55.171] }, args = future.call.arguments) [18:41:55.171] } [18:41:55.172] Tweak future expression to call with '...' arguments ... DONE [18:41:55.173] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.173] [18:41:55.174] getGlobalsAndPackages() ... DONE [18:41:55.174] run() for 'Future' ... [18:41:55.175] - state: 'created' [18:41:55.175] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.192] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.193] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.193] - Field: 'node' [18:41:55.193] - Field: 'label' [18:41:55.193] - Field: 'local' [18:41:55.193] - Field: 'owner' [18:41:55.194] - Field: 'envir' [18:41:55.194] - Field: 'workers' [18:41:55.194] - Field: 'packages' [18:41:55.194] - Field: 'gc' [18:41:55.194] - Field: 'conditions' [18:41:55.194] - Field: 'persistent' [18:41:55.195] - Field: 'expr' [18:41:55.195] - Field: 'uuid' [18:41:55.195] - Field: 'seed' [18:41:55.195] - Field: 'version' [18:41:55.195] - Field: 'result' [18:41:55.196] - Field: 'asynchronous' [18:41:55.196] - Field: 'calls' [18:41:55.196] - Field: 'globals' [18:41:55.196] - Field: 'stdout' [18:41:55.196] - Field: 'earlySignal' [18:41:55.196] - Field: 'lazy' [18:41:55.197] - Field: 'state' [18:41:55.197] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.197] - Launch lazy future ... [18:41:55.197] Packages needed by the future expression (n = 0): [18:41:55.197] Packages needed by future strategies (n = 0): [18:41:55.198] { [18:41:55.198] { [18:41:55.198] { [18:41:55.198] ...future.startTime <- base::Sys.time() [18:41:55.198] { [18:41:55.198] { [18:41:55.198] { [18:41:55.198] { [18:41:55.198] base::local({ [18:41:55.198] has_future <- base::requireNamespace("future", [18:41:55.198] quietly = TRUE) [18:41:55.198] if (has_future) { [18:41:55.198] ns <- base::getNamespace("future") [18:41:55.198] version <- ns[[".package"]][["version"]] [18:41:55.198] if (is.null(version)) [18:41:55.198] version <- utils::packageVersion("future") [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] version <- NULL [18:41:55.198] } [18:41:55.198] if (!has_future || version < "1.8.0") { [18:41:55.198] info <- base::c(r_version = base::gsub("R version ", [18:41:55.198] "", base::R.version$version.string), [18:41:55.198] platform = base::sprintf("%s (%s-bit)", [18:41:55.198] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.198] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.198] "release", "version")], collapse = " "), [18:41:55.198] hostname = base::Sys.info()[["nodename"]]) [18:41:55.198] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.198] info) [18:41:55.198] info <- base::paste(info, collapse = "; ") [18:41:55.198] if (!has_future) { [18:41:55.198] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.198] info) [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.198] info, version) [18:41:55.198] } [18:41:55.198] base::stop(msg) [18:41:55.198] } [18:41:55.198] }) [18:41:55.198] } [18:41:55.198] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.198] base::options(mc.cores = 1L) [18:41:55.198] } [18:41:55.198] ...future.strategy.old <- future::plan("list") [18:41:55.198] options(future.plan = NULL) [18:41:55.198] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.198] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.198] } [18:41:55.198] ...future.workdir <- getwd() [18:41:55.198] } [18:41:55.198] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.198] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.198] } [18:41:55.198] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.198] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.198] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.198] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.198] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.198] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.198] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.198] base::names(...future.oldOptions)) [18:41:55.198] } [18:41:55.198] if (FALSE) { [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] if (TRUE) { [18:41:55.198] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.198] open = "w") [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.198] windows = "NUL", "/dev/null"), open = "w") [18:41:55.198] } [18:41:55.198] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.198] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.198] base::sink(type = "output", split = FALSE) [18:41:55.198] base::close(...future.stdout) [18:41:55.198] }, add = TRUE) [18:41:55.198] } [18:41:55.198] ...future.frame <- base::sys.nframe() [18:41:55.198] ...future.conditions <- base::list() [18:41:55.198] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.198] if (FALSE) { [18:41:55.198] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.198] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.198] } [18:41:55.198] ...future.result <- base::tryCatch({ [18:41:55.198] base::withCallingHandlers({ [18:41:55.198] ...future.value <- base::withVisible(base::local({ [18:41:55.198] ...future.makeSendCondition <- base::local({ [18:41:55.198] sendCondition <- NULL [18:41:55.198] function(frame = 1L) { [18:41:55.198] if (is.function(sendCondition)) [18:41:55.198] return(sendCondition) [18:41:55.198] ns <- getNamespace("parallel") [18:41:55.198] if (exists("sendData", mode = "function", [18:41:55.198] envir = ns)) { [18:41:55.198] parallel_sendData <- get("sendData", mode = "function", [18:41:55.198] envir = ns) [18:41:55.198] envir <- sys.frame(frame) [18:41:55.198] master <- NULL [18:41:55.198] while (!identical(envir, .GlobalEnv) && [18:41:55.198] !identical(envir, emptyenv())) { [18:41:55.198] if (exists("master", mode = "list", envir = envir, [18:41:55.198] inherits = FALSE)) { [18:41:55.198] master <- get("master", mode = "list", [18:41:55.198] envir = envir, inherits = FALSE) [18:41:55.198] if (inherits(master, c("SOCKnode", [18:41:55.198] "SOCK0node"))) { [18:41:55.198] sendCondition <<- function(cond) { [18:41:55.198] data <- list(type = "VALUE", value = cond, [18:41:55.198] success = TRUE) [18:41:55.198] parallel_sendData(master, data) [18:41:55.198] } [18:41:55.198] return(sendCondition) [18:41:55.198] } [18:41:55.198] } [18:41:55.198] frame <- frame + 1L [18:41:55.198] envir <- sys.frame(frame) [18:41:55.198] } [18:41:55.198] } [18:41:55.198] sendCondition <<- function(cond) NULL [18:41:55.198] } [18:41:55.198] }) [18:41:55.198] withCallingHandlers({ [18:41:55.198] { [18:41:55.198] do.call(function(...) { [18:41:55.198] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.198] if (!identical(...future.globals.maxSize.org, [18:41:55.198] ...future.globals.maxSize)) { [18:41:55.198] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.198] on.exit(options(oopts), add = TRUE) [18:41:55.198] } [18:41:55.198] { [18:41:55.198] lapply(seq_along(...future.elements_ii), [18:41:55.198] FUN = function(jj) { [18:41:55.198] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.198] ...future.FUN(...future.X_jj, ...) [18:41:55.198] }) [18:41:55.198] } [18:41:55.198] }, args = future.call.arguments) [18:41:55.198] } [18:41:55.198] }, immediateCondition = function(cond) { [18:41:55.198] sendCondition <- ...future.makeSendCondition() [18:41:55.198] sendCondition(cond) [18:41:55.198] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.198] { [18:41:55.198] inherits <- base::inherits [18:41:55.198] invokeRestart <- base::invokeRestart [18:41:55.198] is.null <- base::is.null [18:41:55.198] muffled <- FALSE [18:41:55.198] if (inherits(cond, "message")) { [18:41:55.198] muffled <- grepl(pattern, "muffleMessage") [18:41:55.198] if (muffled) [18:41:55.198] invokeRestart("muffleMessage") [18:41:55.198] } [18:41:55.198] else if (inherits(cond, "warning")) { [18:41:55.198] muffled <- grepl(pattern, "muffleWarning") [18:41:55.198] if (muffled) [18:41:55.198] invokeRestart("muffleWarning") [18:41:55.198] } [18:41:55.198] else if (inherits(cond, "condition")) { [18:41:55.198] if (!is.null(pattern)) { [18:41:55.198] computeRestarts <- base::computeRestarts [18:41:55.198] grepl <- base::grepl [18:41:55.198] restarts <- computeRestarts(cond) [18:41:55.198] for (restart in restarts) { [18:41:55.198] name <- restart$name [18:41:55.198] if (is.null(name)) [18:41:55.198] next [18:41:55.198] if (!grepl(pattern, name)) [18:41:55.198] next [18:41:55.198] invokeRestart(restart) [18:41:55.198] muffled <- TRUE [18:41:55.198] break [18:41:55.198] } [18:41:55.198] } [18:41:55.198] } [18:41:55.198] invisible(muffled) [18:41:55.198] } [18:41:55.198] muffleCondition(cond) [18:41:55.198] }) [18:41:55.198] })) [18:41:55.198] future::FutureResult(value = ...future.value$value, [18:41:55.198] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.198] ...future.rng), globalenv = if (FALSE) [18:41:55.198] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.198] ...future.globalenv.names)) [18:41:55.198] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.198] }, condition = base::local({ [18:41:55.198] c <- base::c [18:41:55.198] inherits <- base::inherits [18:41:55.198] invokeRestart <- base::invokeRestart [18:41:55.198] length <- base::length [18:41:55.198] list <- base::list [18:41:55.198] seq.int <- base::seq.int [18:41:55.198] signalCondition <- base::signalCondition [18:41:55.198] sys.calls <- base::sys.calls [18:41:55.198] `[[` <- base::`[[` [18:41:55.198] `+` <- base::`+` [18:41:55.198] `<<-` <- base::`<<-` [18:41:55.198] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.198] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.198] 3L)] [18:41:55.198] } [18:41:55.198] function(cond) { [18:41:55.198] is_error <- inherits(cond, "error") [18:41:55.198] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.198] NULL) [18:41:55.198] if (is_error) { [18:41:55.198] sessionInformation <- function() { [18:41:55.198] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.198] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.198] search = base::search(), system = base::Sys.info()) [18:41:55.198] } [18:41:55.198] ...future.conditions[[length(...future.conditions) + [18:41:55.198] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.198] cond$call), session = sessionInformation(), [18:41:55.198] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.198] signalCondition(cond) [18:41:55.198] } [18:41:55.198] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.198] "immediateCondition"))) { [18:41:55.198] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.198] ...future.conditions[[length(...future.conditions) + [18:41:55.198] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.198] if (TRUE && !signal) { [18:41:55.198] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.198] { [18:41:55.198] inherits <- base::inherits [18:41:55.198] invokeRestart <- base::invokeRestart [18:41:55.198] is.null <- base::is.null [18:41:55.198] muffled <- FALSE [18:41:55.198] if (inherits(cond, "message")) { [18:41:55.198] muffled <- grepl(pattern, "muffleMessage") [18:41:55.198] if (muffled) [18:41:55.198] invokeRestart("muffleMessage") [18:41:55.198] } [18:41:55.198] else if (inherits(cond, "warning")) { [18:41:55.198] muffled <- grepl(pattern, "muffleWarning") [18:41:55.198] if (muffled) [18:41:55.198] invokeRestart("muffleWarning") [18:41:55.198] } [18:41:55.198] else if (inherits(cond, "condition")) { [18:41:55.198] if (!is.null(pattern)) { [18:41:55.198] computeRestarts <- base::computeRestarts [18:41:55.198] grepl <- base::grepl [18:41:55.198] restarts <- computeRestarts(cond) [18:41:55.198] for (restart in restarts) { [18:41:55.198] name <- restart$name [18:41:55.198] if (is.null(name)) [18:41:55.198] next [18:41:55.198] if (!grepl(pattern, name)) [18:41:55.198] next [18:41:55.198] invokeRestart(restart) [18:41:55.198] muffled <- TRUE [18:41:55.198] break [18:41:55.198] } [18:41:55.198] } [18:41:55.198] } [18:41:55.198] invisible(muffled) [18:41:55.198] } [18:41:55.198] muffleCondition(cond, pattern = "^muffle") [18:41:55.198] } [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] if (TRUE) { [18:41:55.198] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.198] { [18:41:55.198] inherits <- base::inherits [18:41:55.198] invokeRestart <- base::invokeRestart [18:41:55.198] is.null <- base::is.null [18:41:55.198] muffled <- FALSE [18:41:55.198] if (inherits(cond, "message")) { [18:41:55.198] muffled <- grepl(pattern, "muffleMessage") [18:41:55.198] if (muffled) [18:41:55.198] invokeRestart("muffleMessage") [18:41:55.198] } [18:41:55.198] else if (inherits(cond, "warning")) { [18:41:55.198] muffled <- grepl(pattern, "muffleWarning") [18:41:55.198] if (muffled) [18:41:55.198] invokeRestart("muffleWarning") [18:41:55.198] } [18:41:55.198] else if (inherits(cond, "condition")) { [18:41:55.198] if (!is.null(pattern)) { [18:41:55.198] computeRestarts <- base::computeRestarts [18:41:55.198] grepl <- base::grepl [18:41:55.198] restarts <- computeRestarts(cond) [18:41:55.198] for (restart in restarts) { [18:41:55.198] name <- restart$name [18:41:55.198] if (is.null(name)) [18:41:55.198] next [18:41:55.198] if (!grepl(pattern, name)) [18:41:55.198] next [18:41:55.198] invokeRestart(restart) [18:41:55.198] muffled <- TRUE [18:41:55.198] break [18:41:55.198] } [18:41:55.198] } [18:41:55.198] } [18:41:55.198] invisible(muffled) [18:41:55.198] } [18:41:55.198] muffleCondition(cond, pattern = "^muffle") [18:41:55.198] } [18:41:55.198] } [18:41:55.198] } [18:41:55.198] })) [18:41:55.198] }, error = function(ex) { [18:41:55.198] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.198] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.198] ...future.rng), started = ...future.startTime, [18:41:55.198] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.198] version = "1.8"), class = "FutureResult") [18:41:55.198] }, finally = { [18:41:55.198] if (!identical(...future.workdir, getwd())) [18:41:55.198] setwd(...future.workdir) [18:41:55.198] { [18:41:55.198] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.198] ...future.oldOptions$nwarnings <- NULL [18:41:55.198] } [18:41:55.198] base::options(...future.oldOptions) [18:41:55.198] if (.Platform$OS.type == "windows") { [18:41:55.198] old_names <- names(...future.oldEnvVars) [18:41:55.198] envs <- base::Sys.getenv() [18:41:55.198] names <- names(envs) [18:41:55.198] common <- intersect(names, old_names) [18:41:55.198] added <- setdiff(names, old_names) [18:41:55.198] removed <- setdiff(old_names, names) [18:41:55.198] changed <- common[...future.oldEnvVars[common] != [18:41:55.198] envs[common]] [18:41:55.198] NAMES <- toupper(changed) [18:41:55.198] args <- list() [18:41:55.198] for (kk in seq_along(NAMES)) { [18:41:55.198] name <- changed[[kk]] [18:41:55.198] NAME <- NAMES[[kk]] [18:41:55.198] if (name != NAME && is.element(NAME, old_names)) [18:41:55.198] next [18:41:55.198] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.198] } [18:41:55.198] NAMES <- toupper(added) [18:41:55.198] for (kk in seq_along(NAMES)) { [18:41:55.198] name <- added[[kk]] [18:41:55.198] NAME <- NAMES[[kk]] [18:41:55.198] if (name != NAME && is.element(NAME, old_names)) [18:41:55.198] next [18:41:55.198] args[[name]] <- "" [18:41:55.198] } [18:41:55.198] NAMES <- toupper(removed) [18:41:55.198] for (kk in seq_along(NAMES)) { [18:41:55.198] name <- removed[[kk]] [18:41:55.198] NAME <- NAMES[[kk]] [18:41:55.198] if (name != NAME && is.element(NAME, old_names)) [18:41:55.198] next [18:41:55.198] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.198] } [18:41:55.198] if (length(args) > 0) [18:41:55.198] base::do.call(base::Sys.setenv, args = args) [18:41:55.198] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.198] } [18:41:55.198] { [18:41:55.198] if (base::length(...future.futureOptionsAdded) > [18:41:55.198] 0L) { [18:41:55.198] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.198] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.198] base::options(opts) [18:41:55.198] } [18:41:55.198] { [18:41:55.198] { [18:41:55.198] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.198] NULL [18:41:55.198] } [18:41:55.198] options(future.plan = NULL) [18:41:55.198] if (is.na(NA_character_)) [18:41:55.198] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.198] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.198] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.198] .init = FALSE) [18:41:55.198] } [18:41:55.198] } [18:41:55.198] } [18:41:55.198] }) [18:41:55.198] if (TRUE) { [18:41:55.198] base::sink(type = "output", split = FALSE) [18:41:55.198] if (TRUE) { [18:41:55.198] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.198] } [18:41:55.198] else { [18:41:55.198] ...future.result["stdout"] <- base::list(NULL) [18:41:55.198] } [18:41:55.198] base::close(...future.stdout) [18:41:55.198] ...future.stdout <- NULL [18:41:55.198] } [18:41:55.198] ...future.result$conditions <- ...future.conditions [18:41:55.198] ...future.result$finished <- base::Sys.time() [18:41:55.198] ...future.result [18:41:55.198] } [18:41:55.203] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:55.204] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:55.204] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:55.204] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.205] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.205] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.205] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.206] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.206] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.206] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.207] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.207] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:55.208] MultisessionFuture started [18:41:55.208] - Launch lazy future ... done [18:41:55.208] run() for 'MultisessionFuture' ... done [18:41:55.208] Created future: [18:41:55.224] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.224] - Validating connection of MultisessionFuture [18:41:55.224] - received message: FutureResult [18:41:55.224] - Received FutureResult [18:41:55.225] - Erased future from FutureRegistry [18:41:55.225] result() for ClusterFuture ... [18:41:55.225] - result already collected: FutureResult [18:41:55.225] result() for ClusterFuture ... done [18:41:55.225] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.208] MultisessionFuture: [18:41:55.208] Label: 'future_sapply-1' [18:41:55.208] Expression: [18:41:55.208] { [18:41:55.208] do.call(function(...) { [18:41:55.208] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.208] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.208] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.208] on.exit(options(oopts), add = TRUE) [18:41:55.208] } [18:41:55.208] { [18:41:55.208] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.208] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.208] ...future.FUN(...future.X_jj, ...) [18:41:55.208] }) [18:41:55.208] } [18:41:55.208] }, args = future.call.arguments) [18:41:55.208] } [18:41:55.208] Lazy evaluation: FALSE [18:41:55.208] Asynchronous evaluation: TRUE [18:41:55.208] Local evaluation: TRUE [18:41:55.208] Environment: R_GlobalEnv [18:41:55.208] Capture standard output: TRUE [18:41:55.208] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.208] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.208] Packages: [18:41:55.208] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.208] Resolved: TRUE [18:41:55.208] Value: [18:41:55.208] Conditions captured: [18:41:55.208] Early signaling: FALSE [18:41:55.208] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.208] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.226] Chunk #1 of 2 ... DONE [18:41:55.226] Chunk #2 of 2 ... [18:41:55.226] - Finding globals in 'X' for chunk #2 ... [18:41:55.226] getGlobalsAndPackages() ... [18:41:55.226] Searching for globals... [18:41:55.227] [18:41:55.227] Searching for globals ... DONE [18:41:55.227] - globals: [0] [18:41:55.227] getGlobalsAndPackages() ... DONE [18:41:55.227] + additional globals found: [n=0] [18:41:55.228] + additional namespaces needed: [n=0] [18:41:55.228] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.228] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.228] - seeds: [18:41:55.228] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.228] getGlobalsAndPackages() ... [18:41:55.228] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.229] Resolving globals: FALSE [18:41:55.229] Tweak future expression to call with '...' arguments ... [18:41:55.229] { [18:41:55.229] do.call(function(...) { [18:41:55.229] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.229] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.229] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.229] on.exit(options(oopts), add = TRUE) [18:41:55.229] } [18:41:55.229] { [18:41:55.229] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.229] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.229] ...future.FUN(...future.X_jj, ...) [18:41:55.229] }) [18:41:55.229] } [18:41:55.229] }, args = future.call.arguments) [18:41:55.229] } [18:41:55.229] Tweak future expression to call with '...' arguments ... DONE [18:41:55.230] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.230] [18:41:55.230] getGlobalsAndPackages() ... DONE [18:41:55.231] run() for 'Future' ... [18:41:55.231] - state: 'created' [18:41:55.231] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.246] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.246] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.246] - Field: 'node' [18:41:55.247] - Field: 'label' [18:41:55.247] - Field: 'local' [18:41:55.247] - Field: 'owner' [18:41:55.247] - Field: 'envir' [18:41:55.247] - Field: 'workers' [18:41:55.248] - Field: 'packages' [18:41:55.248] - Field: 'gc' [18:41:55.248] - Field: 'conditions' [18:41:55.248] - Field: 'persistent' [18:41:55.248] - Field: 'expr' [18:41:55.248] - Field: 'uuid' [18:41:55.249] - Field: 'seed' [18:41:55.249] - Field: 'version' [18:41:55.249] - Field: 'result' [18:41:55.249] - Field: 'asynchronous' [18:41:55.249] - Field: 'calls' [18:41:55.250] - Field: 'globals' [18:41:55.250] - Field: 'stdout' [18:41:55.250] - Field: 'earlySignal' [18:41:55.250] - Field: 'lazy' [18:41:55.250] - Field: 'state' [18:41:55.250] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.251] - Launch lazy future ... [18:41:55.251] Packages needed by the future expression (n = 0): [18:41:55.251] Packages needed by future strategies (n = 0): [18:41:55.252] { [18:41:55.252] { [18:41:55.252] { [18:41:55.252] ...future.startTime <- base::Sys.time() [18:41:55.252] { [18:41:55.252] { [18:41:55.252] { [18:41:55.252] { [18:41:55.252] base::local({ [18:41:55.252] has_future <- base::requireNamespace("future", [18:41:55.252] quietly = TRUE) [18:41:55.252] if (has_future) { [18:41:55.252] ns <- base::getNamespace("future") [18:41:55.252] version <- ns[[".package"]][["version"]] [18:41:55.252] if (is.null(version)) [18:41:55.252] version <- utils::packageVersion("future") [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] version <- NULL [18:41:55.252] } [18:41:55.252] if (!has_future || version < "1.8.0") { [18:41:55.252] info <- base::c(r_version = base::gsub("R version ", [18:41:55.252] "", base::R.version$version.string), [18:41:55.252] platform = base::sprintf("%s (%s-bit)", [18:41:55.252] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.252] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.252] "release", "version")], collapse = " "), [18:41:55.252] hostname = base::Sys.info()[["nodename"]]) [18:41:55.252] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.252] info) [18:41:55.252] info <- base::paste(info, collapse = "; ") [18:41:55.252] if (!has_future) { [18:41:55.252] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.252] info) [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.252] info, version) [18:41:55.252] } [18:41:55.252] base::stop(msg) [18:41:55.252] } [18:41:55.252] }) [18:41:55.252] } [18:41:55.252] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.252] base::options(mc.cores = 1L) [18:41:55.252] } [18:41:55.252] ...future.strategy.old <- future::plan("list") [18:41:55.252] options(future.plan = NULL) [18:41:55.252] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.252] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.252] } [18:41:55.252] ...future.workdir <- getwd() [18:41:55.252] } [18:41:55.252] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.252] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.252] } [18:41:55.252] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.252] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.252] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.252] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.252] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.252] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.252] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.252] base::names(...future.oldOptions)) [18:41:55.252] } [18:41:55.252] if (FALSE) { [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] if (TRUE) { [18:41:55.252] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.252] open = "w") [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.252] windows = "NUL", "/dev/null"), open = "w") [18:41:55.252] } [18:41:55.252] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.252] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.252] base::sink(type = "output", split = FALSE) [18:41:55.252] base::close(...future.stdout) [18:41:55.252] }, add = TRUE) [18:41:55.252] } [18:41:55.252] ...future.frame <- base::sys.nframe() [18:41:55.252] ...future.conditions <- base::list() [18:41:55.252] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.252] if (FALSE) { [18:41:55.252] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.252] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.252] } [18:41:55.252] ...future.result <- base::tryCatch({ [18:41:55.252] base::withCallingHandlers({ [18:41:55.252] ...future.value <- base::withVisible(base::local({ [18:41:55.252] ...future.makeSendCondition <- base::local({ [18:41:55.252] sendCondition <- NULL [18:41:55.252] function(frame = 1L) { [18:41:55.252] if (is.function(sendCondition)) [18:41:55.252] return(sendCondition) [18:41:55.252] ns <- getNamespace("parallel") [18:41:55.252] if (exists("sendData", mode = "function", [18:41:55.252] envir = ns)) { [18:41:55.252] parallel_sendData <- get("sendData", mode = "function", [18:41:55.252] envir = ns) [18:41:55.252] envir <- sys.frame(frame) [18:41:55.252] master <- NULL [18:41:55.252] while (!identical(envir, .GlobalEnv) && [18:41:55.252] !identical(envir, emptyenv())) { [18:41:55.252] if (exists("master", mode = "list", envir = envir, [18:41:55.252] inherits = FALSE)) { [18:41:55.252] master <- get("master", mode = "list", [18:41:55.252] envir = envir, inherits = FALSE) [18:41:55.252] if (inherits(master, c("SOCKnode", [18:41:55.252] "SOCK0node"))) { [18:41:55.252] sendCondition <<- function(cond) { [18:41:55.252] data <- list(type = "VALUE", value = cond, [18:41:55.252] success = TRUE) [18:41:55.252] parallel_sendData(master, data) [18:41:55.252] } [18:41:55.252] return(sendCondition) [18:41:55.252] } [18:41:55.252] } [18:41:55.252] frame <- frame + 1L [18:41:55.252] envir <- sys.frame(frame) [18:41:55.252] } [18:41:55.252] } [18:41:55.252] sendCondition <<- function(cond) NULL [18:41:55.252] } [18:41:55.252] }) [18:41:55.252] withCallingHandlers({ [18:41:55.252] { [18:41:55.252] do.call(function(...) { [18:41:55.252] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.252] if (!identical(...future.globals.maxSize.org, [18:41:55.252] ...future.globals.maxSize)) { [18:41:55.252] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.252] on.exit(options(oopts), add = TRUE) [18:41:55.252] } [18:41:55.252] { [18:41:55.252] lapply(seq_along(...future.elements_ii), [18:41:55.252] FUN = function(jj) { [18:41:55.252] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.252] ...future.FUN(...future.X_jj, ...) [18:41:55.252] }) [18:41:55.252] } [18:41:55.252] }, args = future.call.arguments) [18:41:55.252] } [18:41:55.252] }, immediateCondition = function(cond) { [18:41:55.252] sendCondition <- ...future.makeSendCondition() [18:41:55.252] sendCondition(cond) [18:41:55.252] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.252] { [18:41:55.252] inherits <- base::inherits [18:41:55.252] invokeRestart <- base::invokeRestart [18:41:55.252] is.null <- base::is.null [18:41:55.252] muffled <- FALSE [18:41:55.252] if (inherits(cond, "message")) { [18:41:55.252] muffled <- grepl(pattern, "muffleMessage") [18:41:55.252] if (muffled) [18:41:55.252] invokeRestart("muffleMessage") [18:41:55.252] } [18:41:55.252] else if (inherits(cond, "warning")) { [18:41:55.252] muffled <- grepl(pattern, "muffleWarning") [18:41:55.252] if (muffled) [18:41:55.252] invokeRestart("muffleWarning") [18:41:55.252] } [18:41:55.252] else if (inherits(cond, "condition")) { [18:41:55.252] if (!is.null(pattern)) { [18:41:55.252] computeRestarts <- base::computeRestarts [18:41:55.252] grepl <- base::grepl [18:41:55.252] restarts <- computeRestarts(cond) [18:41:55.252] for (restart in restarts) { [18:41:55.252] name <- restart$name [18:41:55.252] if (is.null(name)) [18:41:55.252] next [18:41:55.252] if (!grepl(pattern, name)) [18:41:55.252] next [18:41:55.252] invokeRestart(restart) [18:41:55.252] muffled <- TRUE [18:41:55.252] break [18:41:55.252] } [18:41:55.252] } [18:41:55.252] } [18:41:55.252] invisible(muffled) [18:41:55.252] } [18:41:55.252] muffleCondition(cond) [18:41:55.252] }) [18:41:55.252] })) [18:41:55.252] future::FutureResult(value = ...future.value$value, [18:41:55.252] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.252] ...future.rng), globalenv = if (FALSE) [18:41:55.252] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.252] ...future.globalenv.names)) [18:41:55.252] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.252] }, condition = base::local({ [18:41:55.252] c <- base::c [18:41:55.252] inherits <- base::inherits [18:41:55.252] invokeRestart <- base::invokeRestart [18:41:55.252] length <- base::length [18:41:55.252] list <- base::list [18:41:55.252] seq.int <- base::seq.int [18:41:55.252] signalCondition <- base::signalCondition [18:41:55.252] sys.calls <- base::sys.calls [18:41:55.252] `[[` <- base::`[[` [18:41:55.252] `+` <- base::`+` [18:41:55.252] `<<-` <- base::`<<-` [18:41:55.252] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.252] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.252] 3L)] [18:41:55.252] } [18:41:55.252] function(cond) { [18:41:55.252] is_error <- inherits(cond, "error") [18:41:55.252] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.252] NULL) [18:41:55.252] if (is_error) { [18:41:55.252] sessionInformation <- function() { [18:41:55.252] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.252] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.252] search = base::search(), system = base::Sys.info()) [18:41:55.252] } [18:41:55.252] ...future.conditions[[length(...future.conditions) + [18:41:55.252] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.252] cond$call), session = sessionInformation(), [18:41:55.252] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.252] signalCondition(cond) [18:41:55.252] } [18:41:55.252] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.252] "immediateCondition"))) { [18:41:55.252] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.252] ...future.conditions[[length(...future.conditions) + [18:41:55.252] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.252] if (TRUE && !signal) { [18:41:55.252] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.252] { [18:41:55.252] inherits <- base::inherits [18:41:55.252] invokeRestart <- base::invokeRestart [18:41:55.252] is.null <- base::is.null [18:41:55.252] muffled <- FALSE [18:41:55.252] if (inherits(cond, "message")) { [18:41:55.252] muffled <- grepl(pattern, "muffleMessage") [18:41:55.252] if (muffled) [18:41:55.252] invokeRestart("muffleMessage") [18:41:55.252] } [18:41:55.252] else if (inherits(cond, "warning")) { [18:41:55.252] muffled <- grepl(pattern, "muffleWarning") [18:41:55.252] if (muffled) [18:41:55.252] invokeRestart("muffleWarning") [18:41:55.252] } [18:41:55.252] else if (inherits(cond, "condition")) { [18:41:55.252] if (!is.null(pattern)) { [18:41:55.252] computeRestarts <- base::computeRestarts [18:41:55.252] grepl <- base::grepl [18:41:55.252] restarts <- computeRestarts(cond) [18:41:55.252] for (restart in restarts) { [18:41:55.252] name <- restart$name [18:41:55.252] if (is.null(name)) [18:41:55.252] next [18:41:55.252] if (!grepl(pattern, name)) [18:41:55.252] next [18:41:55.252] invokeRestart(restart) [18:41:55.252] muffled <- TRUE [18:41:55.252] break [18:41:55.252] } [18:41:55.252] } [18:41:55.252] } [18:41:55.252] invisible(muffled) [18:41:55.252] } [18:41:55.252] muffleCondition(cond, pattern = "^muffle") [18:41:55.252] } [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] if (TRUE) { [18:41:55.252] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.252] { [18:41:55.252] inherits <- base::inherits [18:41:55.252] invokeRestart <- base::invokeRestart [18:41:55.252] is.null <- base::is.null [18:41:55.252] muffled <- FALSE [18:41:55.252] if (inherits(cond, "message")) { [18:41:55.252] muffled <- grepl(pattern, "muffleMessage") [18:41:55.252] if (muffled) [18:41:55.252] invokeRestart("muffleMessage") [18:41:55.252] } [18:41:55.252] else if (inherits(cond, "warning")) { [18:41:55.252] muffled <- grepl(pattern, "muffleWarning") [18:41:55.252] if (muffled) [18:41:55.252] invokeRestart("muffleWarning") [18:41:55.252] } [18:41:55.252] else if (inherits(cond, "condition")) { [18:41:55.252] if (!is.null(pattern)) { [18:41:55.252] computeRestarts <- base::computeRestarts [18:41:55.252] grepl <- base::grepl [18:41:55.252] restarts <- computeRestarts(cond) [18:41:55.252] for (restart in restarts) { [18:41:55.252] name <- restart$name [18:41:55.252] if (is.null(name)) [18:41:55.252] next [18:41:55.252] if (!grepl(pattern, name)) [18:41:55.252] next [18:41:55.252] invokeRestart(restart) [18:41:55.252] muffled <- TRUE [18:41:55.252] break [18:41:55.252] } [18:41:55.252] } [18:41:55.252] } [18:41:55.252] invisible(muffled) [18:41:55.252] } [18:41:55.252] muffleCondition(cond, pattern = "^muffle") [18:41:55.252] } [18:41:55.252] } [18:41:55.252] } [18:41:55.252] })) [18:41:55.252] }, error = function(ex) { [18:41:55.252] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.252] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.252] ...future.rng), started = ...future.startTime, [18:41:55.252] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.252] version = "1.8"), class = "FutureResult") [18:41:55.252] }, finally = { [18:41:55.252] if (!identical(...future.workdir, getwd())) [18:41:55.252] setwd(...future.workdir) [18:41:55.252] { [18:41:55.252] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.252] ...future.oldOptions$nwarnings <- NULL [18:41:55.252] } [18:41:55.252] base::options(...future.oldOptions) [18:41:55.252] if (.Platform$OS.type == "windows") { [18:41:55.252] old_names <- names(...future.oldEnvVars) [18:41:55.252] envs <- base::Sys.getenv() [18:41:55.252] names <- names(envs) [18:41:55.252] common <- intersect(names, old_names) [18:41:55.252] added <- setdiff(names, old_names) [18:41:55.252] removed <- setdiff(old_names, names) [18:41:55.252] changed <- common[...future.oldEnvVars[common] != [18:41:55.252] envs[common]] [18:41:55.252] NAMES <- toupper(changed) [18:41:55.252] args <- list() [18:41:55.252] for (kk in seq_along(NAMES)) { [18:41:55.252] name <- changed[[kk]] [18:41:55.252] NAME <- NAMES[[kk]] [18:41:55.252] if (name != NAME && is.element(NAME, old_names)) [18:41:55.252] next [18:41:55.252] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.252] } [18:41:55.252] NAMES <- toupper(added) [18:41:55.252] for (kk in seq_along(NAMES)) { [18:41:55.252] name <- added[[kk]] [18:41:55.252] NAME <- NAMES[[kk]] [18:41:55.252] if (name != NAME && is.element(NAME, old_names)) [18:41:55.252] next [18:41:55.252] args[[name]] <- "" [18:41:55.252] } [18:41:55.252] NAMES <- toupper(removed) [18:41:55.252] for (kk in seq_along(NAMES)) { [18:41:55.252] name <- removed[[kk]] [18:41:55.252] NAME <- NAMES[[kk]] [18:41:55.252] if (name != NAME && is.element(NAME, old_names)) [18:41:55.252] next [18:41:55.252] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.252] } [18:41:55.252] if (length(args) > 0) [18:41:55.252] base::do.call(base::Sys.setenv, args = args) [18:41:55.252] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.252] } [18:41:55.252] { [18:41:55.252] if (base::length(...future.futureOptionsAdded) > [18:41:55.252] 0L) { [18:41:55.252] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.252] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.252] base::options(opts) [18:41:55.252] } [18:41:55.252] { [18:41:55.252] { [18:41:55.252] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.252] NULL [18:41:55.252] } [18:41:55.252] options(future.plan = NULL) [18:41:55.252] if (is.na(NA_character_)) [18:41:55.252] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.252] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.252] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.252] .init = FALSE) [18:41:55.252] } [18:41:55.252] } [18:41:55.252] } [18:41:55.252] }) [18:41:55.252] if (TRUE) { [18:41:55.252] base::sink(type = "output", split = FALSE) [18:41:55.252] if (TRUE) { [18:41:55.252] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.252] } [18:41:55.252] else { [18:41:55.252] ...future.result["stdout"] <- base::list(NULL) [18:41:55.252] } [18:41:55.252] base::close(...future.stdout) [18:41:55.252] ...future.stdout <- NULL [18:41:55.252] } [18:41:55.252] ...future.result$conditions <- ...future.conditions [18:41:55.252] ...future.result$finished <- base::Sys.time() [18:41:55.252] ...future.result [18:41:55.252] } [18:41:55.257] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:55.257] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:55.258] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:55.258] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.258] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.259] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.259] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.259] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.260] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.260] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.260] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.260] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:55.261] MultisessionFuture started [18:41:55.261] - Launch lazy future ... done [18:41:55.261] run() for 'MultisessionFuture' ... done [18:41:55.262] Created future: [18:41:55.276] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.276] - Validating connection of MultisessionFuture [18:41:55.277] - received message: FutureResult [18:41:55.277] - Received FutureResult [18:41:55.277] - Erased future from FutureRegistry [18:41:55.277] result() for ClusterFuture ... [18:41:55.277] - result already collected: FutureResult [18:41:55.277] result() for ClusterFuture ... done [18:41:55.278] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.262] MultisessionFuture: [18:41:55.262] Label: 'future_sapply-2' [18:41:55.262] Expression: [18:41:55.262] { [18:41:55.262] do.call(function(...) { [18:41:55.262] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.262] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.262] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.262] on.exit(options(oopts), add = TRUE) [18:41:55.262] } [18:41:55.262] { [18:41:55.262] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.262] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.262] ...future.FUN(...future.X_jj, ...) [18:41:55.262] }) [18:41:55.262] } [18:41:55.262] }, args = future.call.arguments) [18:41:55.262] } [18:41:55.262] Lazy evaluation: FALSE [18:41:55.262] Asynchronous evaluation: TRUE [18:41:55.262] Local evaluation: TRUE [18:41:55.262] Environment: R_GlobalEnv [18:41:55.262] Capture standard output: TRUE [18:41:55.262] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.262] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.262] Packages: [18:41:55.262] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.262] Resolved: TRUE [18:41:55.262] Value: [18:41:55.262] Conditions captured: [18:41:55.262] Early signaling: FALSE [18:41:55.262] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.262] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.278] Chunk #2 of 2 ... DONE [18:41:55.278] Launching 2 futures (chunks) ... DONE [18:41:55.278] Resolving 2 futures (chunks) ... [18:41:55.279] resolve() on list ... [18:41:55.279] recursive: 0 [18:41:55.279] length: 2 [18:41:55.279] [18:41:55.279] Future #1 [18:41:55.279] result() for ClusterFuture ... [18:41:55.280] - result already collected: FutureResult [18:41:55.280] result() for ClusterFuture ... done [18:41:55.280] result() for ClusterFuture ... [18:41:55.280] - result already collected: FutureResult [18:41:55.280] result() for ClusterFuture ... done [18:41:55.280] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:55.281] - nx: 2 [18:41:55.281] - relay: TRUE [18:41:55.281] - stdout: TRUE [18:41:55.281] - signal: TRUE [18:41:55.281] - resignal: FALSE [18:41:55.281] - force: TRUE [18:41:55.281] - relayed: [n=2] FALSE, FALSE [18:41:55.282] - queued futures: [n=2] FALSE, FALSE [18:41:55.282] - until=1 [18:41:55.282] - relaying element #1 [18:41:55.282] result() for ClusterFuture ... [18:41:55.282] - result already collected: FutureResult [18:41:55.282] result() for ClusterFuture ... done [18:41:55.283] result() for ClusterFuture ... [18:41:55.283] - result already collected: FutureResult [18:41:55.283] result() for ClusterFuture ... done [18:41:55.283] result() for ClusterFuture ... [18:41:55.283] - result already collected: FutureResult [18:41:55.283] result() for ClusterFuture ... done [18:41:55.284] result() for ClusterFuture ... [18:41:55.284] - result already collected: FutureResult [18:41:55.284] result() for ClusterFuture ... done [18:41:55.284] - relayed: [n=2] TRUE, FALSE [18:41:55.284] - queued futures: [n=2] TRUE, FALSE [18:41:55.284] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:55.285] length: 1 (resolved future 1) [18:41:55.285] Future #2 [18:41:55.285] result() for ClusterFuture ... [18:41:55.285] - result already collected: FutureResult [18:41:55.285] result() for ClusterFuture ... done [18:41:55.285] result() for ClusterFuture ... [18:41:55.286] - result already collected: FutureResult [18:41:55.286] result() for ClusterFuture ... done [18:41:55.286] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:55.286] - nx: 2 [18:41:55.286] - relay: TRUE [18:41:55.286] - stdout: TRUE [18:41:55.286] - signal: TRUE [18:41:55.287] - resignal: FALSE [18:41:55.287] - force: TRUE [18:41:55.287] - relayed: [n=2] TRUE, FALSE [18:41:55.287] - queued futures: [n=2] TRUE, FALSE [18:41:55.287] - until=2 [18:41:55.287] - relaying element #2 [18:41:55.288] result() for ClusterFuture ... [18:41:55.288] - result already collected: FutureResult [18:41:55.288] result() for ClusterFuture ... done [18:41:55.288] result() for ClusterFuture ... [18:41:55.288] - result already collected: FutureResult [18:41:55.288] result() for ClusterFuture ... done [18:41:55.289] result() for ClusterFuture ... [18:41:55.289] - result already collected: FutureResult [18:41:55.289] result() for ClusterFuture ... done [18:41:55.289] result() for ClusterFuture ... [18:41:55.289] - result already collected: FutureResult [18:41:55.289] result() for ClusterFuture ... done [18:41:55.289] - relayed: [n=2] TRUE, TRUE [18:41:55.290] - queued futures: [n=2] TRUE, TRUE [18:41:55.290] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:55.290] length: 0 (resolved future 2) [18:41:55.290] Relaying remaining futures [18:41:55.290] signalConditionsASAP(NULL, pos=0) ... [18:41:55.290] - nx: 2 [18:41:55.291] - relay: TRUE [18:41:55.291] - stdout: TRUE [18:41:55.291] - signal: TRUE [18:41:55.291] - resignal: FALSE [18:41:55.291] - force: TRUE [18:41:55.291] - relayed: [n=2] TRUE, TRUE [18:41:55.291] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:55.292] - relayed: [n=2] TRUE, TRUE [18:41:55.292] - queued futures: [n=2] TRUE, TRUE [18:41:55.292] signalConditionsASAP(NULL, pos=0) ... done [18:41:55.292] resolve() on list ... DONE [18:41:55.292] result() for ClusterFuture ... [18:41:55.292] - result already collected: FutureResult [18:41:55.293] result() for ClusterFuture ... done [18:41:55.293] result() for ClusterFuture ... [18:41:55.293] - result already collected: FutureResult [18:41:55.293] result() for ClusterFuture ... done [18:41:55.293] result() for ClusterFuture ... [18:41:55.293] - result already collected: FutureResult [18:41:55.294] result() for ClusterFuture ... done [18:41:55.294] result() for ClusterFuture ... [18:41:55.294] - result already collected: FutureResult [18:41:55.294] result() for ClusterFuture ... done [18:41:55.294] - Number of value chunks collected: 2 [18:41:55.294] Resolving 2 futures (chunks) ... DONE [18:41:55.295] Reducing values from 2 chunks ... [18:41:55.295] - Number of values collected after concatenation: 4 [18:41:55.295] - Number of values expected: 4 [18:41:55.295] Reducing values from 2 chunks ... DONE [18:41:55.295] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y1:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y2:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... [18:41:55.308] future_lapply() ... [18:41:55.311] Number of chunks: 2 [18:41:55.311] getGlobalsAndPackagesXApply() ... [18:41:55.311] - future.globals: TRUE [18:41:55.311] getGlobalsAndPackages() ... [18:41:55.312] Searching for globals... [18:41:55.313] - globals found: [1] 'FUN' [18:41:55.313] Searching for globals ... DONE [18:41:55.313] Resolving globals: FALSE [18:41:55.314] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:55.314] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:55.314] - globals: [1] 'FUN' [18:41:55.314] [18:41:55.315] getGlobalsAndPackages() ... DONE [18:41:55.315] - globals found/used: [n=1] 'FUN' [18:41:55.315] - needed namespaces: [n=0] [18:41:55.315] Finding globals ... DONE [18:41:55.315] - use_args: TRUE [18:41:55.315] - Getting '...' globals ... [18:41:55.316] resolve() on list ... [18:41:55.316] recursive: 0 [18:41:55.316] length: 1 [18:41:55.316] elements: '...' [18:41:55.316] length: 0 (resolved future 1) [18:41:55.317] resolve() on list ... DONE [18:41:55.317] - '...' content: [n=0] [18:41:55.317] List of 1 [18:41:55.317] $ ...: list() [18:41:55.317] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.317] - attr(*, "where")=List of 1 [18:41:55.317] ..$ ...: [18:41:55.317] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.317] - attr(*, "resolved")= logi TRUE [18:41:55.317] - attr(*, "total_size")= num NA [18:41:55.320] - Getting '...' globals ... DONE [18:41:55.320] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:55.320] List of 2 [18:41:55.320] $ ...future.FUN:function (x) [18:41:55.320] $ ... : list() [18:41:55.320] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.320] - attr(*, "where")=List of 2 [18:41:55.320] ..$ ...future.FUN: [18:41:55.320] ..$ ... : [18:41:55.320] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.320] - attr(*, "resolved")= logi FALSE [18:41:55.320] - attr(*, "total_size")= int 4910 [18:41:55.324] Packages to be attached in all futures: [n=0] [18:41:55.324] getGlobalsAndPackagesXApply() ... DONE [18:41:55.324] Number of futures (= number of chunks): 2 [18:41:55.324] Launching 2 futures (chunks) ... [18:41:55.324] Chunk #1 of 2 ... [18:41:55.325] - Finding globals in 'X' for chunk #1 ... [18:41:55.325] getGlobalsAndPackages() ... [18:41:55.325] Searching for globals... [18:41:55.325] [18:41:55.325] Searching for globals ... DONE [18:41:55.326] - globals: [0] [18:41:55.326] getGlobalsAndPackages() ... DONE [18:41:55.326] + additional globals found: [n=0] [18:41:55.326] + additional namespaces needed: [n=0] [18:41:55.326] - Finding globals in 'X' for chunk #1 ... DONE [18:41:55.326] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.327] - seeds: [18:41:55.327] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.327] getGlobalsAndPackages() ... [18:41:55.327] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.327] Resolving globals: FALSE [18:41:55.327] Tweak future expression to call with '...' arguments ... [18:41:55.328] { [18:41:55.328] do.call(function(...) { [18:41:55.328] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.328] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.328] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.328] on.exit(options(oopts), add = TRUE) [18:41:55.328] } [18:41:55.328] { [18:41:55.328] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.328] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.328] ...future.FUN(...future.X_jj, ...) [18:41:55.328] }) [18:41:55.328] } [18:41:55.328] }, args = future.call.arguments) [18:41:55.328] } [18:41:55.328] Tweak future expression to call with '...' arguments ... DONE [18:41:55.329] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.329] [18:41:55.329] getGlobalsAndPackages() ... DONE [18:41:55.329] run() for 'Future' ... [18:41:55.329] - state: 'created' [18:41:55.330] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.345] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.345] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.345] - Field: 'node' [18:41:55.345] - Field: 'label' [18:41:55.345] - Field: 'local' [18:41:55.346] - Field: 'owner' [18:41:55.346] - Field: 'envir' [18:41:55.346] - Field: 'workers' [18:41:55.346] - Field: 'packages' [18:41:55.346] - Field: 'gc' [18:41:55.346] - Field: 'conditions' [18:41:55.347] - Field: 'persistent' [18:41:55.347] - Field: 'expr' [18:41:55.347] - Field: 'uuid' [18:41:55.347] - Field: 'seed' [18:41:55.347] - Field: 'version' [18:41:55.347] - Field: 'result' [18:41:55.348] - Field: 'asynchronous' [18:41:55.348] - Field: 'calls' [18:41:55.348] - Field: 'globals' [18:41:55.348] - Field: 'stdout' [18:41:55.348] - Field: 'earlySignal' [18:41:55.349] - Field: 'lazy' [18:41:55.349] - Field: 'state' [18:41:55.349] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.349] - Launch lazy future ... [18:41:55.349] Packages needed by the future expression (n = 0): [18:41:55.350] Packages needed by future strategies (n = 0): [18:41:55.350] { [18:41:55.350] { [18:41:55.350] { [18:41:55.350] ...future.startTime <- base::Sys.time() [18:41:55.350] { [18:41:55.350] { [18:41:55.350] { [18:41:55.350] { [18:41:55.350] base::local({ [18:41:55.350] has_future <- base::requireNamespace("future", [18:41:55.350] quietly = TRUE) [18:41:55.350] if (has_future) { [18:41:55.350] ns <- base::getNamespace("future") [18:41:55.350] version <- ns[[".package"]][["version"]] [18:41:55.350] if (is.null(version)) [18:41:55.350] version <- utils::packageVersion("future") [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] version <- NULL [18:41:55.350] } [18:41:55.350] if (!has_future || version < "1.8.0") { [18:41:55.350] info <- base::c(r_version = base::gsub("R version ", [18:41:55.350] "", base::R.version$version.string), [18:41:55.350] platform = base::sprintf("%s (%s-bit)", [18:41:55.350] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.350] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.350] "release", "version")], collapse = " "), [18:41:55.350] hostname = base::Sys.info()[["nodename"]]) [18:41:55.350] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.350] info) [18:41:55.350] info <- base::paste(info, collapse = "; ") [18:41:55.350] if (!has_future) { [18:41:55.350] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.350] info) [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.350] info, version) [18:41:55.350] } [18:41:55.350] base::stop(msg) [18:41:55.350] } [18:41:55.350] }) [18:41:55.350] } [18:41:55.350] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.350] base::options(mc.cores = 1L) [18:41:55.350] } [18:41:55.350] ...future.strategy.old <- future::plan("list") [18:41:55.350] options(future.plan = NULL) [18:41:55.350] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.350] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.350] } [18:41:55.350] ...future.workdir <- getwd() [18:41:55.350] } [18:41:55.350] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.350] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.350] } [18:41:55.350] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.350] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.350] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.350] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.350] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.350] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.350] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.350] base::names(...future.oldOptions)) [18:41:55.350] } [18:41:55.350] if (FALSE) { [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] if (TRUE) { [18:41:55.350] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.350] open = "w") [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.350] windows = "NUL", "/dev/null"), open = "w") [18:41:55.350] } [18:41:55.350] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.350] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.350] base::sink(type = "output", split = FALSE) [18:41:55.350] base::close(...future.stdout) [18:41:55.350] }, add = TRUE) [18:41:55.350] } [18:41:55.350] ...future.frame <- base::sys.nframe() [18:41:55.350] ...future.conditions <- base::list() [18:41:55.350] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.350] if (FALSE) { [18:41:55.350] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.350] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.350] } [18:41:55.350] ...future.result <- base::tryCatch({ [18:41:55.350] base::withCallingHandlers({ [18:41:55.350] ...future.value <- base::withVisible(base::local({ [18:41:55.350] ...future.makeSendCondition <- base::local({ [18:41:55.350] sendCondition <- NULL [18:41:55.350] function(frame = 1L) { [18:41:55.350] if (is.function(sendCondition)) [18:41:55.350] return(sendCondition) [18:41:55.350] ns <- getNamespace("parallel") [18:41:55.350] if (exists("sendData", mode = "function", [18:41:55.350] envir = ns)) { [18:41:55.350] parallel_sendData <- get("sendData", mode = "function", [18:41:55.350] envir = ns) [18:41:55.350] envir <- sys.frame(frame) [18:41:55.350] master <- NULL [18:41:55.350] while (!identical(envir, .GlobalEnv) && [18:41:55.350] !identical(envir, emptyenv())) { [18:41:55.350] if (exists("master", mode = "list", envir = envir, [18:41:55.350] inherits = FALSE)) { [18:41:55.350] master <- get("master", mode = "list", [18:41:55.350] envir = envir, inherits = FALSE) [18:41:55.350] if (inherits(master, c("SOCKnode", [18:41:55.350] "SOCK0node"))) { [18:41:55.350] sendCondition <<- function(cond) { [18:41:55.350] data <- list(type = "VALUE", value = cond, [18:41:55.350] success = TRUE) [18:41:55.350] parallel_sendData(master, data) [18:41:55.350] } [18:41:55.350] return(sendCondition) [18:41:55.350] } [18:41:55.350] } [18:41:55.350] frame <- frame + 1L [18:41:55.350] envir <- sys.frame(frame) [18:41:55.350] } [18:41:55.350] } [18:41:55.350] sendCondition <<- function(cond) NULL [18:41:55.350] } [18:41:55.350] }) [18:41:55.350] withCallingHandlers({ [18:41:55.350] { [18:41:55.350] do.call(function(...) { [18:41:55.350] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.350] if (!identical(...future.globals.maxSize.org, [18:41:55.350] ...future.globals.maxSize)) { [18:41:55.350] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.350] on.exit(options(oopts), add = TRUE) [18:41:55.350] } [18:41:55.350] { [18:41:55.350] lapply(seq_along(...future.elements_ii), [18:41:55.350] FUN = function(jj) { [18:41:55.350] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.350] ...future.FUN(...future.X_jj, ...) [18:41:55.350] }) [18:41:55.350] } [18:41:55.350] }, args = future.call.arguments) [18:41:55.350] } [18:41:55.350] }, immediateCondition = function(cond) { [18:41:55.350] sendCondition <- ...future.makeSendCondition() [18:41:55.350] sendCondition(cond) [18:41:55.350] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.350] { [18:41:55.350] inherits <- base::inherits [18:41:55.350] invokeRestart <- base::invokeRestart [18:41:55.350] is.null <- base::is.null [18:41:55.350] muffled <- FALSE [18:41:55.350] if (inherits(cond, "message")) { [18:41:55.350] muffled <- grepl(pattern, "muffleMessage") [18:41:55.350] if (muffled) [18:41:55.350] invokeRestart("muffleMessage") [18:41:55.350] } [18:41:55.350] else if (inherits(cond, "warning")) { [18:41:55.350] muffled <- grepl(pattern, "muffleWarning") [18:41:55.350] if (muffled) [18:41:55.350] invokeRestart("muffleWarning") [18:41:55.350] } [18:41:55.350] else if (inherits(cond, "condition")) { [18:41:55.350] if (!is.null(pattern)) { [18:41:55.350] computeRestarts <- base::computeRestarts [18:41:55.350] grepl <- base::grepl [18:41:55.350] restarts <- computeRestarts(cond) [18:41:55.350] for (restart in restarts) { [18:41:55.350] name <- restart$name [18:41:55.350] if (is.null(name)) [18:41:55.350] next [18:41:55.350] if (!grepl(pattern, name)) [18:41:55.350] next [18:41:55.350] invokeRestart(restart) [18:41:55.350] muffled <- TRUE [18:41:55.350] break [18:41:55.350] } [18:41:55.350] } [18:41:55.350] } [18:41:55.350] invisible(muffled) [18:41:55.350] } [18:41:55.350] muffleCondition(cond) [18:41:55.350] }) [18:41:55.350] })) [18:41:55.350] future::FutureResult(value = ...future.value$value, [18:41:55.350] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.350] ...future.rng), globalenv = if (FALSE) [18:41:55.350] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.350] ...future.globalenv.names)) [18:41:55.350] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.350] }, condition = base::local({ [18:41:55.350] c <- base::c [18:41:55.350] inherits <- base::inherits [18:41:55.350] invokeRestart <- base::invokeRestart [18:41:55.350] length <- base::length [18:41:55.350] list <- base::list [18:41:55.350] seq.int <- base::seq.int [18:41:55.350] signalCondition <- base::signalCondition [18:41:55.350] sys.calls <- base::sys.calls [18:41:55.350] `[[` <- base::`[[` [18:41:55.350] `+` <- base::`+` [18:41:55.350] `<<-` <- base::`<<-` [18:41:55.350] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.350] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.350] 3L)] [18:41:55.350] } [18:41:55.350] function(cond) { [18:41:55.350] is_error <- inherits(cond, "error") [18:41:55.350] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.350] NULL) [18:41:55.350] if (is_error) { [18:41:55.350] sessionInformation <- function() { [18:41:55.350] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.350] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.350] search = base::search(), system = base::Sys.info()) [18:41:55.350] } [18:41:55.350] ...future.conditions[[length(...future.conditions) + [18:41:55.350] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.350] cond$call), session = sessionInformation(), [18:41:55.350] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.350] signalCondition(cond) [18:41:55.350] } [18:41:55.350] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.350] "immediateCondition"))) { [18:41:55.350] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.350] ...future.conditions[[length(...future.conditions) + [18:41:55.350] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.350] if (TRUE && !signal) { [18:41:55.350] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.350] { [18:41:55.350] inherits <- base::inherits [18:41:55.350] invokeRestart <- base::invokeRestart [18:41:55.350] is.null <- base::is.null [18:41:55.350] muffled <- FALSE [18:41:55.350] if (inherits(cond, "message")) { [18:41:55.350] muffled <- grepl(pattern, "muffleMessage") [18:41:55.350] if (muffled) [18:41:55.350] invokeRestart("muffleMessage") [18:41:55.350] } [18:41:55.350] else if (inherits(cond, "warning")) { [18:41:55.350] muffled <- grepl(pattern, "muffleWarning") [18:41:55.350] if (muffled) [18:41:55.350] invokeRestart("muffleWarning") [18:41:55.350] } [18:41:55.350] else if (inherits(cond, "condition")) { [18:41:55.350] if (!is.null(pattern)) { [18:41:55.350] computeRestarts <- base::computeRestarts [18:41:55.350] grepl <- base::grepl [18:41:55.350] restarts <- computeRestarts(cond) [18:41:55.350] for (restart in restarts) { [18:41:55.350] name <- restart$name [18:41:55.350] if (is.null(name)) [18:41:55.350] next [18:41:55.350] if (!grepl(pattern, name)) [18:41:55.350] next [18:41:55.350] invokeRestart(restart) [18:41:55.350] muffled <- TRUE [18:41:55.350] break [18:41:55.350] } [18:41:55.350] } [18:41:55.350] } [18:41:55.350] invisible(muffled) [18:41:55.350] } [18:41:55.350] muffleCondition(cond, pattern = "^muffle") [18:41:55.350] } [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] if (TRUE) { [18:41:55.350] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.350] { [18:41:55.350] inherits <- base::inherits [18:41:55.350] invokeRestart <- base::invokeRestart [18:41:55.350] is.null <- base::is.null [18:41:55.350] muffled <- FALSE [18:41:55.350] if (inherits(cond, "message")) { [18:41:55.350] muffled <- grepl(pattern, "muffleMessage") [18:41:55.350] if (muffled) [18:41:55.350] invokeRestart("muffleMessage") [18:41:55.350] } [18:41:55.350] else if (inherits(cond, "warning")) { [18:41:55.350] muffled <- grepl(pattern, "muffleWarning") [18:41:55.350] if (muffled) [18:41:55.350] invokeRestart("muffleWarning") [18:41:55.350] } [18:41:55.350] else if (inherits(cond, "condition")) { [18:41:55.350] if (!is.null(pattern)) { [18:41:55.350] computeRestarts <- base::computeRestarts [18:41:55.350] grepl <- base::grepl [18:41:55.350] restarts <- computeRestarts(cond) [18:41:55.350] for (restart in restarts) { [18:41:55.350] name <- restart$name [18:41:55.350] if (is.null(name)) [18:41:55.350] next [18:41:55.350] if (!grepl(pattern, name)) [18:41:55.350] next [18:41:55.350] invokeRestart(restart) [18:41:55.350] muffled <- TRUE [18:41:55.350] break [18:41:55.350] } [18:41:55.350] } [18:41:55.350] } [18:41:55.350] invisible(muffled) [18:41:55.350] } [18:41:55.350] muffleCondition(cond, pattern = "^muffle") [18:41:55.350] } [18:41:55.350] } [18:41:55.350] } [18:41:55.350] })) [18:41:55.350] }, error = function(ex) { [18:41:55.350] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.350] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.350] ...future.rng), started = ...future.startTime, [18:41:55.350] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.350] version = "1.8"), class = "FutureResult") [18:41:55.350] }, finally = { [18:41:55.350] if (!identical(...future.workdir, getwd())) [18:41:55.350] setwd(...future.workdir) [18:41:55.350] { [18:41:55.350] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.350] ...future.oldOptions$nwarnings <- NULL [18:41:55.350] } [18:41:55.350] base::options(...future.oldOptions) [18:41:55.350] if (.Platform$OS.type == "windows") { [18:41:55.350] old_names <- names(...future.oldEnvVars) [18:41:55.350] envs <- base::Sys.getenv() [18:41:55.350] names <- names(envs) [18:41:55.350] common <- intersect(names, old_names) [18:41:55.350] added <- setdiff(names, old_names) [18:41:55.350] removed <- setdiff(old_names, names) [18:41:55.350] changed <- common[...future.oldEnvVars[common] != [18:41:55.350] envs[common]] [18:41:55.350] NAMES <- toupper(changed) [18:41:55.350] args <- list() [18:41:55.350] for (kk in seq_along(NAMES)) { [18:41:55.350] name <- changed[[kk]] [18:41:55.350] NAME <- NAMES[[kk]] [18:41:55.350] if (name != NAME && is.element(NAME, old_names)) [18:41:55.350] next [18:41:55.350] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.350] } [18:41:55.350] NAMES <- toupper(added) [18:41:55.350] for (kk in seq_along(NAMES)) { [18:41:55.350] name <- added[[kk]] [18:41:55.350] NAME <- NAMES[[kk]] [18:41:55.350] if (name != NAME && is.element(NAME, old_names)) [18:41:55.350] next [18:41:55.350] args[[name]] <- "" [18:41:55.350] } [18:41:55.350] NAMES <- toupper(removed) [18:41:55.350] for (kk in seq_along(NAMES)) { [18:41:55.350] name <- removed[[kk]] [18:41:55.350] NAME <- NAMES[[kk]] [18:41:55.350] if (name != NAME && is.element(NAME, old_names)) [18:41:55.350] next [18:41:55.350] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.350] } [18:41:55.350] if (length(args) > 0) [18:41:55.350] base::do.call(base::Sys.setenv, args = args) [18:41:55.350] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.350] } [18:41:55.350] { [18:41:55.350] if (base::length(...future.futureOptionsAdded) > [18:41:55.350] 0L) { [18:41:55.350] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.350] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.350] base::options(opts) [18:41:55.350] } [18:41:55.350] { [18:41:55.350] { [18:41:55.350] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.350] NULL [18:41:55.350] } [18:41:55.350] options(future.plan = NULL) [18:41:55.350] if (is.na(NA_character_)) [18:41:55.350] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.350] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.350] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.350] .init = FALSE) [18:41:55.350] } [18:41:55.350] } [18:41:55.350] } [18:41:55.350] }) [18:41:55.350] if (TRUE) { [18:41:55.350] base::sink(type = "output", split = FALSE) [18:41:55.350] if (TRUE) { [18:41:55.350] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.350] } [18:41:55.350] else { [18:41:55.350] ...future.result["stdout"] <- base::list(NULL) [18:41:55.350] } [18:41:55.350] base::close(...future.stdout) [18:41:55.350] ...future.stdout <- NULL [18:41:55.350] } [18:41:55.350] ...future.result$conditions <- ...future.conditions [18:41:55.350] ...future.result$finished <- base::Sys.time() [18:41:55.350] ...future.result [18:41:55.350] } [18:41:55.356] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:55.356] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:55.356] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:55.356] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.357] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.357] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.357] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.358] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.358] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.358] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.359] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.359] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:55.359] MultisessionFuture started [18:41:55.360] - Launch lazy future ... done [18:41:55.360] run() for 'MultisessionFuture' ... done [18:41:55.360] Created future: [18:41:55.374] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.375] - Validating connection of MultisessionFuture [18:41:55.375] - received message: FutureResult [18:41:55.375] - Received FutureResult [18:41:55.375] - Erased future from FutureRegistry [18:41:55.375] result() for ClusterFuture ... [18:41:55.376] - result already collected: FutureResult [18:41:55.376] result() for ClusterFuture ... done [18:41:55.376] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.360] MultisessionFuture: [18:41:55.360] Label: 'future_sapply-1' [18:41:55.360] Expression: [18:41:55.360] { [18:41:55.360] do.call(function(...) { [18:41:55.360] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.360] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.360] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.360] on.exit(options(oopts), add = TRUE) [18:41:55.360] } [18:41:55.360] { [18:41:55.360] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.360] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.360] ...future.FUN(...future.X_jj, ...) [18:41:55.360] }) [18:41:55.360] } [18:41:55.360] }, args = future.call.arguments) [18:41:55.360] } [18:41:55.360] Lazy evaluation: FALSE [18:41:55.360] Asynchronous evaluation: TRUE [18:41:55.360] Local evaluation: TRUE [18:41:55.360] Environment: R_GlobalEnv [18:41:55.360] Capture standard output: TRUE [18:41:55.360] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.360] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.360] Packages: [18:41:55.360] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.360] Resolved: TRUE [18:41:55.360] Value: [18:41:55.360] Conditions captured: [18:41:55.360] Early signaling: FALSE [18:41:55.360] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.360] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.376] Chunk #1 of 2 ... DONE [18:41:55.377] Chunk #2 of 2 ... [18:41:55.377] - Finding globals in 'X' for chunk #2 ... [18:41:55.377] getGlobalsAndPackages() ... [18:41:55.377] Searching for globals... [18:41:55.377] [18:41:55.378] Searching for globals ... DONE [18:41:55.378] - globals: [0] [18:41:55.378] getGlobalsAndPackages() ... DONE [18:41:55.378] + additional globals found: [n=0] [18:41:55.378] + additional namespaces needed: [n=0] [18:41:55.378] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.378] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.379] - seeds: [18:41:55.379] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.379] getGlobalsAndPackages() ... [18:41:55.379] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.379] Resolving globals: FALSE [18:41:55.380] Tweak future expression to call with '...' arguments ... [18:41:55.380] { [18:41:55.380] do.call(function(...) { [18:41:55.380] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.380] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.380] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.380] on.exit(options(oopts), add = TRUE) [18:41:55.380] } [18:41:55.380] { [18:41:55.380] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.380] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.380] ...future.FUN(...future.X_jj, ...) [18:41:55.380] }) [18:41:55.380] } [18:41:55.380] }, args = future.call.arguments) [18:41:55.380] } [18:41:55.380] Tweak future expression to call with '...' arguments ... DONE [18:41:55.381] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.381] [18:41:55.381] getGlobalsAndPackages() ... DONE [18:41:55.381] run() for 'Future' ... [18:41:55.382] - state: 'created' [18:41:55.382] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.397] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.397] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.397] - Field: 'node' [18:41:55.398] - Field: 'label' [18:41:55.398] - Field: 'local' [18:41:55.398] - Field: 'owner' [18:41:55.398] - Field: 'envir' [18:41:55.398] - Field: 'workers' [18:41:55.398] - Field: 'packages' [18:41:55.399] - Field: 'gc' [18:41:55.399] - Field: 'conditions' [18:41:55.399] - Field: 'persistent' [18:41:55.399] - Field: 'expr' [18:41:55.399] - Field: 'uuid' [18:41:55.399] - Field: 'seed' [18:41:55.400] - Field: 'version' [18:41:55.400] - Field: 'result' [18:41:55.400] - Field: 'asynchronous' [18:41:55.400] - Field: 'calls' [18:41:55.400] - Field: 'globals' [18:41:55.400] - Field: 'stdout' [18:41:55.401] - Field: 'earlySignal' [18:41:55.401] - Field: 'lazy' [18:41:55.401] - Field: 'state' [18:41:55.401] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.401] - Launch lazy future ... [18:41:55.402] Packages needed by the future expression (n = 0): [18:41:55.402] Packages needed by future strategies (n = 0): [18:41:55.402] { [18:41:55.402] { [18:41:55.402] { [18:41:55.402] ...future.startTime <- base::Sys.time() [18:41:55.402] { [18:41:55.402] { [18:41:55.402] { [18:41:55.402] { [18:41:55.402] base::local({ [18:41:55.402] has_future <- base::requireNamespace("future", [18:41:55.402] quietly = TRUE) [18:41:55.402] if (has_future) { [18:41:55.402] ns <- base::getNamespace("future") [18:41:55.402] version <- ns[[".package"]][["version"]] [18:41:55.402] if (is.null(version)) [18:41:55.402] version <- utils::packageVersion("future") [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] version <- NULL [18:41:55.402] } [18:41:55.402] if (!has_future || version < "1.8.0") { [18:41:55.402] info <- base::c(r_version = base::gsub("R version ", [18:41:55.402] "", base::R.version$version.string), [18:41:55.402] platform = base::sprintf("%s (%s-bit)", [18:41:55.402] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.402] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.402] "release", "version")], collapse = " "), [18:41:55.402] hostname = base::Sys.info()[["nodename"]]) [18:41:55.402] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.402] info) [18:41:55.402] info <- base::paste(info, collapse = "; ") [18:41:55.402] if (!has_future) { [18:41:55.402] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.402] info) [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.402] info, version) [18:41:55.402] } [18:41:55.402] base::stop(msg) [18:41:55.402] } [18:41:55.402] }) [18:41:55.402] } [18:41:55.402] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.402] base::options(mc.cores = 1L) [18:41:55.402] } [18:41:55.402] ...future.strategy.old <- future::plan("list") [18:41:55.402] options(future.plan = NULL) [18:41:55.402] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.402] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.402] } [18:41:55.402] ...future.workdir <- getwd() [18:41:55.402] } [18:41:55.402] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.402] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.402] } [18:41:55.402] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.402] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.402] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.402] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.402] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.402] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.402] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.402] base::names(...future.oldOptions)) [18:41:55.402] } [18:41:55.402] if (FALSE) { [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] if (TRUE) { [18:41:55.402] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.402] open = "w") [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.402] windows = "NUL", "/dev/null"), open = "w") [18:41:55.402] } [18:41:55.402] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.402] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.402] base::sink(type = "output", split = FALSE) [18:41:55.402] base::close(...future.stdout) [18:41:55.402] }, add = TRUE) [18:41:55.402] } [18:41:55.402] ...future.frame <- base::sys.nframe() [18:41:55.402] ...future.conditions <- base::list() [18:41:55.402] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.402] if (FALSE) { [18:41:55.402] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.402] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.402] } [18:41:55.402] ...future.result <- base::tryCatch({ [18:41:55.402] base::withCallingHandlers({ [18:41:55.402] ...future.value <- base::withVisible(base::local({ [18:41:55.402] ...future.makeSendCondition <- base::local({ [18:41:55.402] sendCondition <- NULL [18:41:55.402] function(frame = 1L) { [18:41:55.402] if (is.function(sendCondition)) [18:41:55.402] return(sendCondition) [18:41:55.402] ns <- getNamespace("parallel") [18:41:55.402] if (exists("sendData", mode = "function", [18:41:55.402] envir = ns)) { [18:41:55.402] parallel_sendData <- get("sendData", mode = "function", [18:41:55.402] envir = ns) [18:41:55.402] envir <- sys.frame(frame) [18:41:55.402] master <- NULL [18:41:55.402] while (!identical(envir, .GlobalEnv) && [18:41:55.402] !identical(envir, emptyenv())) { [18:41:55.402] if (exists("master", mode = "list", envir = envir, [18:41:55.402] inherits = FALSE)) { [18:41:55.402] master <- get("master", mode = "list", [18:41:55.402] envir = envir, inherits = FALSE) [18:41:55.402] if (inherits(master, c("SOCKnode", [18:41:55.402] "SOCK0node"))) { [18:41:55.402] sendCondition <<- function(cond) { [18:41:55.402] data <- list(type = "VALUE", value = cond, [18:41:55.402] success = TRUE) [18:41:55.402] parallel_sendData(master, data) [18:41:55.402] } [18:41:55.402] return(sendCondition) [18:41:55.402] } [18:41:55.402] } [18:41:55.402] frame <- frame + 1L [18:41:55.402] envir <- sys.frame(frame) [18:41:55.402] } [18:41:55.402] } [18:41:55.402] sendCondition <<- function(cond) NULL [18:41:55.402] } [18:41:55.402] }) [18:41:55.402] withCallingHandlers({ [18:41:55.402] { [18:41:55.402] do.call(function(...) { [18:41:55.402] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.402] if (!identical(...future.globals.maxSize.org, [18:41:55.402] ...future.globals.maxSize)) { [18:41:55.402] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.402] on.exit(options(oopts), add = TRUE) [18:41:55.402] } [18:41:55.402] { [18:41:55.402] lapply(seq_along(...future.elements_ii), [18:41:55.402] FUN = function(jj) { [18:41:55.402] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.402] ...future.FUN(...future.X_jj, ...) [18:41:55.402] }) [18:41:55.402] } [18:41:55.402] }, args = future.call.arguments) [18:41:55.402] } [18:41:55.402] }, immediateCondition = function(cond) { [18:41:55.402] sendCondition <- ...future.makeSendCondition() [18:41:55.402] sendCondition(cond) [18:41:55.402] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.402] { [18:41:55.402] inherits <- base::inherits [18:41:55.402] invokeRestart <- base::invokeRestart [18:41:55.402] is.null <- base::is.null [18:41:55.402] muffled <- FALSE [18:41:55.402] if (inherits(cond, "message")) { [18:41:55.402] muffled <- grepl(pattern, "muffleMessage") [18:41:55.402] if (muffled) [18:41:55.402] invokeRestart("muffleMessage") [18:41:55.402] } [18:41:55.402] else if (inherits(cond, "warning")) { [18:41:55.402] muffled <- grepl(pattern, "muffleWarning") [18:41:55.402] if (muffled) [18:41:55.402] invokeRestart("muffleWarning") [18:41:55.402] } [18:41:55.402] else if (inherits(cond, "condition")) { [18:41:55.402] if (!is.null(pattern)) { [18:41:55.402] computeRestarts <- base::computeRestarts [18:41:55.402] grepl <- base::grepl [18:41:55.402] restarts <- computeRestarts(cond) [18:41:55.402] for (restart in restarts) { [18:41:55.402] name <- restart$name [18:41:55.402] if (is.null(name)) [18:41:55.402] next [18:41:55.402] if (!grepl(pattern, name)) [18:41:55.402] next [18:41:55.402] invokeRestart(restart) [18:41:55.402] muffled <- TRUE [18:41:55.402] break [18:41:55.402] } [18:41:55.402] } [18:41:55.402] } [18:41:55.402] invisible(muffled) [18:41:55.402] } [18:41:55.402] muffleCondition(cond) [18:41:55.402] }) [18:41:55.402] })) [18:41:55.402] future::FutureResult(value = ...future.value$value, [18:41:55.402] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.402] ...future.rng), globalenv = if (FALSE) [18:41:55.402] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.402] ...future.globalenv.names)) [18:41:55.402] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.402] }, condition = base::local({ [18:41:55.402] c <- base::c [18:41:55.402] inherits <- base::inherits [18:41:55.402] invokeRestart <- base::invokeRestart [18:41:55.402] length <- base::length [18:41:55.402] list <- base::list [18:41:55.402] seq.int <- base::seq.int [18:41:55.402] signalCondition <- base::signalCondition [18:41:55.402] sys.calls <- base::sys.calls [18:41:55.402] `[[` <- base::`[[` [18:41:55.402] `+` <- base::`+` [18:41:55.402] `<<-` <- base::`<<-` [18:41:55.402] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.402] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.402] 3L)] [18:41:55.402] } [18:41:55.402] function(cond) { [18:41:55.402] is_error <- inherits(cond, "error") [18:41:55.402] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.402] NULL) [18:41:55.402] if (is_error) { [18:41:55.402] sessionInformation <- function() { [18:41:55.402] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.402] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.402] search = base::search(), system = base::Sys.info()) [18:41:55.402] } [18:41:55.402] ...future.conditions[[length(...future.conditions) + [18:41:55.402] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.402] cond$call), session = sessionInformation(), [18:41:55.402] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.402] signalCondition(cond) [18:41:55.402] } [18:41:55.402] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.402] "immediateCondition"))) { [18:41:55.402] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.402] ...future.conditions[[length(...future.conditions) + [18:41:55.402] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.402] if (TRUE && !signal) { [18:41:55.402] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.402] { [18:41:55.402] inherits <- base::inherits [18:41:55.402] invokeRestart <- base::invokeRestart [18:41:55.402] is.null <- base::is.null [18:41:55.402] muffled <- FALSE [18:41:55.402] if (inherits(cond, "message")) { [18:41:55.402] muffled <- grepl(pattern, "muffleMessage") [18:41:55.402] if (muffled) [18:41:55.402] invokeRestart("muffleMessage") [18:41:55.402] } [18:41:55.402] else if (inherits(cond, "warning")) { [18:41:55.402] muffled <- grepl(pattern, "muffleWarning") [18:41:55.402] if (muffled) [18:41:55.402] invokeRestart("muffleWarning") [18:41:55.402] } [18:41:55.402] else if (inherits(cond, "condition")) { [18:41:55.402] if (!is.null(pattern)) { [18:41:55.402] computeRestarts <- base::computeRestarts [18:41:55.402] grepl <- base::grepl [18:41:55.402] restarts <- computeRestarts(cond) [18:41:55.402] for (restart in restarts) { [18:41:55.402] name <- restart$name [18:41:55.402] if (is.null(name)) [18:41:55.402] next [18:41:55.402] if (!grepl(pattern, name)) [18:41:55.402] next [18:41:55.402] invokeRestart(restart) [18:41:55.402] muffled <- TRUE [18:41:55.402] break [18:41:55.402] } [18:41:55.402] } [18:41:55.402] } [18:41:55.402] invisible(muffled) [18:41:55.402] } [18:41:55.402] muffleCondition(cond, pattern = "^muffle") [18:41:55.402] } [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] if (TRUE) { [18:41:55.402] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.402] { [18:41:55.402] inherits <- base::inherits [18:41:55.402] invokeRestart <- base::invokeRestart [18:41:55.402] is.null <- base::is.null [18:41:55.402] muffled <- FALSE [18:41:55.402] if (inherits(cond, "message")) { [18:41:55.402] muffled <- grepl(pattern, "muffleMessage") [18:41:55.402] if (muffled) [18:41:55.402] invokeRestart("muffleMessage") [18:41:55.402] } [18:41:55.402] else if (inherits(cond, "warning")) { [18:41:55.402] muffled <- grepl(pattern, "muffleWarning") [18:41:55.402] if (muffled) [18:41:55.402] invokeRestart("muffleWarning") [18:41:55.402] } [18:41:55.402] else if (inherits(cond, "condition")) { [18:41:55.402] if (!is.null(pattern)) { [18:41:55.402] computeRestarts <- base::computeRestarts [18:41:55.402] grepl <- base::grepl [18:41:55.402] restarts <- computeRestarts(cond) [18:41:55.402] for (restart in restarts) { [18:41:55.402] name <- restart$name [18:41:55.402] if (is.null(name)) [18:41:55.402] next [18:41:55.402] if (!grepl(pattern, name)) [18:41:55.402] next [18:41:55.402] invokeRestart(restart) [18:41:55.402] muffled <- TRUE [18:41:55.402] break [18:41:55.402] } [18:41:55.402] } [18:41:55.402] } [18:41:55.402] invisible(muffled) [18:41:55.402] } [18:41:55.402] muffleCondition(cond, pattern = "^muffle") [18:41:55.402] } [18:41:55.402] } [18:41:55.402] } [18:41:55.402] })) [18:41:55.402] }, error = function(ex) { [18:41:55.402] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.402] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.402] ...future.rng), started = ...future.startTime, [18:41:55.402] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.402] version = "1.8"), class = "FutureResult") [18:41:55.402] }, finally = { [18:41:55.402] if (!identical(...future.workdir, getwd())) [18:41:55.402] setwd(...future.workdir) [18:41:55.402] { [18:41:55.402] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.402] ...future.oldOptions$nwarnings <- NULL [18:41:55.402] } [18:41:55.402] base::options(...future.oldOptions) [18:41:55.402] if (.Platform$OS.type == "windows") { [18:41:55.402] old_names <- names(...future.oldEnvVars) [18:41:55.402] envs <- base::Sys.getenv() [18:41:55.402] names <- names(envs) [18:41:55.402] common <- intersect(names, old_names) [18:41:55.402] added <- setdiff(names, old_names) [18:41:55.402] removed <- setdiff(old_names, names) [18:41:55.402] changed <- common[...future.oldEnvVars[common] != [18:41:55.402] envs[common]] [18:41:55.402] NAMES <- toupper(changed) [18:41:55.402] args <- list() [18:41:55.402] for (kk in seq_along(NAMES)) { [18:41:55.402] name <- changed[[kk]] [18:41:55.402] NAME <- NAMES[[kk]] [18:41:55.402] if (name != NAME && is.element(NAME, old_names)) [18:41:55.402] next [18:41:55.402] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.402] } [18:41:55.402] NAMES <- toupper(added) [18:41:55.402] for (kk in seq_along(NAMES)) { [18:41:55.402] name <- added[[kk]] [18:41:55.402] NAME <- NAMES[[kk]] [18:41:55.402] if (name != NAME && is.element(NAME, old_names)) [18:41:55.402] next [18:41:55.402] args[[name]] <- "" [18:41:55.402] } [18:41:55.402] NAMES <- toupper(removed) [18:41:55.402] for (kk in seq_along(NAMES)) { [18:41:55.402] name <- removed[[kk]] [18:41:55.402] NAME <- NAMES[[kk]] [18:41:55.402] if (name != NAME && is.element(NAME, old_names)) [18:41:55.402] next [18:41:55.402] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.402] } [18:41:55.402] if (length(args) > 0) [18:41:55.402] base::do.call(base::Sys.setenv, args = args) [18:41:55.402] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.402] } [18:41:55.402] { [18:41:55.402] if (base::length(...future.futureOptionsAdded) > [18:41:55.402] 0L) { [18:41:55.402] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.402] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.402] base::options(opts) [18:41:55.402] } [18:41:55.402] { [18:41:55.402] { [18:41:55.402] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.402] NULL [18:41:55.402] } [18:41:55.402] options(future.plan = NULL) [18:41:55.402] if (is.na(NA_character_)) [18:41:55.402] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.402] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.402] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.402] .init = FALSE) [18:41:55.402] } [18:41:55.402] } [18:41:55.402] } [18:41:55.402] }) [18:41:55.402] if (TRUE) { [18:41:55.402] base::sink(type = "output", split = FALSE) [18:41:55.402] if (TRUE) { [18:41:55.402] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.402] } [18:41:55.402] else { [18:41:55.402] ...future.result["stdout"] <- base::list(NULL) [18:41:55.402] } [18:41:55.402] base::close(...future.stdout) [18:41:55.402] ...future.stdout <- NULL [18:41:55.402] } [18:41:55.402] ...future.result$conditions <- ...future.conditions [18:41:55.402] ...future.result$finished <- base::Sys.time() [18:41:55.402] ...future.result [18:41:55.402] } [18:41:55.408] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:55.408] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:55.408] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:55.409] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.409] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.409] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.410] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.410] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.410] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.410] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.411] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.411] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:55.412] MultisessionFuture started [18:41:55.412] - Launch lazy future ... done [18:41:55.413] run() for 'MultisessionFuture' ... done [18:41:55.413] Created future: [18:41:55.426] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.426] - Validating connection of MultisessionFuture [18:41:55.426] - received message: FutureResult [18:41:55.427] - Received FutureResult [18:41:55.427] - Erased future from FutureRegistry [18:41:55.427] result() for ClusterFuture ... [18:41:55.427] - result already collected: FutureResult [18:41:55.427] result() for ClusterFuture ... done [18:41:55.427] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.413] MultisessionFuture: [18:41:55.413] Label: 'future_sapply-2' [18:41:55.413] Expression: [18:41:55.413] { [18:41:55.413] do.call(function(...) { [18:41:55.413] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.413] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.413] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.413] on.exit(options(oopts), add = TRUE) [18:41:55.413] } [18:41:55.413] { [18:41:55.413] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.413] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.413] ...future.FUN(...future.X_jj, ...) [18:41:55.413] }) [18:41:55.413] } [18:41:55.413] }, args = future.call.arguments) [18:41:55.413] } [18:41:55.413] Lazy evaluation: FALSE [18:41:55.413] Asynchronous evaluation: TRUE [18:41:55.413] Local evaluation: TRUE [18:41:55.413] Environment: R_GlobalEnv [18:41:55.413] Capture standard output: TRUE [18:41:55.413] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.413] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.413] Packages: [18:41:55.413] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.413] Resolved: TRUE [18:41:55.413] Value: [18:41:55.413] Conditions captured: [18:41:55.413] Early signaling: FALSE [18:41:55.413] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.413] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.428] Chunk #2 of 2 ... DONE [18:41:55.428] Launching 2 futures (chunks) ... DONE [18:41:55.428] Resolving 2 futures (chunks) ... [18:41:55.428] resolve() on list ... [18:41:55.429] recursive: 0 [18:41:55.429] length: 2 [18:41:55.429] [18:41:55.429] Future #1 [18:41:55.429] result() for ClusterFuture ... [18:41:55.429] - result already collected: FutureResult [18:41:55.430] result() for ClusterFuture ... done [18:41:55.430] result() for ClusterFuture ... [18:41:55.430] - result already collected: FutureResult [18:41:55.430] result() for ClusterFuture ... done [18:41:55.430] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:55.430] - nx: 2 [18:41:55.430] - relay: TRUE [18:41:55.431] - stdout: TRUE [18:41:55.431] - signal: TRUE [18:41:55.431] - resignal: FALSE [18:41:55.431] - force: TRUE [18:41:55.431] - relayed: [n=2] FALSE, FALSE [18:41:55.431] - queued futures: [n=2] FALSE, FALSE [18:41:55.432] - until=1 [18:41:55.432] - relaying element #1 [18:41:55.432] result() for ClusterFuture ... [18:41:55.432] - result already collected: FutureResult [18:41:55.432] result() for ClusterFuture ... done [18:41:55.432] result() for ClusterFuture ... [18:41:55.433] - result already collected: FutureResult [18:41:55.433] result() for ClusterFuture ... done [18:41:55.433] result() for ClusterFuture ... [18:41:55.433] - result already collected: FutureResult [18:41:55.433] result() for ClusterFuture ... done [18:41:55.433] result() for ClusterFuture ... [18:41:55.434] - result already collected: FutureResult [18:41:55.434] result() for ClusterFuture ... done [18:41:55.434] - relayed: [n=2] TRUE, FALSE [18:41:55.434] - queued futures: [n=2] TRUE, FALSE [18:41:55.434] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:55.434] length: 1 (resolved future 1) [18:41:55.435] Future #2 [18:41:55.435] result() for ClusterFuture ... [18:41:55.435] - result already collected: FutureResult [18:41:55.435] result() for ClusterFuture ... done [18:41:55.435] result() for ClusterFuture ... [18:41:55.435] - result already collected: FutureResult [18:41:55.435] result() for ClusterFuture ... done [18:41:55.436] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:55.436] - nx: 2 [18:41:55.436] - relay: TRUE [18:41:55.436] - stdout: TRUE [18:41:55.436] - signal: TRUE [18:41:55.436] - resignal: FALSE [18:41:55.437] - force: TRUE [18:41:55.437] - relayed: [n=2] TRUE, FALSE [18:41:55.437] - queued futures: [n=2] TRUE, FALSE [18:41:55.437] - until=2 [18:41:55.437] - relaying element #2 [18:41:55.437] result() for ClusterFuture ... [18:41:55.437] - result already collected: FutureResult [18:41:55.438] result() for ClusterFuture ... done [18:41:55.438] result() for ClusterFuture ... [18:41:55.438] - result already collected: FutureResult [18:41:55.438] result() for ClusterFuture ... done [18:41:55.438] result() for ClusterFuture ... [18:41:55.438] - result already collected: FutureResult [18:41:55.439] result() for ClusterFuture ... done [18:41:55.439] result() for ClusterFuture ... [18:41:55.439] - result already collected: FutureResult [18:41:55.439] result() for ClusterFuture ... done [18:41:55.439] - relayed: [n=2] TRUE, TRUE [18:41:55.439] - queued futures: [n=2] TRUE, TRUE [18:41:55.440] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:55.440] length: 0 (resolved future 2) [18:41:55.440] Relaying remaining futures [18:41:55.440] signalConditionsASAP(NULL, pos=0) ... [18:41:55.440] - nx: 2 [18:41:55.440] - relay: TRUE [18:41:55.441] - stdout: TRUE [18:41:55.441] - signal: TRUE [18:41:55.441] - resignal: FALSE [18:41:55.441] - force: TRUE [18:41:55.441] - relayed: [n=2] TRUE, TRUE [18:41:55.441] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:55.442] - relayed: [n=2] TRUE, TRUE [18:41:55.442] - queued futures: [n=2] TRUE, TRUE [18:41:55.442] signalConditionsASAP(NULL, pos=0) ... done [18:41:55.442] resolve() on list ... DONE [18:41:55.442] result() for ClusterFuture ... [18:41:55.442] - result already collected: FutureResult [18:41:55.442] result() for ClusterFuture ... done [18:41:55.443] result() for ClusterFuture ... [18:41:55.443] - result already collected: FutureResult [18:41:55.443] result() for ClusterFuture ... done [18:41:55.443] result() for ClusterFuture ... [18:41:55.443] - result already collected: FutureResult [18:41:55.443] result() for ClusterFuture ... done [18:41:55.444] result() for ClusterFuture ... [18:41:55.444] - result already collected: FutureResult [18:41:55.444] result() for ClusterFuture ... done [18:41:55.444] - Number of value chunks collected: 2 [18:41:55.444] Resolving 2 futures (chunks) ... DONE [18:41:55.444] Reducing values from 2 chunks ... [18:41:55.445] - Number of values collected after concatenation: 4 [18:41:55.445] - Number of values expected: 4 [18:41:55.445] Reducing values from 2 chunks ... DONE [18:41:55.445] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:55.447] future_lapply() ... [18:41:55.450] Number of chunks: 2 [18:41:55.450] getGlobalsAndPackagesXApply() ... [18:41:55.450] - future.globals: TRUE [18:41:55.451] getGlobalsAndPackages() ... [18:41:55.451] Searching for globals... [18:41:55.452] - globals found: [2] 'FUN', 'UseMethod' [18:41:55.452] Searching for globals ... DONE [18:41:55.452] Resolving globals: FALSE [18:41:55.453] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:55.453] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:55.453] - globals: [1] 'FUN' [18:41:55.454] [18:41:55.454] getGlobalsAndPackages() ... DONE [18:41:55.454] - globals found/used: [n=1] 'FUN' [18:41:55.454] - needed namespaces: [n=0] [18:41:55.454] Finding globals ... DONE [18:41:55.454] - use_args: TRUE [18:41:55.455] - Getting '...' globals ... [18:41:55.455] resolve() on list ... [18:41:55.455] recursive: 0 [18:41:55.455] length: 1 [18:41:55.456] elements: '...' [18:41:55.456] length: 0 (resolved future 1) [18:41:55.456] resolve() on list ... DONE [18:41:55.456] - '...' content: [n=0] [18:41:55.456] List of 1 [18:41:55.456] $ ...: list() [18:41:55.456] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.456] - attr(*, "where")=List of 1 [18:41:55.456] ..$ ...: [18:41:55.456] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.456] - attr(*, "resolved")= logi TRUE [18:41:55.456] - attr(*, "total_size")= num NA [18:41:55.459] - Getting '...' globals ... DONE [18:41:55.459] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:55.460] List of 2 [18:41:55.460] $ ...future.FUN:function (x, ...) [18:41:55.460] $ ... : list() [18:41:55.460] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.460] - attr(*, "where")=List of 2 [18:41:55.460] ..$ ...future.FUN: [18:41:55.460] ..$ ... : [18:41:55.460] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.460] - attr(*, "resolved")= logi FALSE [18:41:55.460] - attr(*, "total_size")= int 5150 [18:41:55.466] Packages to be attached in all futures: [n=0] [18:41:55.467] getGlobalsAndPackagesXApply() ... DONE [18:41:55.467] Number of futures (= number of chunks): 2 [18:41:55.467] Launching 2 futures (chunks) ... [18:41:55.467] Chunk #1 of 2 ... [18:41:55.468] - Finding globals in 'X' for chunk #1 ... [18:41:55.468] getGlobalsAndPackages() ... [18:41:55.468] Searching for globals... [18:41:55.468] [18:41:55.468] Searching for globals ... DONE [18:41:55.469] - globals: [0] [18:41:55.469] getGlobalsAndPackages() ... DONE [18:41:55.469] + additional globals found: [n=0] [18:41:55.469] + additional namespaces needed: [n=0] [18:41:55.469] - Finding globals in 'X' for chunk #1 ... DONE [18:41:55.469] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.469] - seeds: [18:41:55.470] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.470] getGlobalsAndPackages() ... [18:41:55.470] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.470] Resolving globals: FALSE [18:41:55.470] Tweak future expression to call with '...' arguments ... [18:41:55.471] { [18:41:55.471] do.call(function(...) { [18:41:55.471] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.471] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.471] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.471] on.exit(options(oopts), add = TRUE) [18:41:55.471] } [18:41:55.471] { [18:41:55.471] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.471] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.471] ...future.FUN(...future.X_jj, ...) [18:41:55.471] }) [18:41:55.471] } [18:41:55.471] }, args = future.call.arguments) [18:41:55.471] } [18:41:55.471] Tweak future expression to call with '...' arguments ... DONE [18:41:55.471] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.472] [18:41:55.472] getGlobalsAndPackages() ... DONE [18:41:55.472] run() for 'Future' ... [18:41:55.472] - state: 'created' [18:41:55.473] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.488] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.488] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.489] - Field: 'node' [18:41:55.489] - Field: 'label' [18:41:55.489] - Field: 'local' [18:41:55.489] - Field: 'owner' [18:41:55.489] - Field: 'envir' [18:41:55.490] - Field: 'workers' [18:41:55.490] - Field: 'packages' [18:41:55.490] - Field: 'gc' [18:41:55.490] - Field: 'conditions' [18:41:55.490] - Field: 'persistent' [18:41:55.490] - Field: 'expr' [18:41:55.491] - Field: 'uuid' [18:41:55.491] - Field: 'seed' [18:41:55.491] - Field: 'version' [18:41:55.491] - Field: 'result' [18:41:55.491] - Field: 'asynchronous' [18:41:55.491] - Field: 'calls' [18:41:55.492] - Field: 'globals' [18:41:55.492] - Field: 'stdout' [18:41:55.492] - Field: 'earlySignal' [18:41:55.492] - Field: 'lazy' [18:41:55.492] - Field: 'state' [18:41:55.492] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.493] - Launch lazy future ... [18:41:55.493] Packages needed by the future expression (n = 0): [18:41:55.493] Packages needed by future strategies (n = 0): [18:41:55.494] { [18:41:55.494] { [18:41:55.494] { [18:41:55.494] ...future.startTime <- base::Sys.time() [18:41:55.494] { [18:41:55.494] { [18:41:55.494] { [18:41:55.494] { [18:41:55.494] base::local({ [18:41:55.494] has_future <- base::requireNamespace("future", [18:41:55.494] quietly = TRUE) [18:41:55.494] if (has_future) { [18:41:55.494] ns <- base::getNamespace("future") [18:41:55.494] version <- ns[[".package"]][["version"]] [18:41:55.494] if (is.null(version)) [18:41:55.494] version <- utils::packageVersion("future") [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] version <- NULL [18:41:55.494] } [18:41:55.494] if (!has_future || version < "1.8.0") { [18:41:55.494] info <- base::c(r_version = base::gsub("R version ", [18:41:55.494] "", base::R.version$version.string), [18:41:55.494] platform = base::sprintf("%s (%s-bit)", [18:41:55.494] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.494] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.494] "release", "version")], collapse = " "), [18:41:55.494] hostname = base::Sys.info()[["nodename"]]) [18:41:55.494] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.494] info) [18:41:55.494] info <- base::paste(info, collapse = "; ") [18:41:55.494] if (!has_future) { [18:41:55.494] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.494] info) [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.494] info, version) [18:41:55.494] } [18:41:55.494] base::stop(msg) [18:41:55.494] } [18:41:55.494] }) [18:41:55.494] } [18:41:55.494] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.494] base::options(mc.cores = 1L) [18:41:55.494] } [18:41:55.494] ...future.strategy.old <- future::plan("list") [18:41:55.494] options(future.plan = NULL) [18:41:55.494] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.494] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.494] } [18:41:55.494] ...future.workdir <- getwd() [18:41:55.494] } [18:41:55.494] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.494] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.494] } [18:41:55.494] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.494] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.494] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.494] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.494] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.494] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.494] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.494] base::names(...future.oldOptions)) [18:41:55.494] } [18:41:55.494] if (FALSE) { [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] if (TRUE) { [18:41:55.494] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.494] open = "w") [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.494] windows = "NUL", "/dev/null"), open = "w") [18:41:55.494] } [18:41:55.494] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.494] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.494] base::sink(type = "output", split = FALSE) [18:41:55.494] base::close(...future.stdout) [18:41:55.494] }, add = TRUE) [18:41:55.494] } [18:41:55.494] ...future.frame <- base::sys.nframe() [18:41:55.494] ...future.conditions <- base::list() [18:41:55.494] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.494] if (FALSE) { [18:41:55.494] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.494] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.494] } [18:41:55.494] ...future.result <- base::tryCatch({ [18:41:55.494] base::withCallingHandlers({ [18:41:55.494] ...future.value <- base::withVisible(base::local({ [18:41:55.494] ...future.makeSendCondition <- base::local({ [18:41:55.494] sendCondition <- NULL [18:41:55.494] function(frame = 1L) { [18:41:55.494] if (is.function(sendCondition)) [18:41:55.494] return(sendCondition) [18:41:55.494] ns <- getNamespace("parallel") [18:41:55.494] if (exists("sendData", mode = "function", [18:41:55.494] envir = ns)) { [18:41:55.494] parallel_sendData <- get("sendData", mode = "function", [18:41:55.494] envir = ns) [18:41:55.494] envir <- sys.frame(frame) [18:41:55.494] master <- NULL [18:41:55.494] while (!identical(envir, .GlobalEnv) && [18:41:55.494] !identical(envir, emptyenv())) { [18:41:55.494] if (exists("master", mode = "list", envir = envir, [18:41:55.494] inherits = FALSE)) { [18:41:55.494] master <- get("master", mode = "list", [18:41:55.494] envir = envir, inherits = FALSE) [18:41:55.494] if (inherits(master, c("SOCKnode", [18:41:55.494] "SOCK0node"))) { [18:41:55.494] sendCondition <<- function(cond) { [18:41:55.494] data <- list(type = "VALUE", value = cond, [18:41:55.494] success = TRUE) [18:41:55.494] parallel_sendData(master, data) [18:41:55.494] } [18:41:55.494] return(sendCondition) [18:41:55.494] } [18:41:55.494] } [18:41:55.494] frame <- frame + 1L [18:41:55.494] envir <- sys.frame(frame) [18:41:55.494] } [18:41:55.494] } [18:41:55.494] sendCondition <<- function(cond) NULL [18:41:55.494] } [18:41:55.494] }) [18:41:55.494] withCallingHandlers({ [18:41:55.494] { [18:41:55.494] do.call(function(...) { [18:41:55.494] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.494] if (!identical(...future.globals.maxSize.org, [18:41:55.494] ...future.globals.maxSize)) { [18:41:55.494] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.494] on.exit(options(oopts), add = TRUE) [18:41:55.494] } [18:41:55.494] { [18:41:55.494] lapply(seq_along(...future.elements_ii), [18:41:55.494] FUN = function(jj) { [18:41:55.494] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.494] ...future.FUN(...future.X_jj, ...) [18:41:55.494] }) [18:41:55.494] } [18:41:55.494] }, args = future.call.arguments) [18:41:55.494] } [18:41:55.494] }, immediateCondition = function(cond) { [18:41:55.494] sendCondition <- ...future.makeSendCondition() [18:41:55.494] sendCondition(cond) [18:41:55.494] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.494] { [18:41:55.494] inherits <- base::inherits [18:41:55.494] invokeRestart <- base::invokeRestart [18:41:55.494] is.null <- base::is.null [18:41:55.494] muffled <- FALSE [18:41:55.494] if (inherits(cond, "message")) { [18:41:55.494] muffled <- grepl(pattern, "muffleMessage") [18:41:55.494] if (muffled) [18:41:55.494] invokeRestart("muffleMessage") [18:41:55.494] } [18:41:55.494] else if (inherits(cond, "warning")) { [18:41:55.494] muffled <- grepl(pattern, "muffleWarning") [18:41:55.494] if (muffled) [18:41:55.494] invokeRestart("muffleWarning") [18:41:55.494] } [18:41:55.494] else if (inherits(cond, "condition")) { [18:41:55.494] if (!is.null(pattern)) { [18:41:55.494] computeRestarts <- base::computeRestarts [18:41:55.494] grepl <- base::grepl [18:41:55.494] restarts <- computeRestarts(cond) [18:41:55.494] for (restart in restarts) { [18:41:55.494] name <- restart$name [18:41:55.494] if (is.null(name)) [18:41:55.494] next [18:41:55.494] if (!grepl(pattern, name)) [18:41:55.494] next [18:41:55.494] invokeRestart(restart) [18:41:55.494] muffled <- TRUE [18:41:55.494] break [18:41:55.494] } [18:41:55.494] } [18:41:55.494] } [18:41:55.494] invisible(muffled) [18:41:55.494] } [18:41:55.494] muffleCondition(cond) [18:41:55.494] }) [18:41:55.494] })) [18:41:55.494] future::FutureResult(value = ...future.value$value, [18:41:55.494] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.494] ...future.rng), globalenv = if (FALSE) [18:41:55.494] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.494] ...future.globalenv.names)) [18:41:55.494] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.494] }, condition = base::local({ [18:41:55.494] c <- base::c [18:41:55.494] inherits <- base::inherits [18:41:55.494] invokeRestart <- base::invokeRestart [18:41:55.494] length <- base::length [18:41:55.494] list <- base::list [18:41:55.494] seq.int <- base::seq.int [18:41:55.494] signalCondition <- base::signalCondition [18:41:55.494] sys.calls <- base::sys.calls [18:41:55.494] `[[` <- base::`[[` [18:41:55.494] `+` <- base::`+` [18:41:55.494] `<<-` <- base::`<<-` [18:41:55.494] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.494] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.494] 3L)] [18:41:55.494] } [18:41:55.494] function(cond) { [18:41:55.494] is_error <- inherits(cond, "error") [18:41:55.494] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.494] NULL) [18:41:55.494] if (is_error) { [18:41:55.494] sessionInformation <- function() { [18:41:55.494] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.494] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.494] search = base::search(), system = base::Sys.info()) [18:41:55.494] } [18:41:55.494] ...future.conditions[[length(...future.conditions) + [18:41:55.494] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.494] cond$call), session = sessionInformation(), [18:41:55.494] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.494] signalCondition(cond) [18:41:55.494] } [18:41:55.494] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.494] "immediateCondition"))) { [18:41:55.494] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.494] ...future.conditions[[length(...future.conditions) + [18:41:55.494] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.494] if (TRUE && !signal) { [18:41:55.494] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.494] { [18:41:55.494] inherits <- base::inherits [18:41:55.494] invokeRestart <- base::invokeRestart [18:41:55.494] is.null <- base::is.null [18:41:55.494] muffled <- FALSE [18:41:55.494] if (inherits(cond, "message")) { [18:41:55.494] muffled <- grepl(pattern, "muffleMessage") [18:41:55.494] if (muffled) [18:41:55.494] invokeRestart("muffleMessage") [18:41:55.494] } [18:41:55.494] else if (inherits(cond, "warning")) { [18:41:55.494] muffled <- grepl(pattern, "muffleWarning") [18:41:55.494] if (muffled) [18:41:55.494] invokeRestart("muffleWarning") [18:41:55.494] } [18:41:55.494] else if (inherits(cond, "condition")) { [18:41:55.494] if (!is.null(pattern)) { [18:41:55.494] computeRestarts <- base::computeRestarts [18:41:55.494] grepl <- base::grepl [18:41:55.494] restarts <- computeRestarts(cond) [18:41:55.494] for (restart in restarts) { [18:41:55.494] name <- restart$name [18:41:55.494] if (is.null(name)) [18:41:55.494] next [18:41:55.494] if (!grepl(pattern, name)) [18:41:55.494] next [18:41:55.494] invokeRestart(restart) [18:41:55.494] muffled <- TRUE [18:41:55.494] break [18:41:55.494] } [18:41:55.494] } [18:41:55.494] } [18:41:55.494] invisible(muffled) [18:41:55.494] } [18:41:55.494] muffleCondition(cond, pattern = "^muffle") [18:41:55.494] } [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] if (TRUE) { [18:41:55.494] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.494] { [18:41:55.494] inherits <- base::inherits [18:41:55.494] invokeRestart <- base::invokeRestart [18:41:55.494] is.null <- base::is.null [18:41:55.494] muffled <- FALSE [18:41:55.494] if (inherits(cond, "message")) { [18:41:55.494] muffled <- grepl(pattern, "muffleMessage") [18:41:55.494] if (muffled) [18:41:55.494] invokeRestart("muffleMessage") [18:41:55.494] } [18:41:55.494] else if (inherits(cond, "warning")) { [18:41:55.494] muffled <- grepl(pattern, "muffleWarning") [18:41:55.494] if (muffled) [18:41:55.494] invokeRestart("muffleWarning") [18:41:55.494] } [18:41:55.494] else if (inherits(cond, "condition")) { [18:41:55.494] if (!is.null(pattern)) { [18:41:55.494] computeRestarts <- base::computeRestarts [18:41:55.494] grepl <- base::grepl [18:41:55.494] restarts <- computeRestarts(cond) [18:41:55.494] for (restart in restarts) { [18:41:55.494] name <- restart$name [18:41:55.494] if (is.null(name)) [18:41:55.494] next [18:41:55.494] if (!grepl(pattern, name)) [18:41:55.494] next [18:41:55.494] invokeRestart(restart) [18:41:55.494] muffled <- TRUE [18:41:55.494] break [18:41:55.494] } [18:41:55.494] } [18:41:55.494] } [18:41:55.494] invisible(muffled) [18:41:55.494] } [18:41:55.494] muffleCondition(cond, pattern = "^muffle") [18:41:55.494] } [18:41:55.494] } [18:41:55.494] } [18:41:55.494] })) [18:41:55.494] }, error = function(ex) { [18:41:55.494] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.494] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.494] ...future.rng), started = ...future.startTime, [18:41:55.494] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.494] version = "1.8"), class = "FutureResult") [18:41:55.494] }, finally = { [18:41:55.494] if (!identical(...future.workdir, getwd())) [18:41:55.494] setwd(...future.workdir) [18:41:55.494] { [18:41:55.494] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.494] ...future.oldOptions$nwarnings <- NULL [18:41:55.494] } [18:41:55.494] base::options(...future.oldOptions) [18:41:55.494] if (.Platform$OS.type == "windows") { [18:41:55.494] old_names <- names(...future.oldEnvVars) [18:41:55.494] envs <- base::Sys.getenv() [18:41:55.494] names <- names(envs) [18:41:55.494] common <- intersect(names, old_names) [18:41:55.494] added <- setdiff(names, old_names) [18:41:55.494] removed <- setdiff(old_names, names) [18:41:55.494] changed <- common[...future.oldEnvVars[common] != [18:41:55.494] envs[common]] [18:41:55.494] NAMES <- toupper(changed) [18:41:55.494] args <- list() [18:41:55.494] for (kk in seq_along(NAMES)) { [18:41:55.494] name <- changed[[kk]] [18:41:55.494] NAME <- NAMES[[kk]] [18:41:55.494] if (name != NAME && is.element(NAME, old_names)) [18:41:55.494] next [18:41:55.494] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.494] } [18:41:55.494] NAMES <- toupper(added) [18:41:55.494] for (kk in seq_along(NAMES)) { [18:41:55.494] name <- added[[kk]] [18:41:55.494] NAME <- NAMES[[kk]] [18:41:55.494] if (name != NAME && is.element(NAME, old_names)) [18:41:55.494] next [18:41:55.494] args[[name]] <- "" [18:41:55.494] } [18:41:55.494] NAMES <- toupper(removed) [18:41:55.494] for (kk in seq_along(NAMES)) { [18:41:55.494] name <- removed[[kk]] [18:41:55.494] NAME <- NAMES[[kk]] [18:41:55.494] if (name != NAME && is.element(NAME, old_names)) [18:41:55.494] next [18:41:55.494] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.494] } [18:41:55.494] if (length(args) > 0) [18:41:55.494] base::do.call(base::Sys.setenv, args = args) [18:41:55.494] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.494] } [18:41:55.494] { [18:41:55.494] if (base::length(...future.futureOptionsAdded) > [18:41:55.494] 0L) { [18:41:55.494] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.494] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.494] base::options(opts) [18:41:55.494] } [18:41:55.494] { [18:41:55.494] { [18:41:55.494] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.494] NULL [18:41:55.494] } [18:41:55.494] options(future.plan = NULL) [18:41:55.494] if (is.na(NA_character_)) [18:41:55.494] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.494] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.494] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.494] .init = FALSE) [18:41:55.494] } [18:41:55.494] } [18:41:55.494] } [18:41:55.494] }) [18:41:55.494] if (TRUE) { [18:41:55.494] base::sink(type = "output", split = FALSE) [18:41:55.494] if (TRUE) { [18:41:55.494] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.494] } [18:41:55.494] else { [18:41:55.494] ...future.result["stdout"] <- base::list(NULL) [18:41:55.494] } [18:41:55.494] base::close(...future.stdout) [18:41:55.494] ...future.stdout <- NULL [18:41:55.494] } [18:41:55.494] ...future.result$conditions <- ...future.conditions [18:41:55.494] ...future.result$finished <- base::Sys.time() [18:41:55.494] ...future.result [18:41:55.494] } [18:41:55.499] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:55.499] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:55.500] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:55.500] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.500] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.500] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.501] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.501] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.501] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.502] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.502] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.502] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:55.503] MultisessionFuture started [18:41:55.503] - Launch lazy future ... done [18:41:55.503] run() for 'MultisessionFuture' ... done [18:41:55.503] Created future: [18:41:55.518] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.518] - Validating connection of MultisessionFuture [18:41:55.519] - received message: FutureResult [18:41:55.519] - Received FutureResult [18:41:55.519] - Erased future from FutureRegistry [18:41:55.519] result() for ClusterFuture ... [18:41:55.519] - result already collected: FutureResult [18:41:55.519] result() for ClusterFuture ... done [18:41:55.520] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.504] MultisessionFuture: [18:41:55.504] Label: 'future_sapply-1' [18:41:55.504] Expression: [18:41:55.504] { [18:41:55.504] do.call(function(...) { [18:41:55.504] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.504] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.504] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.504] on.exit(options(oopts), add = TRUE) [18:41:55.504] } [18:41:55.504] { [18:41:55.504] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.504] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.504] ...future.FUN(...future.X_jj, ...) [18:41:55.504] }) [18:41:55.504] } [18:41:55.504] }, args = future.call.arguments) [18:41:55.504] } [18:41:55.504] Lazy evaluation: FALSE [18:41:55.504] Asynchronous evaluation: TRUE [18:41:55.504] Local evaluation: TRUE [18:41:55.504] Environment: R_GlobalEnv [18:41:55.504] Capture standard output: TRUE [18:41:55.504] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.504] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.504] Packages: [18:41:55.504] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.504] Resolved: TRUE [18:41:55.504] Value: [18:41:55.504] Conditions captured: [18:41:55.504] Early signaling: FALSE [18:41:55.504] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.504] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.520] Chunk #1 of 2 ... DONE [18:41:55.520] Chunk #2 of 2 ... [18:41:55.520] - Finding globals in 'X' for chunk #2 ... [18:41:55.521] getGlobalsAndPackages() ... [18:41:55.521] Searching for globals... [18:41:55.521] [18:41:55.521] Searching for globals ... DONE [18:41:55.521] - globals: [0] [18:41:55.522] getGlobalsAndPackages() ... DONE [18:41:55.522] + additional globals found: [n=0] [18:41:55.522] + additional namespaces needed: [n=0] [18:41:55.522] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.522] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.522] - seeds: [18:41:55.522] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.523] getGlobalsAndPackages() ... [18:41:55.523] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.523] Resolving globals: FALSE [18:41:55.523] Tweak future expression to call with '...' arguments ... [18:41:55.523] { [18:41:55.523] do.call(function(...) { [18:41:55.523] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.523] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.523] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.523] on.exit(options(oopts), add = TRUE) [18:41:55.523] } [18:41:55.523] { [18:41:55.523] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.523] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.523] ...future.FUN(...future.X_jj, ...) [18:41:55.523] }) [18:41:55.523] } [18:41:55.523] }, args = future.call.arguments) [18:41:55.523] } [18:41:55.524] Tweak future expression to call with '...' arguments ... DONE [18:41:55.524] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.525] [18:41:55.525] getGlobalsAndPackages() ... DONE [18:41:55.525] run() for 'Future' ... [18:41:55.525] - state: 'created' [18:41:55.525] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.542] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.542] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.543] - Field: 'node' [18:41:55.543] - Field: 'label' [18:41:55.543] - Field: 'local' [18:41:55.543] - Field: 'owner' [18:41:55.543] - Field: 'envir' [18:41:55.543] - Field: 'workers' [18:41:55.544] - Field: 'packages' [18:41:55.544] - Field: 'gc' [18:41:55.544] - Field: 'conditions' [18:41:55.544] - Field: 'persistent' [18:41:55.544] - Field: 'expr' [18:41:55.544] - Field: 'uuid' [18:41:55.545] - Field: 'seed' [18:41:55.545] - Field: 'version' [18:41:55.545] - Field: 'result' [18:41:55.545] - Field: 'asynchronous' [18:41:55.545] - Field: 'calls' [18:41:55.546] - Field: 'globals' [18:41:55.546] - Field: 'stdout' [18:41:55.546] - Field: 'earlySignal' [18:41:55.546] - Field: 'lazy' [18:41:55.546] - Field: 'state' [18:41:55.546] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.547] - Launch lazy future ... [18:41:55.547] Packages needed by the future expression (n = 0): [18:41:55.547] Packages needed by future strategies (n = 0): [18:41:55.548] { [18:41:55.548] { [18:41:55.548] { [18:41:55.548] ...future.startTime <- base::Sys.time() [18:41:55.548] { [18:41:55.548] { [18:41:55.548] { [18:41:55.548] { [18:41:55.548] base::local({ [18:41:55.548] has_future <- base::requireNamespace("future", [18:41:55.548] quietly = TRUE) [18:41:55.548] if (has_future) { [18:41:55.548] ns <- base::getNamespace("future") [18:41:55.548] version <- ns[[".package"]][["version"]] [18:41:55.548] if (is.null(version)) [18:41:55.548] version <- utils::packageVersion("future") [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] version <- NULL [18:41:55.548] } [18:41:55.548] if (!has_future || version < "1.8.0") { [18:41:55.548] info <- base::c(r_version = base::gsub("R version ", [18:41:55.548] "", base::R.version$version.string), [18:41:55.548] platform = base::sprintf("%s (%s-bit)", [18:41:55.548] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.548] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.548] "release", "version")], collapse = " "), [18:41:55.548] hostname = base::Sys.info()[["nodename"]]) [18:41:55.548] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.548] info) [18:41:55.548] info <- base::paste(info, collapse = "; ") [18:41:55.548] if (!has_future) { [18:41:55.548] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.548] info) [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.548] info, version) [18:41:55.548] } [18:41:55.548] base::stop(msg) [18:41:55.548] } [18:41:55.548] }) [18:41:55.548] } [18:41:55.548] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.548] base::options(mc.cores = 1L) [18:41:55.548] } [18:41:55.548] ...future.strategy.old <- future::plan("list") [18:41:55.548] options(future.plan = NULL) [18:41:55.548] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.548] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.548] } [18:41:55.548] ...future.workdir <- getwd() [18:41:55.548] } [18:41:55.548] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.548] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.548] } [18:41:55.548] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.548] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.548] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.548] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.548] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.548] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.548] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.548] base::names(...future.oldOptions)) [18:41:55.548] } [18:41:55.548] if (FALSE) { [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] if (TRUE) { [18:41:55.548] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.548] open = "w") [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.548] windows = "NUL", "/dev/null"), open = "w") [18:41:55.548] } [18:41:55.548] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.548] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.548] base::sink(type = "output", split = FALSE) [18:41:55.548] base::close(...future.stdout) [18:41:55.548] }, add = TRUE) [18:41:55.548] } [18:41:55.548] ...future.frame <- base::sys.nframe() [18:41:55.548] ...future.conditions <- base::list() [18:41:55.548] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.548] if (FALSE) { [18:41:55.548] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.548] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.548] } [18:41:55.548] ...future.result <- base::tryCatch({ [18:41:55.548] base::withCallingHandlers({ [18:41:55.548] ...future.value <- base::withVisible(base::local({ [18:41:55.548] ...future.makeSendCondition <- base::local({ [18:41:55.548] sendCondition <- NULL [18:41:55.548] function(frame = 1L) { [18:41:55.548] if (is.function(sendCondition)) [18:41:55.548] return(sendCondition) [18:41:55.548] ns <- getNamespace("parallel") [18:41:55.548] if (exists("sendData", mode = "function", [18:41:55.548] envir = ns)) { [18:41:55.548] parallel_sendData <- get("sendData", mode = "function", [18:41:55.548] envir = ns) [18:41:55.548] envir <- sys.frame(frame) [18:41:55.548] master <- NULL [18:41:55.548] while (!identical(envir, .GlobalEnv) && [18:41:55.548] !identical(envir, emptyenv())) { [18:41:55.548] if (exists("master", mode = "list", envir = envir, [18:41:55.548] inherits = FALSE)) { [18:41:55.548] master <- get("master", mode = "list", [18:41:55.548] envir = envir, inherits = FALSE) [18:41:55.548] if (inherits(master, c("SOCKnode", [18:41:55.548] "SOCK0node"))) { [18:41:55.548] sendCondition <<- function(cond) { [18:41:55.548] data <- list(type = "VALUE", value = cond, [18:41:55.548] success = TRUE) [18:41:55.548] parallel_sendData(master, data) [18:41:55.548] } [18:41:55.548] return(sendCondition) [18:41:55.548] } [18:41:55.548] } [18:41:55.548] frame <- frame + 1L [18:41:55.548] envir <- sys.frame(frame) [18:41:55.548] } [18:41:55.548] } [18:41:55.548] sendCondition <<- function(cond) NULL [18:41:55.548] } [18:41:55.548] }) [18:41:55.548] withCallingHandlers({ [18:41:55.548] { [18:41:55.548] do.call(function(...) { [18:41:55.548] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.548] if (!identical(...future.globals.maxSize.org, [18:41:55.548] ...future.globals.maxSize)) { [18:41:55.548] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.548] on.exit(options(oopts), add = TRUE) [18:41:55.548] } [18:41:55.548] { [18:41:55.548] lapply(seq_along(...future.elements_ii), [18:41:55.548] FUN = function(jj) { [18:41:55.548] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.548] ...future.FUN(...future.X_jj, ...) [18:41:55.548] }) [18:41:55.548] } [18:41:55.548] }, args = future.call.arguments) [18:41:55.548] } [18:41:55.548] }, immediateCondition = function(cond) { [18:41:55.548] sendCondition <- ...future.makeSendCondition() [18:41:55.548] sendCondition(cond) [18:41:55.548] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.548] { [18:41:55.548] inherits <- base::inherits [18:41:55.548] invokeRestart <- base::invokeRestart [18:41:55.548] is.null <- base::is.null [18:41:55.548] muffled <- FALSE [18:41:55.548] if (inherits(cond, "message")) { [18:41:55.548] muffled <- grepl(pattern, "muffleMessage") [18:41:55.548] if (muffled) [18:41:55.548] invokeRestart("muffleMessage") [18:41:55.548] } [18:41:55.548] else if (inherits(cond, "warning")) { [18:41:55.548] muffled <- grepl(pattern, "muffleWarning") [18:41:55.548] if (muffled) [18:41:55.548] invokeRestart("muffleWarning") [18:41:55.548] } [18:41:55.548] else if (inherits(cond, "condition")) { [18:41:55.548] if (!is.null(pattern)) { [18:41:55.548] computeRestarts <- base::computeRestarts [18:41:55.548] grepl <- base::grepl [18:41:55.548] restarts <- computeRestarts(cond) [18:41:55.548] for (restart in restarts) { [18:41:55.548] name <- restart$name [18:41:55.548] if (is.null(name)) [18:41:55.548] next [18:41:55.548] if (!grepl(pattern, name)) [18:41:55.548] next [18:41:55.548] invokeRestart(restart) [18:41:55.548] muffled <- TRUE [18:41:55.548] break [18:41:55.548] } [18:41:55.548] } [18:41:55.548] } [18:41:55.548] invisible(muffled) [18:41:55.548] } [18:41:55.548] muffleCondition(cond) [18:41:55.548] }) [18:41:55.548] })) [18:41:55.548] future::FutureResult(value = ...future.value$value, [18:41:55.548] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.548] ...future.rng), globalenv = if (FALSE) [18:41:55.548] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.548] ...future.globalenv.names)) [18:41:55.548] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.548] }, condition = base::local({ [18:41:55.548] c <- base::c [18:41:55.548] inherits <- base::inherits [18:41:55.548] invokeRestart <- base::invokeRestart [18:41:55.548] length <- base::length [18:41:55.548] list <- base::list [18:41:55.548] seq.int <- base::seq.int [18:41:55.548] signalCondition <- base::signalCondition [18:41:55.548] sys.calls <- base::sys.calls [18:41:55.548] `[[` <- base::`[[` [18:41:55.548] `+` <- base::`+` [18:41:55.548] `<<-` <- base::`<<-` [18:41:55.548] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.548] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.548] 3L)] [18:41:55.548] } [18:41:55.548] function(cond) { [18:41:55.548] is_error <- inherits(cond, "error") [18:41:55.548] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.548] NULL) [18:41:55.548] if (is_error) { [18:41:55.548] sessionInformation <- function() { [18:41:55.548] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.548] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.548] search = base::search(), system = base::Sys.info()) [18:41:55.548] } [18:41:55.548] ...future.conditions[[length(...future.conditions) + [18:41:55.548] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.548] cond$call), session = sessionInformation(), [18:41:55.548] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.548] signalCondition(cond) [18:41:55.548] } [18:41:55.548] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.548] "immediateCondition"))) { [18:41:55.548] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.548] ...future.conditions[[length(...future.conditions) + [18:41:55.548] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.548] if (TRUE && !signal) { [18:41:55.548] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.548] { [18:41:55.548] inherits <- base::inherits [18:41:55.548] invokeRestart <- base::invokeRestart [18:41:55.548] is.null <- base::is.null [18:41:55.548] muffled <- FALSE [18:41:55.548] if (inherits(cond, "message")) { [18:41:55.548] muffled <- grepl(pattern, "muffleMessage") [18:41:55.548] if (muffled) [18:41:55.548] invokeRestart("muffleMessage") [18:41:55.548] } [18:41:55.548] else if (inherits(cond, "warning")) { [18:41:55.548] muffled <- grepl(pattern, "muffleWarning") [18:41:55.548] if (muffled) [18:41:55.548] invokeRestart("muffleWarning") [18:41:55.548] } [18:41:55.548] else if (inherits(cond, "condition")) { [18:41:55.548] if (!is.null(pattern)) { [18:41:55.548] computeRestarts <- base::computeRestarts [18:41:55.548] grepl <- base::grepl [18:41:55.548] restarts <- computeRestarts(cond) [18:41:55.548] for (restart in restarts) { [18:41:55.548] name <- restart$name [18:41:55.548] if (is.null(name)) [18:41:55.548] next [18:41:55.548] if (!grepl(pattern, name)) [18:41:55.548] next [18:41:55.548] invokeRestart(restart) [18:41:55.548] muffled <- TRUE [18:41:55.548] break [18:41:55.548] } [18:41:55.548] } [18:41:55.548] } [18:41:55.548] invisible(muffled) [18:41:55.548] } [18:41:55.548] muffleCondition(cond, pattern = "^muffle") [18:41:55.548] } [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] if (TRUE) { [18:41:55.548] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.548] { [18:41:55.548] inherits <- base::inherits [18:41:55.548] invokeRestart <- base::invokeRestart [18:41:55.548] is.null <- base::is.null [18:41:55.548] muffled <- FALSE [18:41:55.548] if (inherits(cond, "message")) { [18:41:55.548] muffled <- grepl(pattern, "muffleMessage") [18:41:55.548] if (muffled) [18:41:55.548] invokeRestart("muffleMessage") [18:41:55.548] } [18:41:55.548] else if (inherits(cond, "warning")) { [18:41:55.548] muffled <- grepl(pattern, "muffleWarning") [18:41:55.548] if (muffled) [18:41:55.548] invokeRestart("muffleWarning") [18:41:55.548] } [18:41:55.548] else if (inherits(cond, "condition")) { [18:41:55.548] if (!is.null(pattern)) { [18:41:55.548] computeRestarts <- base::computeRestarts [18:41:55.548] grepl <- base::grepl [18:41:55.548] restarts <- computeRestarts(cond) [18:41:55.548] for (restart in restarts) { [18:41:55.548] name <- restart$name [18:41:55.548] if (is.null(name)) [18:41:55.548] next [18:41:55.548] if (!grepl(pattern, name)) [18:41:55.548] next [18:41:55.548] invokeRestart(restart) [18:41:55.548] muffled <- TRUE [18:41:55.548] break [18:41:55.548] } [18:41:55.548] } [18:41:55.548] } [18:41:55.548] invisible(muffled) [18:41:55.548] } [18:41:55.548] muffleCondition(cond, pattern = "^muffle") [18:41:55.548] } [18:41:55.548] } [18:41:55.548] } [18:41:55.548] })) [18:41:55.548] }, error = function(ex) { [18:41:55.548] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.548] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.548] ...future.rng), started = ...future.startTime, [18:41:55.548] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.548] version = "1.8"), class = "FutureResult") [18:41:55.548] }, finally = { [18:41:55.548] if (!identical(...future.workdir, getwd())) [18:41:55.548] setwd(...future.workdir) [18:41:55.548] { [18:41:55.548] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.548] ...future.oldOptions$nwarnings <- NULL [18:41:55.548] } [18:41:55.548] base::options(...future.oldOptions) [18:41:55.548] if (.Platform$OS.type == "windows") { [18:41:55.548] old_names <- names(...future.oldEnvVars) [18:41:55.548] envs <- base::Sys.getenv() [18:41:55.548] names <- names(envs) [18:41:55.548] common <- intersect(names, old_names) [18:41:55.548] added <- setdiff(names, old_names) [18:41:55.548] removed <- setdiff(old_names, names) [18:41:55.548] changed <- common[...future.oldEnvVars[common] != [18:41:55.548] envs[common]] [18:41:55.548] NAMES <- toupper(changed) [18:41:55.548] args <- list() [18:41:55.548] for (kk in seq_along(NAMES)) { [18:41:55.548] name <- changed[[kk]] [18:41:55.548] NAME <- NAMES[[kk]] [18:41:55.548] if (name != NAME && is.element(NAME, old_names)) [18:41:55.548] next [18:41:55.548] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.548] } [18:41:55.548] NAMES <- toupper(added) [18:41:55.548] for (kk in seq_along(NAMES)) { [18:41:55.548] name <- added[[kk]] [18:41:55.548] NAME <- NAMES[[kk]] [18:41:55.548] if (name != NAME && is.element(NAME, old_names)) [18:41:55.548] next [18:41:55.548] args[[name]] <- "" [18:41:55.548] } [18:41:55.548] NAMES <- toupper(removed) [18:41:55.548] for (kk in seq_along(NAMES)) { [18:41:55.548] name <- removed[[kk]] [18:41:55.548] NAME <- NAMES[[kk]] [18:41:55.548] if (name != NAME && is.element(NAME, old_names)) [18:41:55.548] next [18:41:55.548] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.548] } [18:41:55.548] if (length(args) > 0) [18:41:55.548] base::do.call(base::Sys.setenv, args = args) [18:41:55.548] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.548] } [18:41:55.548] { [18:41:55.548] if (base::length(...future.futureOptionsAdded) > [18:41:55.548] 0L) { [18:41:55.548] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.548] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.548] base::options(opts) [18:41:55.548] } [18:41:55.548] { [18:41:55.548] { [18:41:55.548] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.548] NULL [18:41:55.548] } [18:41:55.548] options(future.plan = NULL) [18:41:55.548] if (is.na(NA_character_)) [18:41:55.548] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.548] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.548] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.548] .init = FALSE) [18:41:55.548] } [18:41:55.548] } [18:41:55.548] } [18:41:55.548] }) [18:41:55.548] if (TRUE) { [18:41:55.548] base::sink(type = "output", split = FALSE) [18:41:55.548] if (TRUE) { [18:41:55.548] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.548] } [18:41:55.548] else { [18:41:55.548] ...future.result["stdout"] <- base::list(NULL) [18:41:55.548] } [18:41:55.548] base::close(...future.stdout) [18:41:55.548] ...future.stdout <- NULL [18:41:55.548] } [18:41:55.548] ...future.result$conditions <- ...future.conditions [18:41:55.548] ...future.result$finished <- base::Sys.time() [18:41:55.548] ...future.result [18:41:55.548] } [18:41:55.553] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:55.553] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:55.554] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:55.554] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.554] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.554] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.555] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.555] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.555] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.556] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.556] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.556] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:55.557] MultisessionFuture started [18:41:55.557] - Launch lazy future ... done [18:41:55.557] run() for 'MultisessionFuture' ... done [18:41:55.557] Created future: [18:41:55.572] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.572] - Validating connection of MultisessionFuture [18:41:55.572] - received message: FutureResult [18:41:55.573] - Received FutureResult [18:41:55.573] - Erased future from FutureRegistry [18:41:55.573] result() for ClusterFuture ... [18:41:55.573] - result already collected: FutureResult [18:41:55.573] result() for ClusterFuture ... done [18:41:55.573] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.558] MultisessionFuture: [18:41:55.558] Label: 'future_sapply-2' [18:41:55.558] Expression: [18:41:55.558] { [18:41:55.558] do.call(function(...) { [18:41:55.558] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.558] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.558] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.558] on.exit(options(oopts), add = TRUE) [18:41:55.558] } [18:41:55.558] { [18:41:55.558] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.558] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.558] ...future.FUN(...future.X_jj, ...) [18:41:55.558] }) [18:41:55.558] } [18:41:55.558] }, args = future.call.arguments) [18:41:55.558] } [18:41:55.558] Lazy evaluation: FALSE [18:41:55.558] Asynchronous evaluation: TRUE [18:41:55.558] Local evaluation: TRUE [18:41:55.558] Environment: R_GlobalEnv [18:41:55.558] Capture standard output: TRUE [18:41:55.558] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.558] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.558] Packages: [18:41:55.558] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.558] Resolved: TRUE [18:41:55.558] Value: [18:41:55.558] Conditions captured: [18:41:55.558] Early signaling: FALSE [18:41:55.558] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.558] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.574] Chunk #2 of 2 ... DONE [18:41:55.574] Launching 2 futures (chunks) ... DONE [18:41:55.574] Resolving 2 futures (chunks) ... [18:41:55.574] resolve() on list ... [18:41:55.575] recursive: 0 [18:41:55.575] length: 2 [18:41:55.575] [18:41:55.575] Future #1 [18:41:55.575] result() for ClusterFuture ... [18:41:55.575] - result already collected: FutureResult [18:41:55.575] result() for ClusterFuture ... done [18:41:55.576] result() for ClusterFuture ... [18:41:55.576] - result already collected: FutureResult [18:41:55.576] result() for ClusterFuture ... done [18:41:55.576] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:55.576] - nx: 2 [18:41:55.576] - relay: TRUE [18:41:55.577] - stdout: TRUE [18:41:55.577] - signal: TRUE [18:41:55.577] - resignal: FALSE [18:41:55.577] - force: TRUE [18:41:55.577] - relayed: [n=2] FALSE, FALSE [18:41:55.577] - queued futures: [n=2] FALSE, FALSE [18:41:55.578] - until=1 [18:41:55.578] - relaying element #1 [18:41:55.578] result() for ClusterFuture ... [18:41:55.578] - result already collected: FutureResult [18:41:55.578] result() for ClusterFuture ... done [18:41:55.578] result() for ClusterFuture ... [18:41:55.578] - result already collected: FutureResult [18:41:55.579] result() for ClusterFuture ... done [18:41:55.579] result() for ClusterFuture ... [18:41:55.579] - result already collected: FutureResult [18:41:55.579] result() for ClusterFuture ... done [18:41:55.579] result() for ClusterFuture ... [18:41:55.579] - result already collected: FutureResult [18:41:55.580] result() for ClusterFuture ... done [18:41:55.580] - relayed: [n=2] TRUE, FALSE [18:41:55.580] - queued futures: [n=2] TRUE, FALSE [18:41:55.580] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:55.580] length: 1 (resolved future 1) [18:41:55.580] Future #2 [18:41:55.581] result() for ClusterFuture ... [18:41:55.581] - result already collected: FutureResult [18:41:55.581] result() for ClusterFuture ... done [18:41:55.581] result() for ClusterFuture ... [18:41:55.581] - result already collected: FutureResult [18:41:55.581] result() for ClusterFuture ... done [18:41:55.582] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:55.582] - nx: 2 [18:41:55.582] - relay: TRUE [18:41:55.582] - stdout: TRUE [18:41:55.582] - signal: TRUE [18:41:55.582] - resignal: FALSE [18:41:55.583] - force: TRUE [18:41:55.583] - relayed: [n=2] TRUE, FALSE [18:41:55.583] - queued futures: [n=2] TRUE, FALSE [18:41:55.583] - until=2 [18:41:55.583] - relaying element #2 [18:41:55.583] result() for ClusterFuture ... [18:41:55.583] - result already collected: FutureResult [18:41:55.584] result() for ClusterFuture ... done [18:41:55.584] result() for ClusterFuture ... [18:41:55.584] - result already collected: FutureResult [18:41:55.584] result() for ClusterFuture ... done [18:41:55.584] result() for ClusterFuture ... [18:41:55.584] - result already collected: FutureResult [18:41:55.585] result() for ClusterFuture ... done [18:41:55.585] result() for ClusterFuture ... [18:41:55.585] - result already collected: FutureResult [18:41:55.585] result() for ClusterFuture ... done [18:41:55.585] - relayed: [n=2] TRUE, TRUE [18:41:55.585] - queued futures: [n=2] TRUE, TRUE [18:41:55.586] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:55.586] length: 0 (resolved future 2) [18:41:55.586] Relaying remaining futures [18:41:55.586] signalConditionsASAP(NULL, pos=0) ... [18:41:55.586] - nx: 2 [18:41:55.586] - relay: TRUE [18:41:55.587] - stdout: TRUE [18:41:55.587] - signal: TRUE [18:41:55.587] - resignal: FALSE [18:41:55.587] - force: TRUE [18:41:55.587] - relayed: [n=2] TRUE, TRUE [18:41:55.587] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:55.588] - relayed: [n=2] TRUE, TRUE [18:41:55.588] - queued futures: [n=2] TRUE, TRUE [18:41:55.588] signalConditionsASAP(NULL, pos=0) ... done [18:41:55.588] resolve() on list ... DONE [18:41:55.588] result() for ClusterFuture ... [18:41:55.588] - result already collected: FutureResult [18:41:55.588] result() for ClusterFuture ... done [18:41:55.589] result() for ClusterFuture ... [18:41:55.589] - result already collected: FutureResult [18:41:55.589] result() for ClusterFuture ... done [18:41:55.589] result() for ClusterFuture ... [18:41:55.589] - result already collected: FutureResult [18:41:55.589] result() for ClusterFuture ... done [18:41:55.590] result() for ClusterFuture ... [18:41:55.590] - result already collected: FutureResult [18:41:55.590] result() for ClusterFuture ... done [18:41:55.590] - Number of value chunks collected: 2 [18:41:55.590] Resolving 2 futures (chunks) ... DONE [18:41:55.590] Reducing values from 2 chunks ... [18:41:55.591] - Number of values collected after concatenation: 4 [18:41:55.591] - Number of values expected: 4 [18:41:55.591] Reducing values from 2 chunks ... DONE [18:41:55.591] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:55.593] future_lapply() ... [18:41:55.596] Number of chunks: 2 [18:41:55.597] getGlobalsAndPackagesXApply() ... [18:41:55.597] - future.globals: TRUE [18:41:55.597] getGlobalsAndPackages() ... [18:41:55.597] Searching for globals... [18:41:55.599] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:55.599] Searching for globals ... DONE [18:41:55.599] Resolving globals: FALSE [18:41:55.600] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:55.600] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:55.601] - globals: [1] 'FUN' [18:41:55.601] [18:41:55.601] getGlobalsAndPackages() ... DONE [18:41:55.601] - globals found/used: [n=1] 'FUN' [18:41:55.601] - needed namespaces: [n=0] [18:41:55.601] Finding globals ... DONE [18:41:55.602] - use_args: TRUE [18:41:55.602] - Getting '...' globals ... [18:41:55.602] resolve() on list ... [18:41:55.602] recursive: 0 [18:41:55.603] length: 1 [18:41:55.603] elements: '...' [18:41:55.603] length: 0 (resolved future 1) [18:41:55.603] resolve() on list ... DONE [18:41:55.603] - '...' content: [n=0] [18:41:55.603] List of 1 [18:41:55.603] $ ...: list() [18:41:55.603] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.603] - attr(*, "where")=List of 1 [18:41:55.603] ..$ ...: [18:41:55.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.603] - attr(*, "resolved")= logi TRUE [18:41:55.603] - attr(*, "total_size")= num NA [18:41:55.606] - Getting '...' globals ... DONE [18:41:55.607] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:55.607] List of 2 [18:41:55.607] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:55.607] $ ... : list() [18:41:55.607] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.607] - attr(*, "where")=List of 2 [18:41:55.607] ..$ ...future.FUN: [18:41:55.607] ..$ ... : [18:41:55.607] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.607] - attr(*, "resolved")= logi FALSE [18:41:55.607] - attr(*, "total_size")= int 6632 [18:41:55.610] Packages to be attached in all futures: [n=0] [18:41:55.610] getGlobalsAndPackagesXApply() ... DONE [18:41:55.610] Number of futures (= number of chunks): 2 [18:41:55.611] Launching 2 futures (chunks) ... [18:41:55.611] Chunk #1 of 2 ... [18:41:55.611] - Finding globals in 'X' for chunk #1 ... [18:41:55.611] getGlobalsAndPackages() ... [18:41:55.611] Searching for globals... [18:41:55.612] [18:41:55.612] Searching for globals ... DONE [18:41:55.612] - globals: [0] [18:41:55.612] getGlobalsAndPackages() ... DONE [18:41:55.612] + additional globals found: [n=0] [18:41:55.612] + additional namespaces needed: [n=0] [18:41:55.613] - Finding globals in 'X' for chunk #1 ... DONE [18:41:55.613] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.613] - seeds: [18:41:55.613] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.613] getGlobalsAndPackages() ... [18:41:55.613] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.614] Resolving globals: FALSE [18:41:55.614] Tweak future expression to call with '...' arguments ... [18:41:55.614] { [18:41:55.614] do.call(function(...) { [18:41:55.614] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.614] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.614] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.614] on.exit(options(oopts), add = TRUE) [18:41:55.614] } [18:41:55.614] { [18:41:55.614] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.614] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.614] ...future.FUN(...future.X_jj, ...) [18:41:55.614] }) [18:41:55.614] } [18:41:55.614] }, args = future.call.arguments) [18:41:55.614] } [18:41:55.614] Tweak future expression to call with '...' arguments ... DONE [18:41:55.615] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.615] [18:41:55.615] getGlobalsAndPackages() ... DONE [18:41:55.616] run() for 'Future' ... [18:41:55.616] - state: 'created' [18:41:55.616] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.641] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.641] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.642] - Field: 'node' [18:41:55.642] - Field: 'label' [18:41:55.642] - Field: 'local' [18:41:55.642] - Field: 'owner' [18:41:55.642] - Field: 'envir' [18:41:55.642] - Field: 'workers' [18:41:55.643] - Field: 'packages' [18:41:55.643] - Field: 'gc' [18:41:55.643] - Field: 'conditions' [18:41:55.643] - Field: 'persistent' [18:41:55.643] - Field: 'expr' [18:41:55.643] - Field: 'uuid' [18:41:55.644] - Field: 'seed' [18:41:55.644] - Field: 'version' [18:41:55.644] - Field: 'result' [18:41:55.644] - Field: 'asynchronous' [18:41:55.644] - Field: 'calls' [18:41:55.645] - Field: 'globals' [18:41:55.645] - Field: 'stdout' [18:41:55.645] - Field: 'earlySignal' [18:41:55.645] - Field: 'lazy' [18:41:55.645] - Field: 'state' [18:41:55.646] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.646] - Launch lazy future ... [18:41:55.646] Packages needed by the future expression (n = 0): [18:41:55.646] Packages needed by future strategies (n = 0): [18:41:55.647] { [18:41:55.647] { [18:41:55.647] { [18:41:55.647] ...future.startTime <- base::Sys.time() [18:41:55.647] { [18:41:55.647] { [18:41:55.647] { [18:41:55.647] { [18:41:55.647] base::local({ [18:41:55.647] has_future <- base::requireNamespace("future", [18:41:55.647] quietly = TRUE) [18:41:55.647] if (has_future) { [18:41:55.647] ns <- base::getNamespace("future") [18:41:55.647] version <- ns[[".package"]][["version"]] [18:41:55.647] if (is.null(version)) [18:41:55.647] version <- utils::packageVersion("future") [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] version <- NULL [18:41:55.647] } [18:41:55.647] if (!has_future || version < "1.8.0") { [18:41:55.647] info <- base::c(r_version = base::gsub("R version ", [18:41:55.647] "", base::R.version$version.string), [18:41:55.647] platform = base::sprintf("%s (%s-bit)", [18:41:55.647] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.647] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.647] "release", "version")], collapse = " "), [18:41:55.647] hostname = base::Sys.info()[["nodename"]]) [18:41:55.647] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.647] info) [18:41:55.647] info <- base::paste(info, collapse = "; ") [18:41:55.647] if (!has_future) { [18:41:55.647] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.647] info) [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.647] info, version) [18:41:55.647] } [18:41:55.647] base::stop(msg) [18:41:55.647] } [18:41:55.647] }) [18:41:55.647] } [18:41:55.647] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.647] base::options(mc.cores = 1L) [18:41:55.647] } [18:41:55.647] ...future.strategy.old <- future::plan("list") [18:41:55.647] options(future.plan = NULL) [18:41:55.647] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.647] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.647] } [18:41:55.647] ...future.workdir <- getwd() [18:41:55.647] } [18:41:55.647] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.647] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.647] } [18:41:55.647] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.647] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.647] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.647] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.647] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.647] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.647] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.647] base::names(...future.oldOptions)) [18:41:55.647] } [18:41:55.647] if (FALSE) { [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] if (TRUE) { [18:41:55.647] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.647] open = "w") [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.647] windows = "NUL", "/dev/null"), open = "w") [18:41:55.647] } [18:41:55.647] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.647] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.647] base::sink(type = "output", split = FALSE) [18:41:55.647] base::close(...future.stdout) [18:41:55.647] }, add = TRUE) [18:41:55.647] } [18:41:55.647] ...future.frame <- base::sys.nframe() [18:41:55.647] ...future.conditions <- base::list() [18:41:55.647] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.647] if (FALSE) { [18:41:55.647] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.647] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.647] } [18:41:55.647] ...future.result <- base::tryCatch({ [18:41:55.647] base::withCallingHandlers({ [18:41:55.647] ...future.value <- base::withVisible(base::local({ [18:41:55.647] ...future.makeSendCondition <- base::local({ [18:41:55.647] sendCondition <- NULL [18:41:55.647] function(frame = 1L) { [18:41:55.647] if (is.function(sendCondition)) [18:41:55.647] return(sendCondition) [18:41:55.647] ns <- getNamespace("parallel") [18:41:55.647] if (exists("sendData", mode = "function", [18:41:55.647] envir = ns)) { [18:41:55.647] parallel_sendData <- get("sendData", mode = "function", [18:41:55.647] envir = ns) [18:41:55.647] envir <- sys.frame(frame) [18:41:55.647] master <- NULL [18:41:55.647] while (!identical(envir, .GlobalEnv) && [18:41:55.647] !identical(envir, emptyenv())) { [18:41:55.647] if (exists("master", mode = "list", envir = envir, [18:41:55.647] inherits = FALSE)) { [18:41:55.647] master <- get("master", mode = "list", [18:41:55.647] envir = envir, inherits = FALSE) [18:41:55.647] if (inherits(master, c("SOCKnode", [18:41:55.647] "SOCK0node"))) { [18:41:55.647] sendCondition <<- function(cond) { [18:41:55.647] data <- list(type = "VALUE", value = cond, [18:41:55.647] success = TRUE) [18:41:55.647] parallel_sendData(master, data) [18:41:55.647] } [18:41:55.647] return(sendCondition) [18:41:55.647] } [18:41:55.647] } [18:41:55.647] frame <- frame + 1L [18:41:55.647] envir <- sys.frame(frame) [18:41:55.647] } [18:41:55.647] } [18:41:55.647] sendCondition <<- function(cond) NULL [18:41:55.647] } [18:41:55.647] }) [18:41:55.647] withCallingHandlers({ [18:41:55.647] { [18:41:55.647] do.call(function(...) { [18:41:55.647] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.647] if (!identical(...future.globals.maxSize.org, [18:41:55.647] ...future.globals.maxSize)) { [18:41:55.647] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.647] on.exit(options(oopts), add = TRUE) [18:41:55.647] } [18:41:55.647] { [18:41:55.647] lapply(seq_along(...future.elements_ii), [18:41:55.647] FUN = function(jj) { [18:41:55.647] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.647] ...future.FUN(...future.X_jj, ...) [18:41:55.647] }) [18:41:55.647] } [18:41:55.647] }, args = future.call.arguments) [18:41:55.647] } [18:41:55.647] }, immediateCondition = function(cond) { [18:41:55.647] sendCondition <- ...future.makeSendCondition() [18:41:55.647] sendCondition(cond) [18:41:55.647] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.647] { [18:41:55.647] inherits <- base::inherits [18:41:55.647] invokeRestart <- base::invokeRestart [18:41:55.647] is.null <- base::is.null [18:41:55.647] muffled <- FALSE [18:41:55.647] if (inherits(cond, "message")) { [18:41:55.647] muffled <- grepl(pattern, "muffleMessage") [18:41:55.647] if (muffled) [18:41:55.647] invokeRestart("muffleMessage") [18:41:55.647] } [18:41:55.647] else if (inherits(cond, "warning")) { [18:41:55.647] muffled <- grepl(pattern, "muffleWarning") [18:41:55.647] if (muffled) [18:41:55.647] invokeRestart("muffleWarning") [18:41:55.647] } [18:41:55.647] else if (inherits(cond, "condition")) { [18:41:55.647] if (!is.null(pattern)) { [18:41:55.647] computeRestarts <- base::computeRestarts [18:41:55.647] grepl <- base::grepl [18:41:55.647] restarts <- computeRestarts(cond) [18:41:55.647] for (restart in restarts) { [18:41:55.647] name <- restart$name [18:41:55.647] if (is.null(name)) [18:41:55.647] next [18:41:55.647] if (!grepl(pattern, name)) [18:41:55.647] next [18:41:55.647] invokeRestart(restart) [18:41:55.647] muffled <- TRUE [18:41:55.647] break [18:41:55.647] } [18:41:55.647] } [18:41:55.647] } [18:41:55.647] invisible(muffled) [18:41:55.647] } [18:41:55.647] muffleCondition(cond) [18:41:55.647] }) [18:41:55.647] })) [18:41:55.647] future::FutureResult(value = ...future.value$value, [18:41:55.647] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.647] ...future.rng), globalenv = if (FALSE) [18:41:55.647] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.647] ...future.globalenv.names)) [18:41:55.647] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.647] }, condition = base::local({ [18:41:55.647] c <- base::c [18:41:55.647] inherits <- base::inherits [18:41:55.647] invokeRestart <- base::invokeRestart [18:41:55.647] length <- base::length [18:41:55.647] list <- base::list [18:41:55.647] seq.int <- base::seq.int [18:41:55.647] signalCondition <- base::signalCondition [18:41:55.647] sys.calls <- base::sys.calls [18:41:55.647] `[[` <- base::`[[` [18:41:55.647] `+` <- base::`+` [18:41:55.647] `<<-` <- base::`<<-` [18:41:55.647] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.647] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.647] 3L)] [18:41:55.647] } [18:41:55.647] function(cond) { [18:41:55.647] is_error <- inherits(cond, "error") [18:41:55.647] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.647] NULL) [18:41:55.647] if (is_error) { [18:41:55.647] sessionInformation <- function() { [18:41:55.647] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.647] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.647] search = base::search(), system = base::Sys.info()) [18:41:55.647] } [18:41:55.647] ...future.conditions[[length(...future.conditions) + [18:41:55.647] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.647] cond$call), session = sessionInformation(), [18:41:55.647] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.647] signalCondition(cond) [18:41:55.647] } [18:41:55.647] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.647] "immediateCondition"))) { [18:41:55.647] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.647] ...future.conditions[[length(...future.conditions) + [18:41:55.647] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.647] if (TRUE && !signal) { [18:41:55.647] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.647] { [18:41:55.647] inherits <- base::inherits [18:41:55.647] invokeRestart <- base::invokeRestart [18:41:55.647] is.null <- base::is.null [18:41:55.647] muffled <- FALSE [18:41:55.647] if (inherits(cond, "message")) { [18:41:55.647] muffled <- grepl(pattern, "muffleMessage") [18:41:55.647] if (muffled) [18:41:55.647] invokeRestart("muffleMessage") [18:41:55.647] } [18:41:55.647] else if (inherits(cond, "warning")) { [18:41:55.647] muffled <- grepl(pattern, "muffleWarning") [18:41:55.647] if (muffled) [18:41:55.647] invokeRestart("muffleWarning") [18:41:55.647] } [18:41:55.647] else if (inherits(cond, "condition")) { [18:41:55.647] if (!is.null(pattern)) { [18:41:55.647] computeRestarts <- base::computeRestarts [18:41:55.647] grepl <- base::grepl [18:41:55.647] restarts <- computeRestarts(cond) [18:41:55.647] for (restart in restarts) { [18:41:55.647] name <- restart$name [18:41:55.647] if (is.null(name)) [18:41:55.647] next [18:41:55.647] if (!grepl(pattern, name)) [18:41:55.647] next [18:41:55.647] invokeRestart(restart) [18:41:55.647] muffled <- TRUE [18:41:55.647] break [18:41:55.647] } [18:41:55.647] } [18:41:55.647] } [18:41:55.647] invisible(muffled) [18:41:55.647] } [18:41:55.647] muffleCondition(cond, pattern = "^muffle") [18:41:55.647] } [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] if (TRUE) { [18:41:55.647] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.647] { [18:41:55.647] inherits <- base::inherits [18:41:55.647] invokeRestart <- base::invokeRestart [18:41:55.647] is.null <- base::is.null [18:41:55.647] muffled <- FALSE [18:41:55.647] if (inherits(cond, "message")) { [18:41:55.647] muffled <- grepl(pattern, "muffleMessage") [18:41:55.647] if (muffled) [18:41:55.647] invokeRestart("muffleMessage") [18:41:55.647] } [18:41:55.647] else if (inherits(cond, "warning")) { [18:41:55.647] muffled <- grepl(pattern, "muffleWarning") [18:41:55.647] if (muffled) [18:41:55.647] invokeRestart("muffleWarning") [18:41:55.647] } [18:41:55.647] else if (inherits(cond, "condition")) { [18:41:55.647] if (!is.null(pattern)) { [18:41:55.647] computeRestarts <- base::computeRestarts [18:41:55.647] grepl <- base::grepl [18:41:55.647] restarts <- computeRestarts(cond) [18:41:55.647] for (restart in restarts) { [18:41:55.647] name <- restart$name [18:41:55.647] if (is.null(name)) [18:41:55.647] next [18:41:55.647] if (!grepl(pattern, name)) [18:41:55.647] next [18:41:55.647] invokeRestart(restart) [18:41:55.647] muffled <- TRUE [18:41:55.647] break [18:41:55.647] } [18:41:55.647] } [18:41:55.647] } [18:41:55.647] invisible(muffled) [18:41:55.647] } [18:41:55.647] muffleCondition(cond, pattern = "^muffle") [18:41:55.647] } [18:41:55.647] } [18:41:55.647] } [18:41:55.647] })) [18:41:55.647] }, error = function(ex) { [18:41:55.647] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.647] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.647] ...future.rng), started = ...future.startTime, [18:41:55.647] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.647] version = "1.8"), class = "FutureResult") [18:41:55.647] }, finally = { [18:41:55.647] if (!identical(...future.workdir, getwd())) [18:41:55.647] setwd(...future.workdir) [18:41:55.647] { [18:41:55.647] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.647] ...future.oldOptions$nwarnings <- NULL [18:41:55.647] } [18:41:55.647] base::options(...future.oldOptions) [18:41:55.647] if (.Platform$OS.type == "windows") { [18:41:55.647] old_names <- names(...future.oldEnvVars) [18:41:55.647] envs <- base::Sys.getenv() [18:41:55.647] names <- names(envs) [18:41:55.647] common <- intersect(names, old_names) [18:41:55.647] added <- setdiff(names, old_names) [18:41:55.647] removed <- setdiff(old_names, names) [18:41:55.647] changed <- common[...future.oldEnvVars[common] != [18:41:55.647] envs[common]] [18:41:55.647] NAMES <- toupper(changed) [18:41:55.647] args <- list() [18:41:55.647] for (kk in seq_along(NAMES)) { [18:41:55.647] name <- changed[[kk]] [18:41:55.647] NAME <- NAMES[[kk]] [18:41:55.647] if (name != NAME && is.element(NAME, old_names)) [18:41:55.647] next [18:41:55.647] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.647] } [18:41:55.647] NAMES <- toupper(added) [18:41:55.647] for (kk in seq_along(NAMES)) { [18:41:55.647] name <- added[[kk]] [18:41:55.647] NAME <- NAMES[[kk]] [18:41:55.647] if (name != NAME && is.element(NAME, old_names)) [18:41:55.647] next [18:41:55.647] args[[name]] <- "" [18:41:55.647] } [18:41:55.647] NAMES <- toupper(removed) [18:41:55.647] for (kk in seq_along(NAMES)) { [18:41:55.647] name <- removed[[kk]] [18:41:55.647] NAME <- NAMES[[kk]] [18:41:55.647] if (name != NAME && is.element(NAME, old_names)) [18:41:55.647] next [18:41:55.647] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.647] } [18:41:55.647] if (length(args) > 0) [18:41:55.647] base::do.call(base::Sys.setenv, args = args) [18:41:55.647] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.647] } [18:41:55.647] { [18:41:55.647] if (base::length(...future.futureOptionsAdded) > [18:41:55.647] 0L) { [18:41:55.647] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.647] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.647] base::options(opts) [18:41:55.647] } [18:41:55.647] { [18:41:55.647] { [18:41:55.647] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.647] NULL [18:41:55.647] } [18:41:55.647] options(future.plan = NULL) [18:41:55.647] if (is.na(NA_character_)) [18:41:55.647] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.647] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.647] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.647] .init = FALSE) [18:41:55.647] } [18:41:55.647] } [18:41:55.647] } [18:41:55.647] }) [18:41:55.647] if (TRUE) { [18:41:55.647] base::sink(type = "output", split = FALSE) [18:41:55.647] if (TRUE) { [18:41:55.647] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.647] } [18:41:55.647] else { [18:41:55.647] ...future.result["stdout"] <- base::list(NULL) [18:41:55.647] } [18:41:55.647] base::close(...future.stdout) [18:41:55.647] ...future.stdout <- NULL [18:41:55.647] } [18:41:55.647] ...future.result$conditions <- ...future.conditions [18:41:55.647] ...future.result$finished <- base::Sys.time() [18:41:55.647] ...future.result [18:41:55.647] } [18:41:55.652] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:55.652] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:55.653] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:55.653] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.653] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.654] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.654] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.654] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.655] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.655] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.655] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.655] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:55.656] MultisessionFuture started [18:41:55.656] - Launch lazy future ... done [18:41:55.656] run() for 'MultisessionFuture' ... done [18:41:55.657] Created future: [18:41:55.673] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.673] - Validating connection of MultisessionFuture [18:41:55.674] - received message: FutureResult [18:41:55.674] - Received FutureResult [18:41:55.674] - Erased future from FutureRegistry [18:41:55.674] result() for ClusterFuture ... [18:41:55.674] - result already collected: FutureResult [18:41:55.675] result() for ClusterFuture ... done [18:41:55.675] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.657] MultisessionFuture: [18:41:55.657] Label: 'future_sapply-1' [18:41:55.657] Expression: [18:41:55.657] { [18:41:55.657] do.call(function(...) { [18:41:55.657] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.657] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.657] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.657] on.exit(options(oopts), add = TRUE) [18:41:55.657] } [18:41:55.657] { [18:41:55.657] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.657] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.657] ...future.FUN(...future.X_jj, ...) [18:41:55.657] }) [18:41:55.657] } [18:41:55.657] }, args = future.call.arguments) [18:41:55.657] } [18:41:55.657] Lazy evaluation: FALSE [18:41:55.657] Asynchronous evaluation: TRUE [18:41:55.657] Local evaluation: TRUE [18:41:55.657] Environment: R_GlobalEnv [18:41:55.657] Capture standard output: TRUE [18:41:55.657] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.657] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.657] Packages: [18:41:55.657] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.657] Resolved: TRUE [18:41:55.657] Value: [18:41:55.657] Conditions captured: [18:41:55.657] Early signaling: FALSE [18:41:55.657] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.657] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.675] Chunk #1 of 2 ... DONE [18:41:55.675] Chunk #2 of 2 ... [18:41:55.676] - Finding globals in 'X' for chunk #2 ... [18:41:55.676] getGlobalsAndPackages() ... [18:41:55.676] Searching for globals... [18:41:55.676] [18:41:55.677] Searching for globals ... DONE [18:41:55.677] - globals: [0] [18:41:55.677] getGlobalsAndPackages() ... DONE [18:41:55.677] + additional globals found: [n=0] [18:41:55.677] + additional namespaces needed: [n=0] [18:41:55.677] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.678] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.678] - seeds: [18:41:55.678] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.678] getGlobalsAndPackages() ... [18:41:55.678] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.678] Resolving globals: FALSE [18:41:55.679] Tweak future expression to call with '...' arguments ... [18:41:55.679] { [18:41:55.679] do.call(function(...) { [18:41:55.679] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.679] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.679] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.679] on.exit(options(oopts), add = TRUE) [18:41:55.679] } [18:41:55.679] { [18:41:55.679] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.679] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.679] ...future.FUN(...future.X_jj, ...) [18:41:55.679] }) [18:41:55.679] } [18:41:55.679] }, args = future.call.arguments) [18:41:55.679] } [18:41:55.679] Tweak future expression to call with '...' arguments ... DONE [18:41:55.680] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.680] [18:41:55.680] getGlobalsAndPackages() ... DONE [18:41:55.681] run() for 'Future' ... [18:41:55.681] - state: 'created' [18:41:55.681] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.697] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.697] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.697] - Field: 'node' [18:41:55.697] - Field: 'label' [18:41:55.697] - Field: 'local' [18:41:55.698] - Field: 'owner' [18:41:55.698] - Field: 'envir' [18:41:55.698] - Field: 'workers' [18:41:55.698] - Field: 'packages' [18:41:55.698] - Field: 'gc' [18:41:55.698] - Field: 'conditions' [18:41:55.699] - Field: 'persistent' [18:41:55.699] - Field: 'expr' [18:41:55.699] - Field: 'uuid' [18:41:55.699] - Field: 'seed' [18:41:55.699] - Field: 'version' [18:41:55.699] - Field: 'result' [18:41:55.700] - Field: 'asynchronous' [18:41:55.700] - Field: 'calls' [18:41:55.700] - Field: 'globals' [18:41:55.700] - Field: 'stdout' [18:41:55.700] - Field: 'earlySignal' [18:41:55.700] - Field: 'lazy' [18:41:55.701] - Field: 'state' [18:41:55.701] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.701] - Launch lazy future ... [18:41:55.701] Packages needed by the future expression (n = 0): [18:41:55.702] Packages needed by future strategies (n = 0): [18:41:55.702] { [18:41:55.702] { [18:41:55.702] { [18:41:55.702] ...future.startTime <- base::Sys.time() [18:41:55.702] { [18:41:55.702] { [18:41:55.702] { [18:41:55.702] { [18:41:55.702] base::local({ [18:41:55.702] has_future <- base::requireNamespace("future", [18:41:55.702] quietly = TRUE) [18:41:55.702] if (has_future) { [18:41:55.702] ns <- base::getNamespace("future") [18:41:55.702] version <- ns[[".package"]][["version"]] [18:41:55.702] if (is.null(version)) [18:41:55.702] version <- utils::packageVersion("future") [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] version <- NULL [18:41:55.702] } [18:41:55.702] if (!has_future || version < "1.8.0") { [18:41:55.702] info <- base::c(r_version = base::gsub("R version ", [18:41:55.702] "", base::R.version$version.string), [18:41:55.702] platform = base::sprintf("%s (%s-bit)", [18:41:55.702] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.702] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.702] "release", "version")], collapse = " "), [18:41:55.702] hostname = base::Sys.info()[["nodename"]]) [18:41:55.702] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.702] info) [18:41:55.702] info <- base::paste(info, collapse = "; ") [18:41:55.702] if (!has_future) { [18:41:55.702] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.702] info) [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.702] info, version) [18:41:55.702] } [18:41:55.702] base::stop(msg) [18:41:55.702] } [18:41:55.702] }) [18:41:55.702] } [18:41:55.702] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.702] base::options(mc.cores = 1L) [18:41:55.702] } [18:41:55.702] ...future.strategy.old <- future::plan("list") [18:41:55.702] options(future.plan = NULL) [18:41:55.702] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.702] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.702] } [18:41:55.702] ...future.workdir <- getwd() [18:41:55.702] } [18:41:55.702] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.702] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.702] } [18:41:55.702] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.702] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.702] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.702] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.702] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.702] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.702] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.702] base::names(...future.oldOptions)) [18:41:55.702] } [18:41:55.702] if (FALSE) { [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] if (TRUE) { [18:41:55.702] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.702] open = "w") [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.702] windows = "NUL", "/dev/null"), open = "w") [18:41:55.702] } [18:41:55.702] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.702] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.702] base::sink(type = "output", split = FALSE) [18:41:55.702] base::close(...future.stdout) [18:41:55.702] }, add = TRUE) [18:41:55.702] } [18:41:55.702] ...future.frame <- base::sys.nframe() [18:41:55.702] ...future.conditions <- base::list() [18:41:55.702] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.702] if (FALSE) { [18:41:55.702] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.702] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.702] } [18:41:55.702] ...future.result <- base::tryCatch({ [18:41:55.702] base::withCallingHandlers({ [18:41:55.702] ...future.value <- base::withVisible(base::local({ [18:41:55.702] ...future.makeSendCondition <- base::local({ [18:41:55.702] sendCondition <- NULL [18:41:55.702] function(frame = 1L) { [18:41:55.702] if (is.function(sendCondition)) [18:41:55.702] return(sendCondition) [18:41:55.702] ns <- getNamespace("parallel") [18:41:55.702] if (exists("sendData", mode = "function", [18:41:55.702] envir = ns)) { [18:41:55.702] parallel_sendData <- get("sendData", mode = "function", [18:41:55.702] envir = ns) [18:41:55.702] envir <- sys.frame(frame) [18:41:55.702] master <- NULL [18:41:55.702] while (!identical(envir, .GlobalEnv) && [18:41:55.702] !identical(envir, emptyenv())) { [18:41:55.702] if (exists("master", mode = "list", envir = envir, [18:41:55.702] inherits = FALSE)) { [18:41:55.702] master <- get("master", mode = "list", [18:41:55.702] envir = envir, inherits = FALSE) [18:41:55.702] if (inherits(master, c("SOCKnode", [18:41:55.702] "SOCK0node"))) { [18:41:55.702] sendCondition <<- function(cond) { [18:41:55.702] data <- list(type = "VALUE", value = cond, [18:41:55.702] success = TRUE) [18:41:55.702] parallel_sendData(master, data) [18:41:55.702] } [18:41:55.702] return(sendCondition) [18:41:55.702] } [18:41:55.702] } [18:41:55.702] frame <- frame + 1L [18:41:55.702] envir <- sys.frame(frame) [18:41:55.702] } [18:41:55.702] } [18:41:55.702] sendCondition <<- function(cond) NULL [18:41:55.702] } [18:41:55.702] }) [18:41:55.702] withCallingHandlers({ [18:41:55.702] { [18:41:55.702] do.call(function(...) { [18:41:55.702] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.702] if (!identical(...future.globals.maxSize.org, [18:41:55.702] ...future.globals.maxSize)) { [18:41:55.702] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.702] on.exit(options(oopts), add = TRUE) [18:41:55.702] } [18:41:55.702] { [18:41:55.702] lapply(seq_along(...future.elements_ii), [18:41:55.702] FUN = function(jj) { [18:41:55.702] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.702] ...future.FUN(...future.X_jj, ...) [18:41:55.702] }) [18:41:55.702] } [18:41:55.702] }, args = future.call.arguments) [18:41:55.702] } [18:41:55.702] }, immediateCondition = function(cond) { [18:41:55.702] sendCondition <- ...future.makeSendCondition() [18:41:55.702] sendCondition(cond) [18:41:55.702] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.702] { [18:41:55.702] inherits <- base::inherits [18:41:55.702] invokeRestart <- base::invokeRestart [18:41:55.702] is.null <- base::is.null [18:41:55.702] muffled <- FALSE [18:41:55.702] if (inherits(cond, "message")) { [18:41:55.702] muffled <- grepl(pattern, "muffleMessage") [18:41:55.702] if (muffled) [18:41:55.702] invokeRestart("muffleMessage") [18:41:55.702] } [18:41:55.702] else if (inherits(cond, "warning")) { [18:41:55.702] muffled <- grepl(pattern, "muffleWarning") [18:41:55.702] if (muffled) [18:41:55.702] invokeRestart("muffleWarning") [18:41:55.702] } [18:41:55.702] else if (inherits(cond, "condition")) { [18:41:55.702] if (!is.null(pattern)) { [18:41:55.702] computeRestarts <- base::computeRestarts [18:41:55.702] grepl <- base::grepl [18:41:55.702] restarts <- computeRestarts(cond) [18:41:55.702] for (restart in restarts) { [18:41:55.702] name <- restart$name [18:41:55.702] if (is.null(name)) [18:41:55.702] next [18:41:55.702] if (!grepl(pattern, name)) [18:41:55.702] next [18:41:55.702] invokeRestart(restart) [18:41:55.702] muffled <- TRUE [18:41:55.702] break [18:41:55.702] } [18:41:55.702] } [18:41:55.702] } [18:41:55.702] invisible(muffled) [18:41:55.702] } [18:41:55.702] muffleCondition(cond) [18:41:55.702] }) [18:41:55.702] })) [18:41:55.702] future::FutureResult(value = ...future.value$value, [18:41:55.702] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.702] ...future.rng), globalenv = if (FALSE) [18:41:55.702] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.702] ...future.globalenv.names)) [18:41:55.702] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.702] }, condition = base::local({ [18:41:55.702] c <- base::c [18:41:55.702] inherits <- base::inherits [18:41:55.702] invokeRestart <- base::invokeRestart [18:41:55.702] length <- base::length [18:41:55.702] list <- base::list [18:41:55.702] seq.int <- base::seq.int [18:41:55.702] signalCondition <- base::signalCondition [18:41:55.702] sys.calls <- base::sys.calls [18:41:55.702] `[[` <- base::`[[` [18:41:55.702] `+` <- base::`+` [18:41:55.702] `<<-` <- base::`<<-` [18:41:55.702] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.702] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.702] 3L)] [18:41:55.702] } [18:41:55.702] function(cond) { [18:41:55.702] is_error <- inherits(cond, "error") [18:41:55.702] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.702] NULL) [18:41:55.702] if (is_error) { [18:41:55.702] sessionInformation <- function() { [18:41:55.702] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.702] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.702] search = base::search(), system = base::Sys.info()) [18:41:55.702] } [18:41:55.702] ...future.conditions[[length(...future.conditions) + [18:41:55.702] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.702] cond$call), session = sessionInformation(), [18:41:55.702] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.702] signalCondition(cond) [18:41:55.702] } [18:41:55.702] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.702] "immediateCondition"))) { [18:41:55.702] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.702] ...future.conditions[[length(...future.conditions) + [18:41:55.702] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.702] if (TRUE && !signal) { [18:41:55.702] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.702] { [18:41:55.702] inherits <- base::inherits [18:41:55.702] invokeRestart <- base::invokeRestart [18:41:55.702] is.null <- base::is.null [18:41:55.702] muffled <- FALSE [18:41:55.702] if (inherits(cond, "message")) { [18:41:55.702] muffled <- grepl(pattern, "muffleMessage") [18:41:55.702] if (muffled) [18:41:55.702] invokeRestart("muffleMessage") [18:41:55.702] } [18:41:55.702] else if (inherits(cond, "warning")) { [18:41:55.702] muffled <- grepl(pattern, "muffleWarning") [18:41:55.702] if (muffled) [18:41:55.702] invokeRestart("muffleWarning") [18:41:55.702] } [18:41:55.702] else if (inherits(cond, "condition")) { [18:41:55.702] if (!is.null(pattern)) { [18:41:55.702] computeRestarts <- base::computeRestarts [18:41:55.702] grepl <- base::grepl [18:41:55.702] restarts <- computeRestarts(cond) [18:41:55.702] for (restart in restarts) { [18:41:55.702] name <- restart$name [18:41:55.702] if (is.null(name)) [18:41:55.702] next [18:41:55.702] if (!grepl(pattern, name)) [18:41:55.702] next [18:41:55.702] invokeRestart(restart) [18:41:55.702] muffled <- TRUE [18:41:55.702] break [18:41:55.702] } [18:41:55.702] } [18:41:55.702] } [18:41:55.702] invisible(muffled) [18:41:55.702] } [18:41:55.702] muffleCondition(cond, pattern = "^muffle") [18:41:55.702] } [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] if (TRUE) { [18:41:55.702] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.702] { [18:41:55.702] inherits <- base::inherits [18:41:55.702] invokeRestart <- base::invokeRestart [18:41:55.702] is.null <- base::is.null [18:41:55.702] muffled <- FALSE [18:41:55.702] if (inherits(cond, "message")) { [18:41:55.702] muffled <- grepl(pattern, "muffleMessage") [18:41:55.702] if (muffled) [18:41:55.702] invokeRestart("muffleMessage") [18:41:55.702] } [18:41:55.702] else if (inherits(cond, "warning")) { [18:41:55.702] muffled <- grepl(pattern, "muffleWarning") [18:41:55.702] if (muffled) [18:41:55.702] invokeRestart("muffleWarning") [18:41:55.702] } [18:41:55.702] else if (inherits(cond, "condition")) { [18:41:55.702] if (!is.null(pattern)) { [18:41:55.702] computeRestarts <- base::computeRestarts [18:41:55.702] grepl <- base::grepl [18:41:55.702] restarts <- computeRestarts(cond) [18:41:55.702] for (restart in restarts) { [18:41:55.702] name <- restart$name [18:41:55.702] if (is.null(name)) [18:41:55.702] next [18:41:55.702] if (!grepl(pattern, name)) [18:41:55.702] next [18:41:55.702] invokeRestart(restart) [18:41:55.702] muffled <- TRUE [18:41:55.702] break [18:41:55.702] } [18:41:55.702] } [18:41:55.702] } [18:41:55.702] invisible(muffled) [18:41:55.702] } [18:41:55.702] muffleCondition(cond, pattern = "^muffle") [18:41:55.702] } [18:41:55.702] } [18:41:55.702] } [18:41:55.702] })) [18:41:55.702] }, error = function(ex) { [18:41:55.702] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.702] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.702] ...future.rng), started = ...future.startTime, [18:41:55.702] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.702] version = "1.8"), class = "FutureResult") [18:41:55.702] }, finally = { [18:41:55.702] if (!identical(...future.workdir, getwd())) [18:41:55.702] setwd(...future.workdir) [18:41:55.702] { [18:41:55.702] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.702] ...future.oldOptions$nwarnings <- NULL [18:41:55.702] } [18:41:55.702] base::options(...future.oldOptions) [18:41:55.702] if (.Platform$OS.type == "windows") { [18:41:55.702] old_names <- names(...future.oldEnvVars) [18:41:55.702] envs <- base::Sys.getenv() [18:41:55.702] names <- names(envs) [18:41:55.702] common <- intersect(names, old_names) [18:41:55.702] added <- setdiff(names, old_names) [18:41:55.702] removed <- setdiff(old_names, names) [18:41:55.702] changed <- common[...future.oldEnvVars[common] != [18:41:55.702] envs[common]] [18:41:55.702] NAMES <- toupper(changed) [18:41:55.702] args <- list() [18:41:55.702] for (kk in seq_along(NAMES)) { [18:41:55.702] name <- changed[[kk]] [18:41:55.702] NAME <- NAMES[[kk]] [18:41:55.702] if (name != NAME && is.element(NAME, old_names)) [18:41:55.702] next [18:41:55.702] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.702] } [18:41:55.702] NAMES <- toupper(added) [18:41:55.702] for (kk in seq_along(NAMES)) { [18:41:55.702] name <- added[[kk]] [18:41:55.702] NAME <- NAMES[[kk]] [18:41:55.702] if (name != NAME && is.element(NAME, old_names)) [18:41:55.702] next [18:41:55.702] args[[name]] <- "" [18:41:55.702] } [18:41:55.702] NAMES <- toupper(removed) [18:41:55.702] for (kk in seq_along(NAMES)) { [18:41:55.702] name <- removed[[kk]] [18:41:55.702] NAME <- NAMES[[kk]] [18:41:55.702] if (name != NAME && is.element(NAME, old_names)) [18:41:55.702] next [18:41:55.702] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.702] } [18:41:55.702] if (length(args) > 0) [18:41:55.702] base::do.call(base::Sys.setenv, args = args) [18:41:55.702] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.702] } [18:41:55.702] { [18:41:55.702] if (base::length(...future.futureOptionsAdded) > [18:41:55.702] 0L) { [18:41:55.702] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.702] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.702] base::options(opts) [18:41:55.702] } [18:41:55.702] { [18:41:55.702] { [18:41:55.702] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.702] NULL [18:41:55.702] } [18:41:55.702] options(future.plan = NULL) [18:41:55.702] if (is.na(NA_character_)) [18:41:55.702] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.702] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.702] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.702] .init = FALSE) [18:41:55.702] } [18:41:55.702] } [18:41:55.702] } [18:41:55.702] }) [18:41:55.702] if (TRUE) { [18:41:55.702] base::sink(type = "output", split = FALSE) [18:41:55.702] if (TRUE) { [18:41:55.702] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.702] } [18:41:55.702] else { [18:41:55.702] ...future.result["stdout"] <- base::list(NULL) [18:41:55.702] } [18:41:55.702] base::close(...future.stdout) [18:41:55.702] ...future.stdout <- NULL [18:41:55.702] } [18:41:55.702] ...future.result$conditions <- ...future.conditions [18:41:55.702] ...future.result$finished <- base::Sys.time() [18:41:55.702] ...future.result [18:41:55.702] } [18:41:55.707] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:55.708] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:55.708] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:55.708] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.709] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.709] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.709] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.710] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.710] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.710] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.711] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.711] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:55.711] MultisessionFuture started [18:41:55.712] - Launch lazy future ... done [18:41:55.712] run() for 'MultisessionFuture' ... done [18:41:55.712] Created future: [18:41:55.730] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.730] - Validating connection of MultisessionFuture [18:41:55.730] - received message: FutureResult [18:41:55.730] - Received FutureResult [18:41:55.731] - Erased future from FutureRegistry [18:41:55.731] result() for ClusterFuture ... [18:41:55.731] - result already collected: FutureResult [18:41:55.731] result() for ClusterFuture ... done [18:41:55.731] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.712] MultisessionFuture: [18:41:55.712] Label: 'future_sapply-2' [18:41:55.712] Expression: [18:41:55.712] { [18:41:55.712] do.call(function(...) { [18:41:55.712] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.712] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.712] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.712] on.exit(options(oopts), add = TRUE) [18:41:55.712] } [18:41:55.712] { [18:41:55.712] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.712] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.712] ...future.FUN(...future.X_jj, ...) [18:41:55.712] }) [18:41:55.712] } [18:41:55.712] }, args = future.call.arguments) [18:41:55.712] } [18:41:55.712] Lazy evaluation: FALSE [18:41:55.712] Asynchronous evaluation: TRUE [18:41:55.712] Local evaluation: TRUE [18:41:55.712] Environment: R_GlobalEnv [18:41:55.712] Capture standard output: TRUE [18:41:55.712] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.712] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.712] Packages: [18:41:55.712] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.712] Resolved: TRUE [18:41:55.712] Value: [18:41:55.712] Conditions captured: [18:41:55.712] Early signaling: FALSE [18:41:55.712] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.712] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.732] Chunk #2 of 2 ... DONE [18:41:55.732] Launching 2 futures (chunks) ... DONE [18:41:55.732] Resolving 2 futures (chunks) ... [18:41:55.732] resolve() on list ... [18:41:55.732] recursive: 0 [18:41:55.732] length: 2 [18:41:55.733] [18:41:55.733] Future #1 [18:41:55.733] result() for ClusterFuture ... [18:41:55.733] - result already collected: FutureResult [18:41:55.733] result() for ClusterFuture ... done [18:41:55.733] result() for ClusterFuture ... [18:41:55.734] - result already collected: FutureResult [18:41:55.734] result() for ClusterFuture ... done [18:41:55.734] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:55.734] - nx: 2 [18:41:55.734] - relay: TRUE [18:41:55.734] - stdout: TRUE [18:41:55.735] - signal: TRUE [18:41:55.735] - resignal: FALSE [18:41:55.735] - force: TRUE [18:41:55.735] - relayed: [n=2] FALSE, FALSE [18:41:55.735] - queued futures: [n=2] FALSE, FALSE [18:41:55.735] - until=1 [18:41:55.735] - relaying element #1 [18:41:55.736] result() for ClusterFuture ... [18:41:55.736] - result already collected: FutureResult [18:41:55.736] result() for ClusterFuture ... done [18:41:55.736] result() for ClusterFuture ... [18:41:55.736] - result already collected: FutureResult [18:41:55.736] result() for ClusterFuture ... done [18:41:55.737] result() for ClusterFuture ... [18:41:55.737] - result already collected: FutureResult [18:41:55.737] result() for ClusterFuture ... done [18:41:55.737] result() for ClusterFuture ... [18:41:55.737] - result already collected: FutureResult [18:41:55.737] result() for ClusterFuture ... done [18:41:55.738] - relayed: [n=2] TRUE, FALSE [18:41:55.738] - queued futures: [n=2] TRUE, FALSE [18:41:55.738] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:55.738] length: 1 (resolved future 1) [18:41:55.738] Future #2 [18:41:55.738] result() for ClusterFuture ... [18:41:55.739] - result already collected: FutureResult [18:41:55.739] result() for ClusterFuture ... done [18:41:55.739] result() for ClusterFuture ... [18:41:55.739] - result already collected: FutureResult [18:41:55.739] result() for ClusterFuture ... done [18:41:55.739] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:55.740] - nx: 2 [18:41:55.740] - relay: TRUE [18:41:55.740] - stdout: TRUE [18:41:55.740] - signal: TRUE [18:41:55.740] - resignal: FALSE [18:41:55.740] - force: TRUE [18:41:55.741] - relayed: [n=2] TRUE, FALSE [18:41:55.741] - queued futures: [n=2] TRUE, FALSE [18:41:55.741] - until=2 [18:41:55.741] - relaying element #2 [18:41:55.741] result() for ClusterFuture ... [18:41:55.741] - result already collected: FutureResult [18:41:55.741] result() for ClusterFuture ... done [18:41:55.742] result() for ClusterFuture ... [18:41:55.742] - result already collected: FutureResult [18:41:55.742] result() for ClusterFuture ... done [18:41:55.742] result() for ClusterFuture ... [18:41:55.742] - result already collected: FutureResult [18:41:55.742] result() for ClusterFuture ... done [18:41:55.743] result() for ClusterFuture ... [18:41:55.743] - result already collected: FutureResult [18:41:55.743] result() for ClusterFuture ... done [18:41:55.743] - relayed: [n=2] TRUE, TRUE [18:41:55.743] - queued futures: [n=2] TRUE, TRUE [18:41:55.743] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:55.744] length: 0 (resolved future 2) [18:41:55.744] Relaying remaining futures [18:41:55.744] signalConditionsASAP(NULL, pos=0) ... [18:41:55.744] - nx: 2 [18:41:55.744] - relay: TRUE [18:41:55.744] - stdout: TRUE [18:41:55.744] - signal: TRUE [18:41:55.745] - resignal: FALSE [18:41:55.745] - force: TRUE [18:41:55.745] - relayed: [n=2] TRUE, TRUE [18:41:55.745] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:55.745] - relayed: [n=2] TRUE, TRUE [18:41:55.745] - queued futures: [n=2] TRUE, TRUE [18:41:55.746] signalConditionsASAP(NULL, pos=0) ... done [18:41:55.746] resolve() on list ... DONE [18:41:55.746] result() for ClusterFuture ... [18:41:55.746] - result already collected: FutureResult [18:41:55.746] result() for ClusterFuture ... done [18:41:55.746] result() for ClusterFuture ... [18:41:55.747] - result already collected: FutureResult [18:41:55.747] result() for ClusterFuture ... done [18:41:55.747] result() for ClusterFuture ... [18:41:55.747] - result already collected: FutureResult [18:41:55.747] result() for ClusterFuture ... done [18:41:55.747] result() for ClusterFuture ... [18:41:55.747] - result already collected: FutureResult [18:41:55.748] result() for ClusterFuture ... done [18:41:55.748] - Number of value chunks collected: 2 [18:41:55.748] Resolving 2 futures (chunks) ... DONE [18:41:55.748] Reducing values from 2 chunks ... [18:41:55.748] - Number of values collected after concatenation: 4 [18:41:55.748] - Number of values expected: 4 [18:41:55.749] Reducing values from 2 chunks ... DONE [18:41:55.749] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:55.752] future_lapply() ... [18:41:55.755] Number of chunks: 2 [18:41:55.755] getGlobalsAndPackagesXApply() ... [18:41:55.755] - future.globals: TRUE [18:41:55.755] getGlobalsAndPackages() ... [18:41:55.756] Searching for globals... [18:41:55.757] - globals found: [1] 'FUN' [18:41:55.757] Searching for globals ... DONE [18:41:55.757] Resolving globals: FALSE [18:41:55.757] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:55.758] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:55.758] - globals: [1] 'FUN' [18:41:55.758] [18:41:55.758] getGlobalsAndPackages() ... DONE [18:41:55.759] - globals found/used: [n=1] 'FUN' [18:41:55.759] - needed namespaces: [n=0] [18:41:55.759] Finding globals ... DONE [18:41:55.759] - use_args: TRUE [18:41:55.759] - Getting '...' globals ... [18:41:55.760] resolve() on list ... [18:41:55.760] recursive: 0 [18:41:55.760] length: 1 [18:41:55.760] elements: '...' [18:41:55.760] length: 0 (resolved future 1) [18:41:55.761] resolve() on list ... DONE [18:41:55.761] - '...' content: [n=0] [18:41:55.761] List of 1 [18:41:55.761] $ ...: list() [18:41:55.761] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.761] - attr(*, "where")=List of 1 [18:41:55.761] ..$ ...: [18:41:55.761] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.761] - attr(*, "resolved")= logi TRUE [18:41:55.761] - attr(*, "total_size")= num NA [18:41:55.764] - Getting '...' globals ... DONE [18:41:55.764] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:55.764] List of 2 [18:41:55.764] $ ...future.FUN:function (x) [18:41:55.764] $ ... : list() [18:41:55.764] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.764] - attr(*, "where")=List of 2 [18:41:55.764] ..$ ...future.FUN: [18:41:55.764] ..$ ... : [18:41:55.764] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.764] - attr(*, "resolved")= logi FALSE [18:41:55.764] - attr(*, "total_size")= int 4910 [18:41:55.768] Packages to be attached in all futures: [n=0] [18:41:55.768] getGlobalsAndPackagesXApply() ... DONE [18:41:55.768] Number of futures (= number of chunks): 2 [18:41:55.768] Launching 2 futures (chunks) ... [18:41:55.769] Chunk #1 of 2 ... [18:41:55.769] - Finding globals in 'X' for chunk #1 ... [18:41:55.769] getGlobalsAndPackages() ... [18:41:55.769] Searching for globals... [18:41:55.769] [18:41:55.770] Searching for globals ... DONE [18:41:55.770] - globals: [0] [18:41:55.770] getGlobalsAndPackages() ... DONE [18:41:55.770] + additional globals found: [n=0] [18:41:55.770] + additional namespaces needed: [n=0] [18:41:55.770] - Finding globals in 'X' for chunk #1 ... DONE [18:41:55.771] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.771] - seeds: [18:41:55.771] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.771] getGlobalsAndPackages() ... [18:41:55.771] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.771] Resolving globals: FALSE [18:41:55.772] Tweak future expression to call with '...' arguments ... [18:41:55.772] { [18:41:55.772] do.call(function(...) { [18:41:55.772] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.772] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.772] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.772] on.exit(options(oopts), add = TRUE) [18:41:55.772] } [18:41:55.772] { [18:41:55.772] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.772] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.772] ...future.FUN(...future.X_jj, ...) [18:41:55.772] }) [18:41:55.772] } [18:41:55.772] }, args = future.call.arguments) [18:41:55.772] } [18:41:55.772] Tweak future expression to call with '...' arguments ... DONE [18:41:55.773] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.773] [18:41:55.773] getGlobalsAndPackages() ... DONE [18:41:55.773] run() for 'Future' ... [18:41:55.774] - state: 'created' [18:41:55.774] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.789] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.789] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.790] - Field: 'node' [18:41:55.790] - Field: 'label' [18:41:55.790] - Field: 'local' [18:41:55.790] - Field: 'owner' [18:41:55.790] - Field: 'envir' [18:41:55.791] - Field: 'workers' [18:41:55.791] - Field: 'packages' [18:41:55.791] - Field: 'gc' [18:41:55.791] - Field: 'conditions' [18:41:55.791] - Field: 'persistent' [18:41:55.792] - Field: 'expr' [18:41:55.792] - Field: 'uuid' [18:41:55.792] - Field: 'seed' [18:41:55.792] - Field: 'version' [18:41:55.792] - Field: 'result' [18:41:55.792] - Field: 'asynchronous' [18:41:55.793] - Field: 'calls' [18:41:55.793] - Field: 'globals' [18:41:55.793] - Field: 'stdout' [18:41:55.793] - Field: 'earlySignal' [18:41:55.793] - Field: 'lazy' [18:41:55.793] - Field: 'state' [18:41:55.794] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.794] - Launch lazy future ... [18:41:55.794] Packages needed by the future expression (n = 0): [18:41:55.794] Packages needed by future strategies (n = 0): [18:41:55.795] { [18:41:55.795] { [18:41:55.795] { [18:41:55.795] ...future.startTime <- base::Sys.time() [18:41:55.795] { [18:41:55.795] { [18:41:55.795] { [18:41:55.795] { [18:41:55.795] base::local({ [18:41:55.795] has_future <- base::requireNamespace("future", [18:41:55.795] quietly = TRUE) [18:41:55.795] if (has_future) { [18:41:55.795] ns <- base::getNamespace("future") [18:41:55.795] version <- ns[[".package"]][["version"]] [18:41:55.795] if (is.null(version)) [18:41:55.795] version <- utils::packageVersion("future") [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] version <- NULL [18:41:55.795] } [18:41:55.795] if (!has_future || version < "1.8.0") { [18:41:55.795] info <- base::c(r_version = base::gsub("R version ", [18:41:55.795] "", base::R.version$version.string), [18:41:55.795] platform = base::sprintf("%s (%s-bit)", [18:41:55.795] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.795] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.795] "release", "version")], collapse = " "), [18:41:55.795] hostname = base::Sys.info()[["nodename"]]) [18:41:55.795] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.795] info) [18:41:55.795] info <- base::paste(info, collapse = "; ") [18:41:55.795] if (!has_future) { [18:41:55.795] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.795] info) [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.795] info, version) [18:41:55.795] } [18:41:55.795] base::stop(msg) [18:41:55.795] } [18:41:55.795] }) [18:41:55.795] } [18:41:55.795] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.795] base::options(mc.cores = 1L) [18:41:55.795] } [18:41:55.795] ...future.strategy.old <- future::plan("list") [18:41:55.795] options(future.plan = NULL) [18:41:55.795] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.795] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.795] } [18:41:55.795] ...future.workdir <- getwd() [18:41:55.795] } [18:41:55.795] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.795] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.795] } [18:41:55.795] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.795] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.795] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.795] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.795] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.795] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.795] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.795] base::names(...future.oldOptions)) [18:41:55.795] } [18:41:55.795] if (FALSE) { [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] if (TRUE) { [18:41:55.795] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.795] open = "w") [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.795] windows = "NUL", "/dev/null"), open = "w") [18:41:55.795] } [18:41:55.795] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.795] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.795] base::sink(type = "output", split = FALSE) [18:41:55.795] base::close(...future.stdout) [18:41:55.795] }, add = TRUE) [18:41:55.795] } [18:41:55.795] ...future.frame <- base::sys.nframe() [18:41:55.795] ...future.conditions <- base::list() [18:41:55.795] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.795] if (FALSE) { [18:41:55.795] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.795] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.795] } [18:41:55.795] ...future.result <- base::tryCatch({ [18:41:55.795] base::withCallingHandlers({ [18:41:55.795] ...future.value <- base::withVisible(base::local({ [18:41:55.795] ...future.makeSendCondition <- base::local({ [18:41:55.795] sendCondition <- NULL [18:41:55.795] function(frame = 1L) { [18:41:55.795] if (is.function(sendCondition)) [18:41:55.795] return(sendCondition) [18:41:55.795] ns <- getNamespace("parallel") [18:41:55.795] if (exists("sendData", mode = "function", [18:41:55.795] envir = ns)) { [18:41:55.795] parallel_sendData <- get("sendData", mode = "function", [18:41:55.795] envir = ns) [18:41:55.795] envir <- sys.frame(frame) [18:41:55.795] master <- NULL [18:41:55.795] while (!identical(envir, .GlobalEnv) && [18:41:55.795] !identical(envir, emptyenv())) { [18:41:55.795] if (exists("master", mode = "list", envir = envir, [18:41:55.795] inherits = FALSE)) { [18:41:55.795] master <- get("master", mode = "list", [18:41:55.795] envir = envir, inherits = FALSE) [18:41:55.795] if (inherits(master, c("SOCKnode", [18:41:55.795] "SOCK0node"))) { [18:41:55.795] sendCondition <<- function(cond) { [18:41:55.795] data <- list(type = "VALUE", value = cond, [18:41:55.795] success = TRUE) [18:41:55.795] parallel_sendData(master, data) [18:41:55.795] } [18:41:55.795] return(sendCondition) [18:41:55.795] } [18:41:55.795] } [18:41:55.795] frame <- frame + 1L [18:41:55.795] envir <- sys.frame(frame) [18:41:55.795] } [18:41:55.795] } [18:41:55.795] sendCondition <<- function(cond) NULL [18:41:55.795] } [18:41:55.795] }) [18:41:55.795] withCallingHandlers({ [18:41:55.795] { [18:41:55.795] do.call(function(...) { [18:41:55.795] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.795] if (!identical(...future.globals.maxSize.org, [18:41:55.795] ...future.globals.maxSize)) { [18:41:55.795] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.795] on.exit(options(oopts), add = TRUE) [18:41:55.795] } [18:41:55.795] { [18:41:55.795] lapply(seq_along(...future.elements_ii), [18:41:55.795] FUN = function(jj) { [18:41:55.795] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.795] ...future.FUN(...future.X_jj, ...) [18:41:55.795] }) [18:41:55.795] } [18:41:55.795] }, args = future.call.arguments) [18:41:55.795] } [18:41:55.795] }, immediateCondition = function(cond) { [18:41:55.795] sendCondition <- ...future.makeSendCondition() [18:41:55.795] sendCondition(cond) [18:41:55.795] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.795] { [18:41:55.795] inherits <- base::inherits [18:41:55.795] invokeRestart <- base::invokeRestart [18:41:55.795] is.null <- base::is.null [18:41:55.795] muffled <- FALSE [18:41:55.795] if (inherits(cond, "message")) { [18:41:55.795] muffled <- grepl(pattern, "muffleMessage") [18:41:55.795] if (muffled) [18:41:55.795] invokeRestart("muffleMessage") [18:41:55.795] } [18:41:55.795] else if (inherits(cond, "warning")) { [18:41:55.795] muffled <- grepl(pattern, "muffleWarning") [18:41:55.795] if (muffled) [18:41:55.795] invokeRestart("muffleWarning") [18:41:55.795] } [18:41:55.795] else if (inherits(cond, "condition")) { [18:41:55.795] if (!is.null(pattern)) { [18:41:55.795] computeRestarts <- base::computeRestarts [18:41:55.795] grepl <- base::grepl [18:41:55.795] restarts <- computeRestarts(cond) [18:41:55.795] for (restart in restarts) { [18:41:55.795] name <- restart$name [18:41:55.795] if (is.null(name)) [18:41:55.795] next [18:41:55.795] if (!grepl(pattern, name)) [18:41:55.795] next [18:41:55.795] invokeRestart(restart) [18:41:55.795] muffled <- TRUE [18:41:55.795] break [18:41:55.795] } [18:41:55.795] } [18:41:55.795] } [18:41:55.795] invisible(muffled) [18:41:55.795] } [18:41:55.795] muffleCondition(cond) [18:41:55.795] }) [18:41:55.795] })) [18:41:55.795] future::FutureResult(value = ...future.value$value, [18:41:55.795] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.795] ...future.rng), globalenv = if (FALSE) [18:41:55.795] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.795] ...future.globalenv.names)) [18:41:55.795] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.795] }, condition = base::local({ [18:41:55.795] c <- base::c [18:41:55.795] inherits <- base::inherits [18:41:55.795] invokeRestart <- base::invokeRestart [18:41:55.795] length <- base::length [18:41:55.795] list <- base::list [18:41:55.795] seq.int <- base::seq.int [18:41:55.795] signalCondition <- base::signalCondition [18:41:55.795] sys.calls <- base::sys.calls [18:41:55.795] `[[` <- base::`[[` [18:41:55.795] `+` <- base::`+` [18:41:55.795] `<<-` <- base::`<<-` [18:41:55.795] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.795] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.795] 3L)] [18:41:55.795] } [18:41:55.795] function(cond) { [18:41:55.795] is_error <- inherits(cond, "error") [18:41:55.795] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.795] NULL) [18:41:55.795] if (is_error) { [18:41:55.795] sessionInformation <- function() { [18:41:55.795] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.795] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.795] search = base::search(), system = base::Sys.info()) [18:41:55.795] } [18:41:55.795] ...future.conditions[[length(...future.conditions) + [18:41:55.795] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.795] cond$call), session = sessionInformation(), [18:41:55.795] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.795] signalCondition(cond) [18:41:55.795] } [18:41:55.795] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.795] "immediateCondition"))) { [18:41:55.795] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.795] ...future.conditions[[length(...future.conditions) + [18:41:55.795] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.795] if (TRUE && !signal) { [18:41:55.795] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.795] { [18:41:55.795] inherits <- base::inherits [18:41:55.795] invokeRestart <- base::invokeRestart [18:41:55.795] is.null <- base::is.null [18:41:55.795] muffled <- FALSE [18:41:55.795] if (inherits(cond, "message")) { [18:41:55.795] muffled <- grepl(pattern, "muffleMessage") [18:41:55.795] if (muffled) [18:41:55.795] invokeRestart("muffleMessage") [18:41:55.795] } [18:41:55.795] else if (inherits(cond, "warning")) { [18:41:55.795] muffled <- grepl(pattern, "muffleWarning") [18:41:55.795] if (muffled) [18:41:55.795] invokeRestart("muffleWarning") [18:41:55.795] } [18:41:55.795] else if (inherits(cond, "condition")) { [18:41:55.795] if (!is.null(pattern)) { [18:41:55.795] computeRestarts <- base::computeRestarts [18:41:55.795] grepl <- base::grepl [18:41:55.795] restarts <- computeRestarts(cond) [18:41:55.795] for (restart in restarts) { [18:41:55.795] name <- restart$name [18:41:55.795] if (is.null(name)) [18:41:55.795] next [18:41:55.795] if (!grepl(pattern, name)) [18:41:55.795] next [18:41:55.795] invokeRestart(restart) [18:41:55.795] muffled <- TRUE [18:41:55.795] break [18:41:55.795] } [18:41:55.795] } [18:41:55.795] } [18:41:55.795] invisible(muffled) [18:41:55.795] } [18:41:55.795] muffleCondition(cond, pattern = "^muffle") [18:41:55.795] } [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] if (TRUE) { [18:41:55.795] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.795] { [18:41:55.795] inherits <- base::inherits [18:41:55.795] invokeRestart <- base::invokeRestart [18:41:55.795] is.null <- base::is.null [18:41:55.795] muffled <- FALSE [18:41:55.795] if (inherits(cond, "message")) { [18:41:55.795] muffled <- grepl(pattern, "muffleMessage") [18:41:55.795] if (muffled) [18:41:55.795] invokeRestart("muffleMessage") [18:41:55.795] } [18:41:55.795] else if (inherits(cond, "warning")) { [18:41:55.795] muffled <- grepl(pattern, "muffleWarning") [18:41:55.795] if (muffled) [18:41:55.795] invokeRestart("muffleWarning") [18:41:55.795] } [18:41:55.795] else if (inherits(cond, "condition")) { [18:41:55.795] if (!is.null(pattern)) { [18:41:55.795] computeRestarts <- base::computeRestarts [18:41:55.795] grepl <- base::grepl [18:41:55.795] restarts <- computeRestarts(cond) [18:41:55.795] for (restart in restarts) { [18:41:55.795] name <- restart$name [18:41:55.795] if (is.null(name)) [18:41:55.795] next [18:41:55.795] if (!grepl(pattern, name)) [18:41:55.795] next [18:41:55.795] invokeRestart(restart) [18:41:55.795] muffled <- TRUE [18:41:55.795] break [18:41:55.795] } [18:41:55.795] } [18:41:55.795] } [18:41:55.795] invisible(muffled) [18:41:55.795] } [18:41:55.795] muffleCondition(cond, pattern = "^muffle") [18:41:55.795] } [18:41:55.795] } [18:41:55.795] } [18:41:55.795] })) [18:41:55.795] }, error = function(ex) { [18:41:55.795] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.795] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.795] ...future.rng), started = ...future.startTime, [18:41:55.795] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.795] version = "1.8"), class = "FutureResult") [18:41:55.795] }, finally = { [18:41:55.795] if (!identical(...future.workdir, getwd())) [18:41:55.795] setwd(...future.workdir) [18:41:55.795] { [18:41:55.795] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.795] ...future.oldOptions$nwarnings <- NULL [18:41:55.795] } [18:41:55.795] base::options(...future.oldOptions) [18:41:55.795] if (.Platform$OS.type == "windows") { [18:41:55.795] old_names <- names(...future.oldEnvVars) [18:41:55.795] envs <- base::Sys.getenv() [18:41:55.795] names <- names(envs) [18:41:55.795] common <- intersect(names, old_names) [18:41:55.795] added <- setdiff(names, old_names) [18:41:55.795] removed <- setdiff(old_names, names) [18:41:55.795] changed <- common[...future.oldEnvVars[common] != [18:41:55.795] envs[common]] [18:41:55.795] NAMES <- toupper(changed) [18:41:55.795] args <- list() [18:41:55.795] for (kk in seq_along(NAMES)) { [18:41:55.795] name <- changed[[kk]] [18:41:55.795] NAME <- NAMES[[kk]] [18:41:55.795] if (name != NAME && is.element(NAME, old_names)) [18:41:55.795] next [18:41:55.795] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.795] } [18:41:55.795] NAMES <- toupper(added) [18:41:55.795] for (kk in seq_along(NAMES)) { [18:41:55.795] name <- added[[kk]] [18:41:55.795] NAME <- NAMES[[kk]] [18:41:55.795] if (name != NAME && is.element(NAME, old_names)) [18:41:55.795] next [18:41:55.795] args[[name]] <- "" [18:41:55.795] } [18:41:55.795] NAMES <- toupper(removed) [18:41:55.795] for (kk in seq_along(NAMES)) { [18:41:55.795] name <- removed[[kk]] [18:41:55.795] NAME <- NAMES[[kk]] [18:41:55.795] if (name != NAME && is.element(NAME, old_names)) [18:41:55.795] next [18:41:55.795] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.795] } [18:41:55.795] if (length(args) > 0) [18:41:55.795] base::do.call(base::Sys.setenv, args = args) [18:41:55.795] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.795] } [18:41:55.795] { [18:41:55.795] if (base::length(...future.futureOptionsAdded) > [18:41:55.795] 0L) { [18:41:55.795] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.795] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.795] base::options(opts) [18:41:55.795] } [18:41:55.795] { [18:41:55.795] { [18:41:55.795] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.795] NULL [18:41:55.795] } [18:41:55.795] options(future.plan = NULL) [18:41:55.795] if (is.na(NA_character_)) [18:41:55.795] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.795] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.795] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.795] .init = FALSE) [18:41:55.795] } [18:41:55.795] } [18:41:55.795] } [18:41:55.795] }) [18:41:55.795] if (TRUE) { [18:41:55.795] base::sink(type = "output", split = FALSE) [18:41:55.795] if (TRUE) { [18:41:55.795] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.795] } [18:41:55.795] else { [18:41:55.795] ...future.result["stdout"] <- base::list(NULL) [18:41:55.795] } [18:41:55.795] base::close(...future.stdout) [18:41:55.795] ...future.stdout <- NULL [18:41:55.795] } [18:41:55.795] ...future.result$conditions <- ...future.conditions [18:41:55.795] ...future.result$finished <- base::Sys.time() [18:41:55.795] ...future.result [18:41:55.795] } [18:41:55.800] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:55.801] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:55.801] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:55.801] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.802] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.802] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.803] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.803] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.803] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.803] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.804] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.804] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:55.805] MultisessionFuture started [18:41:55.805] - Launch lazy future ... done [18:41:55.805] run() for 'MultisessionFuture' ... done [18:41:55.805] Created future: [18:41:55.824] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.824] - Validating connection of MultisessionFuture [18:41:55.828] - received message: FutureResult [18:41:55.828] - Received FutureResult [18:41:55.828] - Erased future from FutureRegistry [18:41:55.828] result() for ClusterFuture ... [18:41:55.828] - result already collected: FutureResult [18:41:55.829] result() for ClusterFuture ... done [18:41:55.829] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.805] MultisessionFuture: [18:41:55.805] Label: 'future_sapply-1' [18:41:55.805] Expression: [18:41:55.805] { [18:41:55.805] do.call(function(...) { [18:41:55.805] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.805] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.805] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.805] on.exit(options(oopts), add = TRUE) [18:41:55.805] } [18:41:55.805] { [18:41:55.805] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.805] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.805] ...future.FUN(...future.X_jj, ...) [18:41:55.805] }) [18:41:55.805] } [18:41:55.805] }, args = future.call.arguments) [18:41:55.805] } [18:41:55.805] Lazy evaluation: FALSE [18:41:55.805] Asynchronous evaluation: TRUE [18:41:55.805] Local evaluation: TRUE [18:41:55.805] Environment: R_GlobalEnv [18:41:55.805] Capture standard output: TRUE [18:41:55.805] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.805] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.805] Packages: [18:41:55.805] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.805] Resolved: TRUE [18:41:55.805] Value: [18:41:55.805] Conditions captured: [18:41:55.805] Early signaling: FALSE [18:41:55.805] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.805] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.829] Chunk #1 of 2 ... DONE [18:41:55.829] Chunk #2 of 2 ... [18:41:55.829] - Finding globals in 'X' for chunk #2 ... [18:41:55.830] getGlobalsAndPackages() ... [18:41:55.830] Searching for globals... [18:41:55.830] [18:41:55.830] Searching for globals ... DONE [18:41:55.830] - globals: [0] [18:41:55.831] getGlobalsAndPackages() ... DONE [18:41:55.831] + additional globals found: [n=0] [18:41:55.831] + additional namespaces needed: [n=0] [18:41:55.831] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.831] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.831] - seeds: [18:41:55.832] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.832] getGlobalsAndPackages() ... [18:41:55.832] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.832] Resolving globals: FALSE [18:41:55.832] Tweak future expression to call with '...' arguments ... [18:41:55.832] { [18:41:55.832] do.call(function(...) { [18:41:55.832] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.832] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.832] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.832] on.exit(options(oopts), add = TRUE) [18:41:55.832] } [18:41:55.832] { [18:41:55.832] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.832] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.832] ...future.FUN(...future.X_jj, ...) [18:41:55.832] }) [18:41:55.832] } [18:41:55.832] }, args = future.call.arguments) [18:41:55.832] } [18:41:55.833] Tweak future expression to call with '...' arguments ... DONE [18:41:55.833] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.834] [18:41:55.834] getGlobalsAndPackages() ... DONE [18:41:55.834] run() for 'Future' ... [18:41:55.834] - state: 'created' [18:41:55.834] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.850] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.850] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.850] - Field: 'node' [18:41:55.850] - Field: 'label' [18:41:55.850] - Field: 'local' [18:41:55.851] - Field: 'owner' [18:41:55.851] - Field: 'envir' [18:41:55.851] - Field: 'workers' [18:41:55.851] - Field: 'packages' [18:41:55.851] - Field: 'gc' [18:41:55.851] - Field: 'conditions' [18:41:55.852] - Field: 'persistent' [18:41:55.852] - Field: 'expr' [18:41:55.852] - Field: 'uuid' [18:41:55.852] - Field: 'seed' [18:41:55.852] - Field: 'version' [18:41:55.852] - Field: 'result' [18:41:55.853] - Field: 'asynchronous' [18:41:55.853] - Field: 'calls' [18:41:55.853] - Field: 'globals' [18:41:55.853] - Field: 'stdout' [18:41:55.853] - Field: 'earlySignal' [18:41:55.854] - Field: 'lazy' [18:41:55.854] - Field: 'state' [18:41:55.854] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.854] - Launch lazy future ... [18:41:55.854] Packages needed by the future expression (n = 0): [18:41:55.855] Packages needed by future strategies (n = 0): [18:41:55.855] { [18:41:55.855] { [18:41:55.855] { [18:41:55.855] ...future.startTime <- base::Sys.time() [18:41:55.855] { [18:41:55.855] { [18:41:55.855] { [18:41:55.855] { [18:41:55.855] base::local({ [18:41:55.855] has_future <- base::requireNamespace("future", [18:41:55.855] quietly = TRUE) [18:41:55.855] if (has_future) { [18:41:55.855] ns <- base::getNamespace("future") [18:41:55.855] version <- ns[[".package"]][["version"]] [18:41:55.855] if (is.null(version)) [18:41:55.855] version <- utils::packageVersion("future") [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] version <- NULL [18:41:55.855] } [18:41:55.855] if (!has_future || version < "1.8.0") { [18:41:55.855] info <- base::c(r_version = base::gsub("R version ", [18:41:55.855] "", base::R.version$version.string), [18:41:55.855] platform = base::sprintf("%s (%s-bit)", [18:41:55.855] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.855] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.855] "release", "version")], collapse = " "), [18:41:55.855] hostname = base::Sys.info()[["nodename"]]) [18:41:55.855] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.855] info) [18:41:55.855] info <- base::paste(info, collapse = "; ") [18:41:55.855] if (!has_future) { [18:41:55.855] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.855] info) [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.855] info, version) [18:41:55.855] } [18:41:55.855] base::stop(msg) [18:41:55.855] } [18:41:55.855] }) [18:41:55.855] } [18:41:55.855] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.855] base::options(mc.cores = 1L) [18:41:55.855] } [18:41:55.855] ...future.strategy.old <- future::plan("list") [18:41:55.855] options(future.plan = NULL) [18:41:55.855] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.855] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.855] } [18:41:55.855] ...future.workdir <- getwd() [18:41:55.855] } [18:41:55.855] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.855] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.855] } [18:41:55.855] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.855] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.855] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.855] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.855] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.855] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.855] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.855] base::names(...future.oldOptions)) [18:41:55.855] } [18:41:55.855] if (FALSE) { [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] if (TRUE) { [18:41:55.855] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.855] open = "w") [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.855] windows = "NUL", "/dev/null"), open = "w") [18:41:55.855] } [18:41:55.855] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.855] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.855] base::sink(type = "output", split = FALSE) [18:41:55.855] base::close(...future.stdout) [18:41:55.855] }, add = TRUE) [18:41:55.855] } [18:41:55.855] ...future.frame <- base::sys.nframe() [18:41:55.855] ...future.conditions <- base::list() [18:41:55.855] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.855] if (FALSE) { [18:41:55.855] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.855] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.855] } [18:41:55.855] ...future.result <- base::tryCatch({ [18:41:55.855] base::withCallingHandlers({ [18:41:55.855] ...future.value <- base::withVisible(base::local({ [18:41:55.855] ...future.makeSendCondition <- base::local({ [18:41:55.855] sendCondition <- NULL [18:41:55.855] function(frame = 1L) { [18:41:55.855] if (is.function(sendCondition)) [18:41:55.855] return(sendCondition) [18:41:55.855] ns <- getNamespace("parallel") [18:41:55.855] if (exists("sendData", mode = "function", [18:41:55.855] envir = ns)) { [18:41:55.855] parallel_sendData <- get("sendData", mode = "function", [18:41:55.855] envir = ns) [18:41:55.855] envir <- sys.frame(frame) [18:41:55.855] master <- NULL [18:41:55.855] while (!identical(envir, .GlobalEnv) && [18:41:55.855] !identical(envir, emptyenv())) { [18:41:55.855] if (exists("master", mode = "list", envir = envir, [18:41:55.855] inherits = FALSE)) { [18:41:55.855] master <- get("master", mode = "list", [18:41:55.855] envir = envir, inherits = FALSE) [18:41:55.855] if (inherits(master, c("SOCKnode", [18:41:55.855] "SOCK0node"))) { [18:41:55.855] sendCondition <<- function(cond) { [18:41:55.855] data <- list(type = "VALUE", value = cond, [18:41:55.855] success = TRUE) [18:41:55.855] parallel_sendData(master, data) [18:41:55.855] } [18:41:55.855] return(sendCondition) [18:41:55.855] } [18:41:55.855] } [18:41:55.855] frame <- frame + 1L [18:41:55.855] envir <- sys.frame(frame) [18:41:55.855] } [18:41:55.855] } [18:41:55.855] sendCondition <<- function(cond) NULL [18:41:55.855] } [18:41:55.855] }) [18:41:55.855] withCallingHandlers({ [18:41:55.855] { [18:41:55.855] do.call(function(...) { [18:41:55.855] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.855] if (!identical(...future.globals.maxSize.org, [18:41:55.855] ...future.globals.maxSize)) { [18:41:55.855] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.855] on.exit(options(oopts), add = TRUE) [18:41:55.855] } [18:41:55.855] { [18:41:55.855] lapply(seq_along(...future.elements_ii), [18:41:55.855] FUN = function(jj) { [18:41:55.855] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.855] ...future.FUN(...future.X_jj, ...) [18:41:55.855] }) [18:41:55.855] } [18:41:55.855] }, args = future.call.arguments) [18:41:55.855] } [18:41:55.855] }, immediateCondition = function(cond) { [18:41:55.855] sendCondition <- ...future.makeSendCondition() [18:41:55.855] sendCondition(cond) [18:41:55.855] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.855] { [18:41:55.855] inherits <- base::inherits [18:41:55.855] invokeRestart <- base::invokeRestart [18:41:55.855] is.null <- base::is.null [18:41:55.855] muffled <- FALSE [18:41:55.855] if (inherits(cond, "message")) { [18:41:55.855] muffled <- grepl(pattern, "muffleMessage") [18:41:55.855] if (muffled) [18:41:55.855] invokeRestart("muffleMessage") [18:41:55.855] } [18:41:55.855] else if (inherits(cond, "warning")) { [18:41:55.855] muffled <- grepl(pattern, "muffleWarning") [18:41:55.855] if (muffled) [18:41:55.855] invokeRestart("muffleWarning") [18:41:55.855] } [18:41:55.855] else if (inherits(cond, "condition")) { [18:41:55.855] if (!is.null(pattern)) { [18:41:55.855] computeRestarts <- base::computeRestarts [18:41:55.855] grepl <- base::grepl [18:41:55.855] restarts <- computeRestarts(cond) [18:41:55.855] for (restart in restarts) { [18:41:55.855] name <- restart$name [18:41:55.855] if (is.null(name)) [18:41:55.855] next [18:41:55.855] if (!grepl(pattern, name)) [18:41:55.855] next [18:41:55.855] invokeRestart(restart) [18:41:55.855] muffled <- TRUE [18:41:55.855] break [18:41:55.855] } [18:41:55.855] } [18:41:55.855] } [18:41:55.855] invisible(muffled) [18:41:55.855] } [18:41:55.855] muffleCondition(cond) [18:41:55.855] }) [18:41:55.855] })) [18:41:55.855] future::FutureResult(value = ...future.value$value, [18:41:55.855] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.855] ...future.rng), globalenv = if (FALSE) [18:41:55.855] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.855] ...future.globalenv.names)) [18:41:55.855] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.855] }, condition = base::local({ [18:41:55.855] c <- base::c [18:41:55.855] inherits <- base::inherits [18:41:55.855] invokeRestart <- base::invokeRestart [18:41:55.855] length <- base::length [18:41:55.855] list <- base::list [18:41:55.855] seq.int <- base::seq.int [18:41:55.855] signalCondition <- base::signalCondition [18:41:55.855] sys.calls <- base::sys.calls [18:41:55.855] `[[` <- base::`[[` [18:41:55.855] `+` <- base::`+` [18:41:55.855] `<<-` <- base::`<<-` [18:41:55.855] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.855] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.855] 3L)] [18:41:55.855] } [18:41:55.855] function(cond) { [18:41:55.855] is_error <- inherits(cond, "error") [18:41:55.855] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.855] NULL) [18:41:55.855] if (is_error) { [18:41:55.855] sessionInformation <- function() { [18:41:55.855] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.855] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.855] search = base::search(), system = base::Sys.info()) [18:41:55.855] } [18:41:55.855] ...future.conditions[[length(...future.conditions) + [18:41:55.855] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.855] cond$call), session = sessionInformation(), [18:41:55.855] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.855] signalCondition(cond) [18:41:55.855] } [18:41:55.855] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.855] "immediateCondition"))) { [18:41:55.855] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.855] ...future.conditions[[length(...future.conditions) + [18:41:55.855] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.855] if (TRUE && !signal) { [18:41:55.855] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.855] { [18:41:55.855] inherits <- base::inherits [18:41:55.855] invokeRestart <- base::invokeRestart [18:41:55.855] is.null <- base::is.null [18:41:55.855] muffled <- FALSE [18:41:55.855] if (inherits(cond, "message")) { [18:41:55.855] muffled <- grepl(pattern, "muffleMessage") [18:41:55.855] if (muffled) [18:41:55.855] invokeRestart("muffleMessage") [18:41:55.855] } [18:41:55.855] else if (inherits(cond, "warning")) { [18:41:55.855] muffled <- grepl(pattern, "muffleWarning") [18:41:55.855] if (muffled) [18:41:55.855] invokeRestart("muffleWarning") [18:41:55.855] } [18:41:55.855] else if (inherits(cond, "condition")) { [18:41:55.855] if (!is.null(pattern)) { [18:41:55.855] computeRestarts <- base::computeRestarts [18:41:55.855] grepl <- base::grepl [18:41:55.855] restarts <- computeRestarts(cond) [18:41:55.855] for (restart in restarts) { [18:41:55.855] name <- restart$name [18:41:55.855] if (is.null(name)) [18:41:55.855] next [18:41:55.855] if (!grepl(pattern, name)) [18:41:55.855] next [18:41:55.855] invokeRestart(restart) [18:41:55.855] muffled <- TRUE [18:41:55.855] break [18:41:55.855] } [18:41:55.855] } [18:41:55.855] } [18:41:55.855] invisible(muffled) [18:41:55.855] } [18:41:55.855] muffleCondition(cond, pattern = "^muffle") [18:41:55.855] } [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] if (TRUE) { [18:41:55.855] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.855] { [18:41:55.855] inherits <- base::inherits [18:41:55.855] invokeRestart <- base::invokeRestart [18:41:55.855] is.null <- base::is.null [18:41:55.855] muffled <- FALSE [18:41:55.855] if (inherits(cond, "message")) { [18:41:55.855] muffled <- grepl(pattern, "muffleMessage") [18:41:55.855] if (muffled) [18:41:55.855] invokeRestart("muffleMessage") [18:41:55.855] } [18:41:55.855] else if (inherits(cond, "warning")) { [18:41:55.855] muffled <- grepl(pattern, "muffleWarning") [18:41:55.855] if (muffled) [18:41:55.855] invokeRestart("muffleWarning") [18:41:55.855] } [18:41:55.855] else if (inherits(cond, "condition")) { [18:41:55.855] if (!is.null(pattern)) { [18:41:55.855] computeRestarts <- base::computeRestarts [18:41:55.855] grepl <- base::grepl [18:41:55.855] restarts <- computeRestarts(cond) [18:41:55.855] for (restart in restarts) { [18:41:55.855] name <- restart$name [18:41:55.855] if (is.null(name)) [18:41:55.855] next [18:41:55.855] if (!grepl(pattern, name)) [18:41:55.855] next [18:41:55.855] invokeRestart(restart) [18:41:55.855] muffled <- TRUE [18:41:55.855] break [18:41:55.855] } [18:41:55.855] } [18:41:55.855] } [18:41:55.855] invisible(muffled) [18:41:55.855] } [18:41:55.855] muffleCondition(cond, pattern = "^muffle") [18:41:55.855] } [18:41:55.855] } [18:41:55.855] } [18:41:55.855] })) [18:41:55.855] }, error = function(ex) { [18:41:55.855] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.855] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.855] ...future.rng), started = ...future.startTime, [18:41:55.855] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.855] version = "1.8"), class = "FutureResult") [18:41:55.855] }, finally = { [18:41:55.855] if (!identical(...future.workdir, getwd())) [18:41:55.855] setwd(...future.workdir) [18:41:55.855] { [18:41:55.855] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.855] ...future.oldOptions$nwarnings <- NULL [18:41:55.855] } [18:41:55.855] base::options(...future.oldOptions) [18:41:55.855] if (.Platform$OS.type == "windows") { [18:41:55.855] old_names <- names(...future.oldEnvVars) [18:41:55.855] envs <- base::Sys.getenv() [18:41:55.855] names <- names(envs) [18:41:55.855] common <- intersect(names, old_names) [18:41:55.855] added <- setdiff(names, old_names) [18:41:55.855] removed <- setdiff(old_names, names) [18:41:55.855] changed <- common[...future.oldEnvVars[common] != [18:41:55.855] envs[common]] [18:41:55.855] NAMES <- toupper(changed) [18:41:55.855] args <- list() [18:41:55.855] for (kk in seq_along(NAMES)) { [18:41:55.855] name <- changed[[kk]] [18:41:55.855] NAME <- NAMES[[kk]] [18:41:55.855] if (name != NAME && is.element(NAME, old_names)) [18:41:55.855] next [18:41:55.855] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.855] } [18:41:55.855] NAMES <- toupper(added) [18:41:55.855] for (kk in seq_along(NAMES)) { [18:41:55.855] name <- added[[kk]] [18:41:55.855] NAME <- NAMES[[kk]] [18:41:55.855] if (name != NAME && is.element(NAME, old_names)) [18:41:55.855] next [18:41:55.855] args[[name]] <- "" [18:41:55.855] } [18:41:55.855] NAMES <- toupper(removed) [18:41:55.855] for (kk in seq_along(NAMES)) { [18:41:55.855] name <- removed[[kk]] [18:41:55.855] NAME <- NAMES[[kk]] [18:41:55.855] if (name != NAME && is.element(NAME, old_names)) [18:41:55.855] next [18:41:55.855] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.855] } [18:41:55.855] if (length(args) > 0) [18:41:55.855] base::do.call(base::Sys.setenv, args = args) [18:41:55.855] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.855] } [18:41:55.855] { [18:41:55.855] if (base::length(...future.futureOptionsAdded) > [18:41:55.855] 0L) { [18:41:55.855] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.855] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.855] base::options(opts) [18:41:55.855] } [18:41:55.855] { [18:41:55.855] { [18:41:55.855] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.855] NULL [18:41:55.855] } [18:41:55.855] options(future.plan = NULL) [18:41:55.855] if (is.na(NA_character_)) [18:41:55.855] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.855] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.855] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.855] .init = FALSE) [18:41:55.855] } [18:41:55.855] } [18:41:55.855] } [18:41:55.855] }) [18:41:55.855] if (TRUE) { [18:41:55.855] base::sink(type = "output", split = FALSE) [18:41:55.855] if (TRUE) { [18:41:55.855] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.855] } [18:41:55.855] else { [18:41:55.855] ...future.result["stdout"] <- base::list(NULL) [18:41:55.855] } [18:41:55.855] base::close(...future.stdout) [18:41:55.855] ...future.stdout <- NULL [18:41:55.855] } [18:41:55.855] ...future.result$conditions <- ...future.conditions [18:41:55.855] ...future.result$finished <- base::Sys.time() [18:41:55.855] ...future.result [18:41:55.855] } [18:41:55.860] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:55.861] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:55.861] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:55.861] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.862] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.862] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.862] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.862] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.863] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.863] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.863] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.864] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:55.864] MultisessionFuture started [18:41:55.864] - Launch lazy future ... done [18:41:55.864] run() for 'MultisessionFuture' ... done [18:41:55.865] Created future: [18:41:55.882] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.882] - Validating connection of MultisessionFuture [18:41:55.882] - received message: FutureResult [18:41:55.882] - Received FutureResult [18:41:55.883] - Erased future from FutureRegistry [18:41:55.883] result() for ClusterFuture ... [18:41:55.883] - result already collected: FutureResult [18:41:55.883] result() for ClusterFuture ... done [18:41:55.883] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.865] MultisessionFuture: [18:41:55.865] Label: 'future_sapply-2' [18:41:55.865] Expression: [18:41:55.865] { [18:41:55.865] do.call(function(...) { [18:41:55.865] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.865] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.865] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.865] on.exit(options(oopts), add = TRUE) [18:41:55.865] } [18:41:55.865] { [18:41:55.865] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.865] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.865] ...future.FUN(...future.X_jj, ...) [18:41:55.865] }) [18:41:55.865] } [18:41:55.865] }, args = future.call.arguments) [18:41:55.865] } [18:41:55.865] Lazy evaluation: FALSE [18:41:55.865] Asynchronous evaluation: TRUE [18:41:55.865] Local evaluation: TRUE [18:41:55.865] Environment: R_GlobalEnv [18:41:55.865] Capture standard output: TRUE [18:41:55.865] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.865] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.865] Packages: [18:41:55.865] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.865] Resolved: TRUE [18:41:55.865] Value: [18:41:55.865] Conditions captured: [18:41:55.865] Early signaling: FALSE [18:41:55.865] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.865] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.884] Chunk #2 of 2 ... DONE [18:41:55.884] Launching 2 futures (chunks) ... DONE [18:41:55.884] Resolving 2 futures (chunks) ... [18:41:55.884] resolve() on list ... [18:41:55.884] recursive: 0 [18:41:55.885] length: 2 [18:41:55.885] [18:41:55.885] Future #1 [18:41:55.885] result() for ClusterFuture ... [18:41:55.885] - result already collected: FutureResult [18:41:55.885] result() for ClusterFuture ... done [18:41:55.886] result() for ClusterFuture ... [18:41:55.886] - result already collected: FutureResult [18:41:55.886] result() for ClusterFuture ... done [18:41:55.886] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:55.886] - nx: 2 [18:41:55.886] - relay: TRUE [18:41:55.887] - stdout: TRUE [18:41:55.887] - signal: TRUE [18:41:55.887] - resignal: FALSE [18:41:55.887] - force: TRUE [18:41:55.887] - relayed: [n=2] FALSE, FALSE [18:41:55.887] - queued futures: [n=2] FALSE, FALSE [18:41:55.887] - until=1 [18:41:55.888] - relaying element #1 [18:41:55.888] result() for ClusterFuture ... [18:41:55.888] - result already collected: FutureResult [18:41:55.888] result() for ClusterFuture ... done [18:41:55.888] result() for ClusterFuture ... [18:41:55.888] - result already collected: FutureResult [18:41:55.888] result() for ClusterFuture ... done [18:41:55.889] result() for ClusterFuture ... [18:41:55.889] - result already collected: FutureResult [18:41:55.889] result() for ClusterFuture ... done [18:41:55.889] result() for ClusterFuture ... [18:41:55.889] - result already collected: FutureResult [18:41:55.889] result() for ClusterFuture ... done [18:41:55.890] - relayed: [n=2] TRUE, FALSE [18:41:55.890] - queued futures: [n=2] TRUE, FALSE [18:41:55.890] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:55.890] length: 1 (resolved future 1) [18:41:55.890] Future #2 [18:41:55.890] result() for ClusterFuture ... [18:41:55.891] - result already collected: FutureResult [18:41:55.891] result() for ClusterFuture ... done [18:41:55.891] result() for ClusterFuture ... [18:41:55.891] - result already collected: FutureResult [18:41:55.891] result() for ClusterFuture ... done [18:41:55.891] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:55.892] - nx: 2 [18:41:55.892] - relay: TRUE [18:41:55.892] - stdout: TRUE [18:41:55.892] - signal: TRUE [18:41:55.892] - resignal: FALSE [18:41:55.892] - force: TRUE [18:41:55.892] - relayed: [n=2] TRUE, FALSE [18:41:55.893] - queued futures: [n=2] TRUE, FALSE [18:41:55.893] - until=2 [18:41:55.893] - relaying element #2 [18:41:55.893] result() for ClusterFuture ... [18:41:55.893] - result already collected: FutureResult [18:41:55.893] result() for ClusterFuture ... done [18:41:55.894] result() for ClusterFuture ... [18:41:55.894] - result already collected: FutureResult [18:41:55.894] result() for ClusterFuture ... done [18:41:55.894] result() for ClusterFuture ... [18:41:55.894] - result already collected: FutureResult [18:41:55.894] result() for ClusterFuture ... done [18:41:55.895] result() for ClusterFuture ... [18:41:55.895] - result already collected: FutureResult [18:41:55.895] result() for ClusterFuture ... done [18:41:55.895] - relayed: [n=2] TRUE, TRUE [18:41:55.895] - queued futures: [n=2] TRUE, TRUE [18:41:55.895] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:55.896] length: 0 (resolved future 2) [18:41:55.896] Relaying remaining futures [18:41:55.896] signalConditionsASAP(NULL, pos=0) ... [18:41:55.896] - nx: 2 [18:41:55.896] - relay: TRUE [18:41:55.896] - stdout: TRUE [18:41:55.896] - signal: TRUE [18:41:55.897] - resignal: FALSE [18:41:55.897] - force: TRUE [18:41:55.897] - relayed: [n=2] TRUE, TRUE [18:41:55.897] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:55.897] - relayed: [n=2] TRUE, TRUE [18:41:55.897] - queued futures: [n=2] TRUE, TRUE [18:41:55.898] signalConditionsASAP(NULL, pos=0) ... done [18:41:55.898] resolve() on list ... DONE [18:41:55.898] result() for ClusterFuture ... [18:41:55.898] - result already collected: FutureResult [18:41:55.898] result() for ClusterFuture ... done [18:41:55.898] result() for ClusterFuture ... [18:41:55.899] - result already collected: FutureResult [18:41:55.899] result() for ClusterFuture ... done [18:41:55.899] result() for ClusterFuture ... [18:41:55.899] - result already collected: FutureResult [18:41:55.899] result() for ClusterFuture ... done [18:41:55.899] result() for ClusterFuture ... [18:41:55.900] - result already collected: FutureResult [18:41:55.900] result() for ClusterFuture ... done [18:41:55.900] - Number of value chunks collected: 2 [18:41:55.900] Resolving 2 futures (chunks) ... DONE [18:41:55.900] Reducing values from 2 chunks ... [18:41:55.900] - Number of values collected after concatenation: 4 [18:41:55.900] - Number of values expected: 4 [18:41:55.901] Reducing values from 2 chunks ... DONE [18:41:55.901] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:55.903] future_lapply() ... [18:41:55.906] Number of chunks: 2 [18:41:55.906] getGlobalsAndPackagesXApply() ... [18:41:55.906] - future.globals: TRUE [18:41:55.906] getGlobalsAndPackages() ... [18:41:55.906] Searching for globals... [18:41:55.908] - globals found: [2] 'FUN', 'UseMethod' [18:41:55.908] Searching for globals ... DONE [18:41:55.908] Resolving globals: FALSE [18:41:55.908] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:55.909] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:55.909] - globals: [1] 'FUN' [18:41:55.909] [18:41:55.909] getGlobalsAndPackages() ... DONE [18:41:55.910] - globals found/used: [n=1] 'FUN' [18:41:55.910] - needed namespaces: [n=0] [18:41:55.910] Finding globals ... DONE [18:41:55.910] - use_args: TRUE [18:41:55.910] - Getting '...' globals ... [18:41:55.911] resolve() on list ... [18:41:55.911] recursive: 0 [18:41:55.911] length: 1 [18:41:55.911] elements: '...' [18:41:55.912] length: 0 (resolved future 1) [18:41:55.912] resolve() on list ... DONE [18:41:55.912] - '...' content: [n=0] [18:41:55.912] List of 1 [18:41:55.912] $ ...: list() [18:41:55.912] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.912] - attr(*, "where")=List of 1 [18:41:55.912] ..$ ...: [18:41:55.912] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.912] - attr(*, "resolved")= logi TRUE [18:41:55.912] - attr(*, "total_size")= num NA [18:41:55.915] - Getting '...' globals ... DONE [18:41:55.915] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:55.915] List of 2 [18:41:55.915] $ ...future.FUN:function (x, ...) [18:41:55.915] $ ... : list() [18:41:55.915] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:55.915] - attr(*, "where")=List of 2 [18:41:55.915] ..$ ...future.FUN: [18:41:55.915] ..$ ... : [18:41:55.915] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:55.915] - attr(*, "resolved")= logi FALSE [18:41:55.915] - attr(*, "total_size")= int 5150 [18:41:55.919] Packages to be attached in all futures: [n=0] [18:41:55.919] getGlobalsAndPackagesXApply() ... DONE [18:41:55.919] Number of futures (= number of chunks): 2 [18:41:55.919] Launching 2 futures (chunks) ... [18:41:55.920] Chunk #1 of 2 ... [18:41:55.920] - Finding globals in 'X' for chunk #1 ... [18:41:55.920] getGlobalsAndPackages() ... [18:41:55.920] Searching for globals... [18:41:55.920] [18:41:55.921] Searching for globals ... DONE [18:41:55.921] - globals: [0] [18:41:55.921] getGlobalsAndPackages() ... DONE [18:41:55.921] + additional globals found: [n=0] [18:41:55.921] + additional namespaces needed: [n=0] [18:41:55.921] - Finding globals in 'X' for chunk #1 ... DONE [18:41:55.922] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.922] - seeds: [18:41:55.922] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.922] getGlobalsAndPackages() ... [18:41:55.922] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.922] Resolving globals: FALSE [18:41:55.923] Tweak future expression to call with '...' arguments ... [18:41:55.923] { [18:41:55.923] do.call(function(...) { [18:41:55.923] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.923] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.923] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.923] on.exit(options(oopts), add = TRUE) [18:41:55.923] } [18:41:55.923] { [18:41:55.923] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.923] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.923] ...future.FUN(...future.X_jj, ...) [18:41:55.923] }) [18:41:55.923] } [18:41:55.923] }, args = future.call.arguments) [18:41:55.923] } [18:41:55.923] Tweak future expression to call with '...' arguments ... DONE [18:41:55.924] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.924] [18:41:55.924] getGlobalsAndPackages() ... DONE [18:41:55.924] run() for 'Future' ... [18:41:55.925] - state: 'created' [18:41:55.925] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.940] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.940] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.940] - Field: 'node' [18:41:55.940] - Field: 'label' [18:41:55.941] - Field: 'local' [18:41:55.941] - Field: 'owner' [18:41:55.941] - Field: 'envir' [18:41:55.941] - Field: 'workers' [18:41:55.941] - Field: 'packages' [18:41:55.942] - Field: 'gc' [18:41:55.942] - Field: 'conditions' [18:41:55.942] - Field: 'persistent' [18:41:55.942] - Field: 'expr' [18:41:55.942] - Field: 'uuid' [18:41:55.943] - Field: 'seed' [18:41:55.943] - Field: 'version' [18:41:55.943] - Field: 'result' [18:41:55.943] - Field: 'asynchronous' [18:41:55.943] - Field: 'calls' [18:41:55.944] - Field: 'globals' [18:41:55.944] - Field: 'stdout' [18:41:55.944] - Field: 'earlySignal' [18:41:55.944] - Field: 'lazy' [18:41:55.944] - Field: 'state' [18:41:55.944] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:55.945] - Launch lazy future ... [18:41:55.945] Packages needed by the future expression (n = 0): [18:41:55.945] Packages needed by future strategies (n = 0): [18:41:55.946] { [18:41:55.946] { [18:41:55.946] { [18:41:55.946] ...future.startTime <- base::Sys.time() [18:41:55.946] { [18:41:55.946] { [18:41:55.946] { [18:41:55.946] { [18:41:55.946] base::local({ [18:41:55.946] has_future <- base::requireNamespace("future", [18:41:55.946] quietly = TRUE) [18:41:55.946] if (has_future) { [18:41:55.946] ns <- base::getNamespace("future") [18:41:55.946] version <- ns[[".package"]][["version"]] [18:41:55.946] if (is.null(version)) [18:41:55.946] version <- utils::packageVersion("future") [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] version <- NULL [18:41:55.946] } [18:41:55.946] if (!has_future || version < "1.8.0") { [18:41:55.946] info <- base::c(r_version = base::gsub("R version ", [18:41:55.946] "", base::R.version$version.string), [18:41:55.946] platform = base::sprintf("%s (%s-bit)", [18:41:55.946] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:55.946] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:55.946] "release", "version")], collapse = " "), [18:41:55.946] hostname = base::Sys.info()[["nodename"]]) [18:41:55.946] info <- base::sprintf("%s: %s", base::names(info), [18:41:55.946] info) [18:41:55.946] info <- base::paste(info, collapse = "; ") [18:41:55.946] if (!has_future) { [18:41:55.946] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:55.946] info) [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:55.946] info, version) [18:41:55.946] } [18:41:55.946] base::stop(msg) [18:41:55.946] } [18:41:55.946] }) [18:41:55.946] } [18:41:55.946] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:55.946] base::options(mc.cores = 1L) [18:41:55.946] } [18:41:55.946] ...future.strategy.old <- future::plan("list") [18:41:55.946] options(future.plan = NULL) [18:41:55.946] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.946] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:55.946] } [18:41:55.946] ...future.workdir <- getwd() [18:41:55.946] } [18:41:55.946] ...future.oldOptions <- base::as.list(base::.Options) [18:41:55.946] ...future.oldEnvVars <- base::Sys.getenv() [18:41:55.946] } [18:41:55.946] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:55.946] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:55.946] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:55.946] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:55.946] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:55.946] future.stdout.windows.reencode = NULL, width = 80L) [18:41:55.946] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:55.946] base::names(...future.oldOptions)) [18:41:55.946] } [18:41:55.946] if (FALSE) { [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] if (TRUE) { [18:41:55.946] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:55.946] open = "w") [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:55.946] windows = "NUL", "/dev/null"), open = "w") [18:41:55.946] } [18:41:55.946] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:55.946] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:55.946] base::sink(type = "output", split = FALSE) [18:41:55.946] base::close(...future.stdout) [18:41:55.946] }, add = TRUE) [18:41:55.946] } [18:41:55.946] ...future.frame <- base::sys.nframe() [18:41:55.946] ...future.conditions <- base::list() [18:41:55.946] ...future.rng <- base::globalenv()$.Random.seed [18:41:55.946] if (FALSE) { [18:41:55.946] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:55.946] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:55.946] } [18:41:55.946] ...future.result <- base::tryCatch({ [18:41:55.946] base::withCallingHandlers({ [18:41:55.946] ...future.value <- base::withVisible(base::local({ [18:41:55.946] ...future.makeSendCondition <- base::local({ [18:41:55.946] sendCondition <- NULL [18:41:55.946] function(frame = 1L) { [18:41:55.946] if (is.function(sendCondition)) [18:41:55.946] return(sendCondition) [18:41:55.946] ns <- getNamespace("parallel") [18:41:55.946] if (exists("sendData", mode = "function", [18:41:55.946] envir = ns)) { [18:41:55.946] parallel_sendData <- get("sendData", mode = "function", [18:41:55.946] envir = ns) [18:41:55.946] envir <- sys.frame(frame) [18:41:55.946] master <- NULL [18:41:55.946] while (!identical(envir, .GlobalEnv) && [18:41:55.946] !identical(envir, emptyenv())) { [18:41:55.946] if (exists("master", mode = "list", envir = envir, [18:41:55.946] inherits = FALSE)) { [18:41:55.946] master <- get("master", mode = "list", [18:41:55.946] envir = envir, inherits = FALSE) [18:41:55.946] if (inherits(master, c("SOCKnode", [18:41:55.946] "SOCK0node"))) { [18:41:55.946] sendCondition <<- function(cond) { [18:41:55.946] data <- list(type = "VALUE", value = cond, [18:41:55.946] success = TRUE) [18:41:55.946] parallel_sendData(master, data) [18:41:55.946] } [18:41:55.946] return(sendCondition) [18:41:55.946] } [18:41:55.946] } [18:41:55.946] frame <- frame + 1L [18:41:55.946] envir <- sys.frame(frame) [18:41:55.946] } [18:41:55.946] } [18:41:55.946] sendCondition <<- function(cond) NULL [18:41:55.946] } [18:41:55.946] }) [18:41:55.946] withCallingHandlers({ [18:41:55.946] { [18:41:55.946] do.call(function(...) { [18:41:55.946] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.946] if (!identical(...future.globals.maxSize.org, [18:41:55.946] ...future.globals.maxSize)) { [18:41:55.946] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.946] on.exit(options(oopts), add = TRUE) [18:41:55.946] } [18:41:55.946] { [18:41:55.946] lapply(seq_along(...future.elements_ii), [18:41:55.946] FUN = function(jj) { [18:41:55.946] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.946] ...future.FUN(...future.X_jj, ...) [18:41:55.946] }) [18:41:55.946] } [18:41:55.946] }, args = future.call.arguments) [18:41:55.946] } [18:41:55.946] }, immediateCondition = function(cond) { [18:41:55.946] sendCondition <- ...future.makeSendCondition() [18:41:55.946] sendCondition(cond) [18:41:55.946] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.946] { [18:41:55.946] inherits <- base::inherits [18:41:55.946] invokeRestart <- base::invokeRestart [18:41:55.946] is.null <- base::is.null [18:41:55.946] muffled <- FALSE [18:41:55.946] if (inherits(cond, "message")) { [18:41:55.946] muffled <- grepl(pattern, "muffleMessage") [18:41:55.946] if (muffled) [18:41:55.946] invokeRestart("muffleMessage") [18:41:55.946] } [18:41:55.946] else if (inherits(cond, "warning")) { [18:41:55.946] muffled <- grepl(pattern, "muffleWarning") [18:41:55.946] if (muffled) [18:41:55.946] invokeRestart("muffleWarning") [18:41:55.946] } [18:41:55.946] else if (inherits(cond, "condition")) { [18:41:55.946] if (!is.null(pattern)) { [18:41:55.946] computeRestarts <- base::computeRestarts [18:41:55.946] grepl <- base::grepl [18:41:55.946] restarts <- computeRestarts(cond) [18:41:55.946] for (restart in restarts) { [18:41:55.946] name <- restart$name [18:41:55.946] if (is.null(name)) [18:41:55.946] next [18:41:55.946] if (!grepl(pattern, name)) [18:41:55.946] next [18:41:55.946] invokeRestart(restart) [18:41:55.946] muffled <- TRUE [18:41:55.946] break [18:41:55.946] } [18:41:55.946] } [18:41:55.946] } [18:41:55.946] invisible(muffled) [18:41:55.946] } [18:41:55.946] muffleCondition(cond) [18:41:55.946] }) [18:41:55.946] })) [18:41:55.946] future::FutureResult(value = ...future.value$value, [18:41:55.946] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.946] ...future.rng), globalenv = if (FALSE) [18:41:55.946] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:55.946] ...future.globalenv.names)) [18:41:55.946] else NULL, started = ...future.startTime, version = "1.8") [18:41:55.946] }, condition = base::local({ [18:41:55.946] c <- base::c [18:41:55.946] inherits <- base::inherits [18:41:55.946] invokeRestart <- base::invokeRestart [18:41:55.946] length <- base::length [18:41:55.946] list <- base::list [18:41:55.946] seq.int <- base::seq.int [18:41:55.946] signalCondition <- base::signalCondition [18:41:55.946] sys.calls <- base::sys.calls [18:41:55.946] `[[` <- base::`[[` [18:41:55.946] `+` <- base::`+` [18:41:55.946] `<<-` <- base::`<<-` [18:41:55.946] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:55.946] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:55.946] 3L)] [18:41:55.946] } [18:41:55.946] function(cond) { [18:41:55.946] is_error <- inherits(cond, "error") [18:41:55.946] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:55.946] NULL) [18:41:55.946] if (is_error) { [18:41:55.946] sessionInformation <- function() { [18:41:55.946] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:55.946] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:55.946] search = base::search(), system = base::Sys.info()) [18:41:55.946] } [18:41:55.946] ...future.conditions[[length(...future.conditions) + [18:41:55.946] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:55.946] cond$call), session = sessionInformation(), [18:41:55.946] timestamp = base::Sys.time(), signaled = 0L) [18:41:55.946] signalCondition(cond) [18:41:55.946] } [18:41:55.946] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:55.946] "immediateCondition"))) { [18:41:55.946] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:55.946] ...future.conditions[[length(...future.conditions) + [18:41:55.946] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:55.946] if (TRUE && !signal) { [18:41:55.946] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.946] { [18:41:55.946] inherits <- base::inherits [18:41:55.946] invokeRestart <- base::invokeRestart [18:41:55.946] is.null <- base::is.null [18:41:55.946] muffled <- FALSE [18:41:55.946] if (inherits(cond, "message")) { [18:41:55.946] muffled <- grepl(pattern, "muffleMessage") [18:41:55.946] if (muffled) [18:41:55.946] invokeRestart("muffleMessage") [18:41:55.946] } [18:41:55.946] else if (inherits(cond, "warning")) { [18:41:55.946] muffled <- grepl(pattern, "muffleWarning") [18:41:55.946] if (muffled) [18:41:55.946] invokeRestart("muffleWarning") [18:41:55.946] } [18:41:55.946] else if (inherits(cond, "condition")) { [18:41:55.946] if (!is.null(pattern)) { [18:41:55.946] computeRestarts <- base::computeRestarts [18:41:55.946] grepl <- base::grepl [18:41:55.946] restarts <- computeRestarts(cond) [18:41:55.946] for (restart in restarts) { [18:41:55.946] name <- restart$name [18:41:55.946] if (is.null(name)) [18:41:55.946] next [18:41:55.946] if (!grepl(pattern, name)) [18:41:55.946] next [18:41:55.946] invokeRestart(restart) [18:41:55.946] muffled <- TRUE [18:41:55.946] break [18:41:55.946] } [18:41:55.946] } [18:41:55.946] } [18:41:55.946] invisible(muffled) [18:41:55.946] } [18:41:55.946] muffleCondition(cond, pattern = "^muffle") [18:41:55.946] } [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] if (TRUE) { [18:41:55.946] muffleCondition <- function (cond, pattern = "^muffle") [18:41:55.946] { [18:41:55.946] inherits <- base::inherits [18:41:55.946] invokeRestart <- base::invokeRestart [18:41:55.946] is.null <- base::is.null [18:41:55.946] muffled <- FALSE [18:41:55.946] if (inherits(cond, "message")) { [18:41:55.946] muffled <- grepl(pattern, "muffleMessage") [18:41:55.946] if (muffled) [18:41:55.946] invokeRestart("muffleMessage") [18:41:55.946] } [18:41:55.946] else if (inherits(cond, "warning")) { [18:41:55.946] muffled <- grepl(pattern, "muffleWarning") [18:41:55.946] if (muffled) [18:41:55.946] invokeRestart("muffleWarning") [18:41:55.946] } [18:41:55.946] else if (inherits(cond, "condition")) { [18:41:55.946] if (!is.null(pattern)) { [18:41:55.946] computeRestarts <- base::computeRestarts [18:41:55.946] grepl <- base::grepl [18:41:55.946] restarts <- computeRestarts(cond) [18:41:55.946] for (restart in restarts) { [18:41:55.946] name <- restart$name [18:41:55.946] if (is.null(name)) [18:41:55.946] next [18:41:55.946] if (!grepl(pattern, name)) [18:41:55.946] next [18:41:55.946] invokeRestart(restart) [18:41:55.946] muffled <- TRUE [18:41:55.946] break [18:41:55.946] } [18:41:55.946] } [18:41:55.946] } [18:41:55.946] invisible(muffled) [18:41:55.946] } [18:41:55.946] muffleCondition(cond, pattern = "^muffle") [18:41:55.946] } [18:41:55.946] } [18:41:55.946] } [18:41:55.946] })) [18:41:55.946] }, error = function(ex) { [18:41:55.946] base::structure(base::list(value = NULL, visible = NULL, [18:41:55.946] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:55.946] ...future.rng), started = ...future.startTime, [18:41:55.946] finished = Sys.time(), session_uuid = NA_character_, [18:41:55.946] version = "1.8"), class = "FutureResult") [18:41:55.946] }, finally = { [18:41:55.946] if (!identical(...future.workdir, getwd())) [18:41:55.946] setwd(...future.workdir) [18:41:55.946] { [18:41:55.946] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:55.946] ...future.oldOptions$nwarnings <- NULL [18:41:55.946] } [18:41:55.946] base::options(...future.oldOptions) [18:41:55.946] if (.Platform$OS.type == "windows") { [18:41:55.946] old_names <- names(...future.oldEnvVars) [18:41:55.946] envs <- base::Sys.getenv() [18:41:55.946] names <- names(envs) [18:41:55.946] common <- intersect(names, old_names) [18:41:55.946] added <- setdiff(names, old_names) [18:41:55.946] removed <- setdiff(old_names, names) [18:41:55.946] changed <- common[...future.oldEnvVars[common] != [18:41:55.946] envs[common]] [18:41:55.946] NAMES <- toupper(changed) [18:41:55.946] args <- list() [18:41:55.946] for (kk in seq_along(NAMES)) { [18:41:55.946] name <- changed[[kk]] [18:41:55.946] NAME <- NAMES[[kk]] [18:41:55.946] if (name != NAME && is.element(NAME, old_names)) [18:41:55.946] next [18:41:55.946] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.946] } [18:41:55.946] NAMES <- toupper(added) [18:41:55.946] for (kk in seq_along(NAMES)) { [18:41:55.946] name <- added[[kk]] [18:41:55.946] NAME <- NAMES[[kk]] [18:41:55.946] if (name != NAME && is.element(NAME, old_names)) [18:41:55.946] next [18:41:55.946] args[[name]] <- "" [18:41:55.946] } [18:41:55.946] NAMES <- toupper(removed) [18:41:55.946] for (kk in seq_along(NAMES)) { [18:41:55.946] name <- removed[[kk]] [18:41:55.946] NAME <- NAMES[[kk]] [18:41:55.946] if (name != NAME && is.element(NAME, old_names)) [18:41:55.946] next [18:41:55.946] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:55.946] } [18:41:55.946] if (length(args) > 0) [18:41:55.946] base::do.call(base::Sys.setenv, args = args) [18:41:55.946] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:55.946] } [18:41:55.946] { [18:41:55.946] if (base::length(...future.futureOptionsAdded) > [18:41:55.946] 0L) { [18:41:55.946] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:55.946] base::names(opts) <- ...future.futureOptionsAdded [18:41:55.946] base::options(opts) [18:41:55.946] } [18:41:55.946] { [18:41:55.946] { [18:41:55.946] base::options(mc.cores = ...future.mc.cores.old) [18:41:55.946] NULL [18:41:55.946] } [18:41:55.946] options(future.plan = NULL) [18:41:55.946] if (is.na(NA_character_)) [18:41:55.946] Sys.unsetenv("R_FUTURE_PLAN") [18:41:55.946] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:55.946] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:55.946] .init = FALSE) [18:41:55.946] } [18:41:55.946] } [18:41:55.946] } [18:41:55.946] }) [18:41:55.946] if (TRUE) { [18:41:55.946] base::sink(type = "output", split = FALSE) [18:41:55.946] if (TRUE) { [18:41:55.946] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:55.946] } [18:41:55.946] else { [18:41:55.946] ...future.result["stdout"] <- base::list(NULL) [18:41:55.946] } [18:41:55.946] base::close(...future.stdout) [18:41:55.946] ...future.stdout <- NULL [18:41:55.946] } [18:41:55.946] ...future.result$conditions <- ...future.conditions [18:41:55.946] ...future.result$finished <- base::Sys.time() [18:41:55.946] ...future.result [18:41:55.946] } [18:41:55.951] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:55.951] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:55.952] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:55.952] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:55.952] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:55.953] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:55.953] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:55.953] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:55.954] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:55.954] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:55.954] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:55.954] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:55.955] MultisessionFuture started [18:41:55.955] - Launch lazy future ... done [18:41:55.955] run() for 'MultisessionFuture' ... done [18:41:55.956] Created future: [18:41:55.975] receiveMessageFromWorker() for ClusterFuture ... [18:41:55.976] - Validating connection of MultisessionFuture [18:41:55.976] - received message: FutureResult [18:41:55.977] - Received FutureResult [18:41:55.977] - Erased future from FutureRegistry [18:41:55.977] result() for ClusterFuture ... [18:41:55.977] - result already collected: FutureResult [18:41:55.977] result() for ClusterFuture ... done [18:41:55.977] receiveMessageFromWorker() for ClusterFuture ... done [18:41:55.956] MultisessionFuture: [18:41:55.956] Label: 'future_sapply-1' [18:41:55.956] Expression: [18:41:55.956] { [18:41:55.956] do.call(function(...) { [18:41:55.956] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.956] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.956] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.956] on.exit(options(oopts), add = TRUE) [18:41:55.956] } [18:41:55.956] { [18:41:55.956] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.956] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.956] ...future.FUN(...future.X_jj, ...) [18:41:55.956] }) [18:41:55.956] } [18:41:55.956] }, args = future.call.arguments) [18:41:55.956] } [18:41:55.956] Lazy evaluation: FALSE [18:41:55.956] Asynchronous evaluation: TRUE [18:41:55.956] Local evaluation: TRUE [18:41:55.956] Environment: R_GlobalEnv [18:41:55.956] Capture standard output: TRUE [18:41:55.956] Capture condition classes: 'condition' (excluding 'nothing') [18:41:55.956] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:55.956] Packages: [18:41:55.956] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:55.956] Resolved: TRUE [18:41:55.956] Value: [18:41:55.956] Conditions captured: [18:41:55.956] Early signaling: FALSE [18:41:55.956] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:55.956] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.978] Chunk #1 of 2 ... DONE [18:41:55.978] Chunk #2 of 2 ... [18:41:55.978] - Finding globals in 'X' for chunk #2 ... [18:41:55.978] getGlobalsAndPackages() ... [18:41:55.979] Searching for globals... [18:41:55.979] [18:41:55.979] Searching for globals ... DONE [18:41:55.979] - globals: [0] [18:41:55.979] getGlobalsAndPackages() ... DONE [18:41:55.980] + additional globals found: [n=0] [18:41:55.980] + additional namespaces needed: [n=0] [18:41:55.980] - Finding globals in 'X' for chunk #2 ... DONE [18:41:55.980] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:55.980] - seeds: [18:41:55.980] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.980] getGlobalsAndPackages() ... [18:41:55.981] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.981] Resolving globals: FALSE [18:41:55.981] Tweak future expression to call with '...' arguments ... [18:41:55.981] { [18:41:55.981] do.call(function(...) { [18:41:55.981] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:55.981] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:55.981] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:55.981] on.exit(options(oopts), add = TRUE) [18:41:55.981] } [18:41:55.981] { [18:41:55.981] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:55.981] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:55.981] ...future.FUN(...future.X_jj, ...) [18:41:55.981] }) [18:41:55.981] } [18:41:55.981] }, args = future.call.arguments) [18:41:55.981] } [18:41:55.982] Tweak future expression to call with '...' arguments ... DONE [18:41:55.982] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:55.982] [18:41:55.982] getGlobalsAndPackages() ... DONE [18:41:55.983] run() for 'Future' ... [18:41:55.983] - state: 'created' [18:41:55.983] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:55.999] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:55.999] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:55.999] - Field: 'node' [18:41:55.999] - Field: 'label' [18:41:56.000] - Field: 'local' [18:41:56.000] - Field: 'owner' [18:41:56.000] - Field: 'envir' [18:41:56.000] - Field: 'workers' [18:41:56.000] - Field: 'packages' [18:41:56.000] - Field: 'gc' [18:41:56.001] - Field: 'conditions' [18:41:56.001] - Field: 'persistent' [18:41:56.001] - Field: 'expr' [18:41:56.001] - Field: 'uuid' [18:41:56.001] - Field: 'seed' [18:41:56.005] - Field: 'version' [18:41:56.006] - Field: 'result' [18:41:56.006] - Field: 'asynchronous' [18:41:56.006] - Field: 'calls' [18:41:56.006] - Field: 'globals' [18:41:56.006] - Field: 'stdout' [18:41:56.007] - Field: 'earlySignal' [18:41:56.007] - Field: 'lazy' [18:41:56.007] - Field: 'state' [18:41:56.007] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.007] - Launch lazy future ... [18:41:56.008] Packages needed by the future expression (n = 0): [18:41:56.008] Packages needed by future strategies (n = 0): [18:41:56.008] { [18:41:56.008] { [18:41:56.008] { [18:41:56.008] ...future.startTime <- base::Sys.time() [18:41:56.008] { [18:41:56.008] { [18:41:56.008] { [18:41:56.008] { [18:41:56.008] base::local({ [18:41:56.008] has_future <- base::requireNamespace("future", [18:41:56.008] quietly = TRUE) [18:41:56.008] if (has_future) { [18:41:56.008] ns <- base::getNamespace("future") [18:41:56.008] version <- ns[[".package"]][["version"]] [18:41:56.008] if (is.null(version)) [18:41:56.008] version <- utils::packageVersion("future") [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] version <- NULL [18:41:56.008] } [18:41:56.008] if (!has_future || version < "1.8.0") { [18:41:56.008] info <- base::c(r_version = base::gsub("R version ", [18:41:56.008] "", base::R.version$version.string), [18:41:56.008] platform = base::sprintf("%s (%s-bit)", [18:41:56.008] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.008] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.008] "release", "version")], collapse = " "), [18:41:56.008] hostname = base::Sys.info()[["nodename"]]) [18:41:56.008] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.008] info) [18:41:56.008] info <- base::paste(info, collapse = "; ") [18:41:56.008] if (!has_future) { [18:41:56.008] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.008] info) [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.008] info, version) [18:41:56.008] } [18:41:56.008] base::stop(msg) [18:41:56.008] } [18:41:56.008] }) [18:41:56.008] } [18:41:56.008] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.008] base::options(mc.cores = 1L) [18:41:56.008] } [18:41:56.008] ...future.strategy.old <- future::plan("list") [18:41:56.008] options(future.plan = NULL) [18:41:56.008] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.008] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.008] } [18:41:56.008] ...future.workdir <- getwd() [18:41:56.008] } [18:41:56.008] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.008] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.008] } [18:41:56.008] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.008] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.008] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.008] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.008] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.008] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.008] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.008] base::names(...future.oldOptions)) [18:41:56.008] } [18:41:56.008] if (FALSE) { [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] if (TRUE) { [18:41:56.008] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.008] open = "w") [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.008] windows = "NUL", "/dev/null"), open = "w") [18:41:56.008] } [18:41:56.008] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.008] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.008] base::sink(type = "output", split = FALSE) [18:41:56.008] base::close(...future.stdout) [18:41:56.008] }, add = TRUE) [18:41:56.008] } [18:41:56.008] ...future.frame <- base::sys.nframe() [18:41:56.008] ...future.conditions <- base::list() [18:41:56.008] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.008] if (FALSE) { [18:41:56.008] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.008] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.008] } [18:41:56.008] ...future.result <- base::tryCatch({ [18:41:56.008] base::withCallingHandlers({ [18:41:56.008] ...future.value <- base::withVisible(base::local({ [18:41:56.008] ...future.makeSendCondition <- base::local({ [18:41:56.008] sendCondition <- NULL [18:41:56.008] function(frame = 1L) { [18:41:56.008] if (is.function(sendCondition)) [18:41:56.008] return(sendCondition) [18:41:56.008] ns <- getNamespace("parallel") [18:41:56.008] if (exists("sendData", mode = "function", [18:41:56.008] envir = ns)) { [18:41:56.008] parallel_sendData <- get("sendData", mode = "function", [18:41:56.008] envir = ns) [18:41:56.008] envir <- sys.frame(frame) [18:41:56.008] master <- NULL [18:41:56.008] while (!identical(envir, .GlobalEnv) && [18:41:56.008] !identical(envir, emptyenv())) { [18:41:56.008] if (exists("master", mode = "list", envir = envir, [18:41:56.008] inherits = FALSE)) { [18:41:56.008] master <- get("master", mode = "list", [18:41:56.008] envir = envir, inherits = FALSE) [18:41:56.008] if (inherits(master, c("SOCKnode", [18:41:56.008] "SOCK0node"))) { [18:41:56.008] sendCondition <<- function(cond) { [18:41:56.008] data <- list(type = "VALUE", value = cond, [18:41:56.008] success = TRUE) [18:41:56.008] parallel_sendData(master, data) [18:41:56.008] } [18:41:56.008] return(sendCondition) [18:41:56.008] } [18:41:56.008] } [18:41:56.008] frame <- frame + 1L [18:41:56.008] envir <- sys.frame(frame) [18:41:56.008] } [18:41:56.008] } [18:41:56.008] sendCondition <<- function(cond) NULL [18:41:56.008] } [18:41:56.008] }) [18:41:56.008] withCallingHandlers({ [18:41:56.008] { [18:41:56.008] do.call(function(...) { [18:41:56.008] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.008] if (!identical(...future.globals.maxSize.org, [18:41:56.008] ...future.globals.maxSize)) { [18:41:56.008] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.008] on.exit(options(oopts), add = TRUE) [18:41:56.008] } [18:41:56.008] { [18:41:56.008] lapply(seq_along(...future.elements_ii), [18:41:56.008] FUN = function(jj) { [18:41:56.008] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.008] ...future.FUN(...future.X_jj, ...) [18:41:56.008] }) [18:41:56.008] } [18:41:56.008] }, args = future.call.arguments) [18:41:56.008] } [18:41:56.008] }, immediateCondition = function(cond) { [18:41:56.008] sendCondition <- ...future.makeSendCondition() [18:41:56.008] sendCondition(cond) [18:41:56.008] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.008] { [18:41:56.008] inherits <- base::inherits [18:41:56.008] invokeRestart <- base::invokeRestart [18:41:56.008] is.null <- base::is.null [18:41:56.008] muffled <- FALSE [18:41:56.008] if (inherits(cond, "message")) { [18:41:56.008] muffled <- grepl(pattern, "muffleMessage") [18:41:56.008] if (muffled) [18:41:56.008] invokeRestart("muffleMessage") [18:41:56.008] } [18:41:56.008] else if (inherits(cond, "warning")) { [18:41:56.008] muffled <- grepl(pattern, "muffleWarning") [18:41:56.008] if (muffled) [18:41:56.008] invokeRestart("muffleWarning") [18:41:56.008] } [18:41:56.008] else if (inherits(cond, "condition")) { [18:41:56.008] if (!is.null(pattern)) { [18:41:56.008] computeRestarts <- base::computeRestarts [18:41:56.008] grepl <- base::grepl [18:41:56.008] restarts <- computeRestarts(cond) [18:41:56.008] for (restart in restarts) { [18:41:56.008] name <- restart$name [18:41:56.008] if (is.null(name)) [18:41:56.008] next [18:41:56.008] if (!grepl(pattern, name)) [18:41:56.008] next [18:41:56.008] invokeRestart(restart) [18:41:56.008] muffled <- TRUE [18:41:56.008] break [18:41:56.008] } [18:41:56.008] } [18:41:56.008] } [18:41:56.008] invisible(muffled) [18:41:56.008] } [18:41:56.008] muffleCondition(cond) [18:41:56.008] }) [18:41:56.008] })) [18:41:56.008] future::FutureResult(value = ...future.value$value, [18:41:56.008] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.008] ...future.rng), globalenv = if (FALSE) [18:41:56.008] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.008] ...future.globalenv.names)) [18:41:56.008] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.008] }, condition = base::local({ [18:41:56.008] c <- base::c [18:41:56.008] inherits <- base::inherits [18:41:56.008] invokeRestart <- base::invokeRestart [18:41:56.008] length <- base::length [18:41:56.008] list <- base::list [18:41:56.008] seq.int <- base::seq.int [18:41:56.008] signalCondition <- base::signalCondition [18:41:56.008] sys.calls <- base::sys.calls [18:41:56.008] `[[` <- base::`[[` [18:41:56.008] `+` <- base::`+` [18:41:56.008] `<<-` <- base::`<<-` [18:41:56.008] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.008] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.008] 3L)] [18:41:56.008] } [18:41:56.008] function(cond) { [18:41:56.008] is_error <- inherits(cond, "error") [18:41:56.008] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.008] NULL) [18:41:56.008] if (is_error) { [18:41:56.008] sessionInformation <- function() { [18:41:56.008] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.008] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.008] search = base::search(), system = base::Sys.info()) [18:41:56.008] } [18:41:56.008] ...future.conditions[[length(...future.conditions) + [18:41:56.008] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.008] cond$call), session = sessionInformation(), [18:41:56.008] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.008] signalCondition(cond) [18:41:56.008] } [18:41:56.008] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.008] "immediateCondition"))) { [18:41:56.008] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.008] ...future.conditions[[length(...future.conditions) + [18:41:56.008] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.008] if (TRUE && !signal) { [18:41:56.008] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.008] { [18:41:56.008] inherits <- base::inherits [18:41:56.008] invokeRestart <- base::invokeRestart [18:41:56.008] is.null <- base::is.null [18:41:56.008] muffled <- FALSE [18:41:56.008] if (inherits(cond, "message")) { [18:41:56.008] muffled <- grepl(pattern, "muffleMessage") [18:41:56.008] if (muffled) [18:41:56.008] invokeRestart("muffleMessage") [18:41:56.008] } [18:41:56.008] else if (inherits(cond, "warning")) { [18:41:56.008] muffled <- grepl(pattern, "muffleWarning") [18:41:56.008] if (muffled) [18:41:56.008] invokeRestart("muffleWarning") [18:41:56.008] } [18:41:56.008] else if (inherits(cond, "condition")) { [18:41:56.008] if (!is.null(pattern)) { [18:41:56.008] computeRestarts <- base::computeRestarts [18:41:56.008] grepl <- base::grepl [18:41:56.008] restarts <- computeRestarts(cond) [18:41:56.008] for (restart in restarts) { [18:41:56.008] name <- restart$name [18:41:56.008] if (is.null(name)) [18:41:56.008] next [18:41:56.008] if (!grepl(pattern, name)) [18:41:56.008] next [18:41:56.008] invokeRestart(restart) [18:41:56.008] muffled <- TRUE [18:41:56.008] break [18:41:56.008] } [18:41:56.008] } [18:41:56.008] } [18:41:56.008] invisible(muffled) [18:41:56.008] } [18:41:56.008] muffleCondition(cond, pattern = "^muffle") [18:41:56.008] } [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] if (TRUE) { [18:41:56.008] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.008] { [18:41:56.008] inherits <- base::inherits [18:41:56.008] invokeRestart <- base::invokeRestart [18:41:56.008] is.null <- base::is.null [18:41:56.008] muffled <- FALSE [18:41:56.008] if (inherits(cond, "message")) { [18:41:56.008] muffled <- grepl(pattern, "muffleMessage") [18:41:56.008] if (muffled) [18:41:56.008] invokeRestart("muffleMessage") [18:41:56.008] } [18:41:56.008] else if (inherits(cond, "warning")) { [18:41:56.008] muffled <- grepl(pattern, "muffleWarning") [18:41:56.008] if (muffled) [18:41:56.008] invokeRestart("muffleWarning") [18:41:56.008] } [18:41:56.008] else if (inherits(cond, "condition")) { [18:41:56.008] if (!is.null(pattern)) { [18:41:56.008] computeRestarts <- base::computeRestarts [18:41:56.008] grepl <- base::grepl [18:41:56.008] restarts <- computeRestarts(cond) [18:41:56.008] for (restart in restarts) { [18:41:56.008] name <- restart$name [18:41:56.008] if (is.null(name)) [18:41:56.008] next [18:41:56.008] if (!grepl(pattern, name)) [18:41:56.008] next [18:41:56.008] invokeRestart(restart) [18:41:56.008] muffled <- TRUE [18:41:56.008] break [18:41:56.008] } [18:41:56.008] } [18:41:56.008] } [18:41:56.008] invisible(muffled) [18:41:56.008] } [18:41:56.008] muffleCondition(cond, pattern = "^muffle") [18:41:56.008] } [18:41:56.008] } [18:41:56.008] } [18:41:56.008] })) [18:41:56.008] }, error = function(ex) { [18:41:56.008] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.008] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.008] ...future.rng), started = ...future.startTime, [18:41:56.008] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.008] version = "1.8"), class = "FutureResult") [18:41:56.008] }, finally = { [18:41:56.008] if (!identical(...future.workdir, getwd())) [18:41:56.008] setwd(...future.workdir) [18:41:56.008] { [18:41:56.008] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.008] ...future.oldOptions$nwarnings <- NULL [18:41:56.008] } [18:41:56.008] base::options(...future.oldOptions) [18:41:56.008] if (.Platform$OS.type == "windows") { [18:41:56.008] old_names <- names(...future.oldEnvVars) [18:41:56.008] envs <- base::Sys.getenv() [18:41:56.008] names <- names(envs) [18:41:56.008] common <- intersect(names, old_names) [18:41:56.008] added <- setdiff(names, old_names) [18:41:56.008] removed <- setdiff(old_names, names) [18:41:56.008] changed <- common[...future.oldEnvVars[common] != [18:41:56.008] envs[common]] [18:41:56.008] NAMES <- toupper(changed) [18:41:56.008] args <- list() [18:41:56.008] for (kk in seq_along(NAMES)) { [18:41:56.008] name <- changed[[kk]] [18:41:56.008] NAME <- NAMES[[kk]] [18:41:56.008] if (name != NAME && is.element(NAME, old_names)) [18:41:56.008] next [18:41:56.008] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.008] } [18:41:56.008] NAMES <- toupper(added) [18:41:56.008] for (kk in seq_along(NAMES)) { [18:41:56.008] name <- added[[kk]] [18:41:56.008] NAME <- NAMES[[kk]] [18:41:56.008] if (name != NAME && is.element(NAME, old_names)) [18:41:56.008] next [18:41:56.008] args[[name]] <- "" [18:41:56.008] } [18:41:56.008] NAMES <- toupper(removed) [18:41:56.008] for (kk in seq_along(NAMES)) { [18:41:56.008] name <- removed[[kk]] [18:41:56.008] NAME <- NAMES[[kk]] [18:41:56.008] if (name != NAME && is.element(NAME, old_names)) [18:41:56.008] next [18:41:56.008] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.008] } [18:41:56.008] if (length(args) > 0) [18:41:56.008] base::do.call(base::Sys.setenv, args = args) [18:41:56.008] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.008] } [18:41:56.008] { [18:41:56.008] if (base::length(...future.futureOptionsAdded) > [18:41:56.008] 0L) { [18:41:56.008] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.008] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.008] base::options(opts) [18:41:56.008] } [18:41:56.008] { [18:41:56.008] { [18:41:56.008] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.008] NULL [18:41:56.008] } [18:41:56.008] options(future.plan = NULL) [18:41:56.008] if (is.na(NA_character_)) [18:41:56.008] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.008] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.008] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.008] .init = FALSE) [18:41:56.008] } [18:41:56.008] } [18:41:56.008] } [18:41:56.008] }) [18:41:56.008] if (TRUE) { [18:41:56.008] base::sink(type = "output", split = FALSE) [18:41:56.008] if (TRUE) { [18:41:56.008] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.008] } [18:41:56.008] else { [18:41:56.008] ...future.result["stdout"] <- base::list(NULL) [18:41:56.008] } [18:41:56.008] base::close(...future.stdout) [18:41:56.008] ...future.stdout <- NULL [18:41:56.008] } [18:41:56.008] ...future.result$conditions <- ...future.conditions [18:41:56.008] ...future.result$finished <- base::Sys.time() [18:41:56.008] ...future.result [18:41:56.008] } [18:41:56.013] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:56.014] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:56.014] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:56.014] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.015] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.015] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.015] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.016] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.016] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.016] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.017] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.017] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:56.017] MultisessionFuture started [18:41:56.018] - Launch lazy future ... done [18:41:56.018] run() for 'MultisessionFuture' ... done [18:41:56.018] Created future: [18:41:56.033] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.033] - Validating connection of MultisessionFuture [18:41:56.034] - received message: FutureResult [18:41:56.034] - Received FutureResult [18:41:56.034] - Erased future from FutureRegistry [18:41:56.034] result() for ClusterFuture ... [18:41:56.034] - result already collected: FutureResult [18:41:56.034] result() for ClusterFuture ... done [18:41:56.035] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.018] MultisessionFuture: [18:41:56.018] Label: 'future_sapply-2' [18:41:56.018] Expression: [18:41:56.018] { [18:41:56.018] do.call(function(...) { [18:41:56.018] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.018] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.018] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.018] on.exit(options(oopts), add = TRUE) [18:41:56.018] } [18:41:56.018] { [18:41:56.018] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.018] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.018] ...future.FUN(...future.X_jj, ...) [18:41:56.018] }) [18:41:56.018] } [18:41:56.018] }, args = future.call.arguments) [18:41:56.018] } [18:41:56.018] Lazy evaluation: FALSE [18:41:56.018] Asynchronous evaluation: TRUE [18:41:56.018] Local evaluation: TRUE [18:41:56.018] Environment: R_GlobalEnv [18:41:56.018] Capture standard output: TRUE [18:41:56.018] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.018] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.018] Packages: [18:41:56.018] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.018] Resolved: TRUE [18:41:56.018] Value: [18:41:56.018] Conditions captured: [18:41:56.018] Early signaling: FALSE [18:41:56.018] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.018] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.035] Chunk #2 of 2 ... DONE [18:41:56.035] Launching 2 futures (chunks) ... DONE [18:41:56.035] Resolving 2 futures (chunks) ... [18:41:56.036] resolve() on list ... [18:41:56.036] recursive: 0 [18:41:56.036] length: 2 [18:41:56.036] [18:41:56.036] Future #1 [18:41:56.036] result() for ClusterFuture ... [18:41:56.037] - result already collected: FutureResult [18:41:56.037] result() for ClusterFuture ... done [18:41:56.037] result() for ClusterFuture ... [18:41:56.037] - result already collected: FutureResult [18:41:56.037] result() for ClusterFuture ... done [18:41:56.037] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.038] - nx: 2 [18:41:56.038] - relay: TRUE [18:41:56.038] - stdout: TRUE [18:41:56.038] - signal: TRUE [18:41:56.038] - resignal: FALSE [18:41:56.038] - force: TRUE [18:41:56.038] - relayed: [n=2] FALSE, FALSE [18:41:56.039] - queued futures: [n=2] FALSE, FALSE [18:41:56.039] - until=1 [18:41:56.039] - relaying element #1 [18:41:56.039] result() for ClusterFuture ... [18:41:56.039] - result already collected: FutureResult [18:41:56.039] result() for ClusterFuture ... done [18:41:56.040] result() for ClusterFuture ... [18:41:56.040] - result already collected: FutureResult [18:41:56.040] result() for ClusterFuture ... done [18:41:56.040] result() for ClusterFuture ... [18:41:56.040] - result already collected: FutureResult [18:41:56.040] result() for ClusterFuture ... done [18:41:56.041] result() for ClusterFuture ... [18:41:56.041] - result already collected: FutureResult [18:41:56.041] result() for ClusterFuture ... done [18:41:56.041] - relayed: [n=2] TRUE, FALSE [18:41:56.041] - queued futures: [n=2] TRUE, FALSE [18:41:56.041] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.041] length: 1 (resolved future 1) [18:41:56.042] Future #2 [18:41:56.042] result() for ClusterFuture ... [18:41:56.042] - result already collected: FutureResult [18:41:56.042] result() for ClusterFuture ... done [18:41:56.042] result() for ClusterFuture ... [18:41:56.042] - result already collected: FutureResult [18:41:56.043] result() for ClusterFuture ... done [18:41:56.043] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.043] - nx: 2 [18:41:56.043] - relay: TRUE [18:41:56.043] - stdout: TRUE [18:41:56.043] - signal: TRUE [18:41:56.043] - resignal: FALSE [18:41:56.044] - force: TRUE [18:41:56.044] - relayed: [n=2] TRUE, FALSE [18:41:56.044] - queued futures: [n=2] TRUE, FALSE [18:41:56.044] - until=2 [18:41:56.044] - relaying element #2 [18:41:56.044] result() for ClusterFuture ... [18:41:56.045] - result already collected: FutureResult [18:41:56.045] result() for ClusterFuture ... done [18:41:56.045] result() for ClusterFuture ... [18:41:56.045] - result already collected: FutureResult [18:41:56.045] result() for ClusterFuture ... done [18:41:56.045] result() for ClusterFuture ... [18:41:56.046] - result already collected: FutureResult [18:41:56.046] result() for ClusterFuture ... done [18:41:56.046] result() for ClusterFuture ... [18:41:56.046] - result already collected: FutureResult [18:41:56.046] result() for ClusterFuture ... done [18:41:56.046] - relayed: [n=2] TRUE, TRUE [18:41:56.046] - queued futures: [n=2] TRUE, TRUE [18:41:56.047] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.047] length: 0 (resolved future 2) [18:41:56.047] Relaying remaining futures [18:41:56.047] signalConditionsASAP(NULL, pos=0) ... [18:41:56.047] - nx: 2 [18:41:56.047] - relay: TRUE [18:41:56.048] - stdout: TRUE [18:41:56.048] - signal: TRUE [18:41:56.048] - resignal: FALSE [18:41:56.048] - force: TRUE [18:41:56.048] - relayed: [n=2] TRUE, TRUE [18:41:56.048] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.049] - relayed: [n=2] TRUE, TRUE [18:41:56.049] - queued futures: [n=2] TRUE, TRUE [18:41:56.049] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.049] resolve() on list ... DONE [18:41:56.049] result() for ClusterFuture ... [18:41:56.049] - result already collected: FutureResult [18:41:56.049] result() for ClusterFuture ... done [18:41:56.050] result() for ClusterFuture ... [18:41:56.050] - result already collected: FutureResult [18:41:56.050] result() for ClusterFuture ... done [18:41:56.050] result() for ClusterFuture ... [18:41:56.050] - result already collected: FutureResult [18:41:56.050] result() for ClusterFuture ... done [18:41:56.051] result() for ClusterFuture ... [18:41:56.051] - result already collected: FutureResult [18:41:56.051] result() for ClusterFuture ... done [18:41:56.051] - Number of value chunks collected: 2 [18:41:56.051] Resolving 2 futures (chunks) ... DONE [18:41:56.051] Reducing values from 2 chunks ... [18:41:56.051] - Number of values collected after concatenation: 4 [18:41:56.052] - Number of values expected: 4 [18:41:56.052] Reducing values from 2 chunks ... DONE [18:41:56.052] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:56.054] future_lapply() ... [18:41:56.057] Number of chunks: 2 [18:41:56.057] getGlobalsAndPackagesXApply() ... [18:41:56.058] - future.globals: TRUE [18:41:56.058] getGlobalsAndPackages() ... [18:41:56.058] Searching for globals... [18:41:56.060] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:56.060] Searching for globals ... DONE [18:41:56.060] Resolving globals: FALSE [18:41:56.061] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:56.061] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:56.061] - globals: [1] 'FUN' [18:41:56.061] [18:41:56.062] getGlobalsAndPackages() ... DONE [18:41:56.062] - globals found/used: [n=1] 'FUN' [18:41:56.062] - needed namespaces: [n=0] [18:41:56.062] Finding globals ... DONE [18:41:56.062] - use_args: TRUE [18:41:56.062] - Getting '...' globals ... [18:41:56.063] resolve() on list ... [18:41:56.063] recursive: 0 [18:41:56.063] length: 1 [18:41:56.063] elements: '...' [18:41:56.064] length: 0 (resolved future 1) [18:41:56.064] resolve() on list ... DONE [18:41:56.064] - '...' content: [n=0] [18:41:56.064] List of 1 [18:41:56.064] $ ...: list() [18:41:56.064] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.064] - attr(*, "where")=List of 1 [18:41:56.064] ..$ ...: [18:41:56.064] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.064] - attr(*, "resolved")= logi TRUE [18:41:56.064] - attr(*, "total_size")= num NA [18:41:56.067] - Getting '...' globals ... DONE [18:41:56.067] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.067] List of 2 [18:41:56.067] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:56.067] $ ... : list() [18:41:56.067] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.067] - attr(*, "where")=List of 2 [18:41:56.067] ..$ ...future.FUN: [18:41:56.067] ..$ ... : [18:41:56.067] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.067] - attr(*, "resolved")= logi FALSE [18:41:56.067] - attr(*, "total_size")= int 6632 [18:41:56.071] Packages to be attached in all futures: [n=0] [18:41:56.071] getGlobalsAndPackagesXApply() ... DONE [18:41:56.071] Number of futures (= number of chunks): 2 [18:41:56.071] Launching 2 futures (chunks) ... [18:41:56.071] Chunk #1 of 2 ... [18:41:56.072] - Finding globals in 'X' for chunk #1 ... [18:41:56.072] getGlobalsAndPackages() ... [18:41:56.072] Searching for globals... [18:41:56.072] [18:41:56.072] Searching for globals ... DONE [18:41:56.073] - globals: [0] [18:41:56.073] getGlobalsAndPackages() ... DONE [18:41:56.073] + additional globals found: [n=0] [18:41:56.073] + additional namespaces needed: [n=0] [18:41:56.073] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.073] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.074] - seeds: [18:41:56.074] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.074] getGlobalsAndPackages() ... [18:41:56.074] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.074] Resolving globals: FALSE [18:41:56.074] Tweak future expression to call with '...' arguments ... [18:41:56.075] { [18:41:56.075] do.call(function(...) { [18:41:56.075] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.075] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.075] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.075] on.exit(options(oopts), add = TRUE) [18:41:56.075] } [18:41:56.075] { [18:41:56.075] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.075] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.075] ...future.FUN(...future.X_jj, ...) [18:41:56.075] }) [18:41:56.075] } [18:41:56.075] }, args = future.call.arguments) [18:41:56.075] } [18:41:56.075] Tweak future expression to call with '...' arguments ... DONE [18:41:56.076] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.076] [18:41:56.076] getGlobalsAndPackages() ... DONE [18:41:56.076] run() for 'Future' ... [18:41:56.076] - state: 'created' [18:41:56.077] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.091] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.092] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.092] - Field: 'node' [18:41:56.092] - Field: 'label' [18:41:56.092] - Field: 'local' [18:41:56.092] - Field: 'owner' [18:41:56.093] - Field: 'envir' [18:41:56.093] - Field: 'workers' [18:41:56.093] - Field: 'packages' [18:41:56.093] - Field: 'gc' [18:41:56.093] - Field: 'conditions' [18:41:56.093] - Field: 'persistent' [18:41:56.094] - Field: 'expr' [18:41:56.094] - Field: 'uuid' [18:41:56.094] - Field: 'seed' [18:41:56.094] - Field: 'version' [18:41:56.094] - Field: 'result' [18:41:56.094] - Field: 'asynchronous' [18:41:56.095] - Field: 'calls' [18:41:56.095] - Field: 'globals' [18:41:56.095] - Field: 'stdout' [18:41:56.095] - Field: 'earlySignal' [18:41:56.095] - Field: 'lazy' [18:41:56.096] - Field: 'state' [18:41:56.096] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.096] - Launch lazy future ... [18:41:56.096] Packages needed by the future expression (n = 0): [18:41:56.096] Packages needed by future strategies (n = 0): [18:41:56.097] { [18:41:56.097] { [18:41:56.097] { [18:41:56.097] ...future.startTime <- base::Sys.time() [18:41:56.097] { [18:41:56.097] { [18:41:56.097] { [18:41:56.097] { [18:41:56.097] base::local({ [18:41:56.097] has_future <- base::requireNamespace("future", [18:41:56.097] quietly = TRUE) [18:41:56.097] if (has_future) { [18:41:56.097] ns <- base::getNamespace("future") [18:41:56.097] version <- ns[[".package"]][["version"]] [18:41:56.097] if (is.null(version)) [18:41:56.097] version <- utils::packageVersion("future") [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] version <- NULL [18:41:56.097] } [18:41:56.097] if (!has_future || version < "1.8.0") { [18:41:56.097] info <- base::c(r_version = base::gsub("R version ", [18:41:56.097] "", base::R.version$version.string), [18:41:56.097] platform = base::sprintf("%s (%s-bit)", [18:41:56.097] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.097] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.097] "release", "version")], collapse = " "), [18:41:56.097] hostname = base::Sys.info()[["nodename"]]) [18:41:56.097] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.097] info) [18:41:56.097] info <- base::paste(info, collapse = "; ") [18:41:56.097] if (!has_future) { [18:41:56.097] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.097] info) [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.097] info, version) [18:41:56.097] } [18:41:56.097] base::stop(msg) [18:41:56.097] } [18:41:56.097] }) [18:41:56.097] } [18:41:56.097] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.097] base::options(mc.cores = 1L) [18:41:56.097] } [18:41:56.097] ...future.strategy.old <- future::plan("list") [18:41:56.097] options(future.plan = NULL) [18:41:56.097] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.097] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.097] } [18:41:56.097] ...future.workdir <- getwd() [18:41:56.097] } [18:41:56.097] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.097] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.097] } [18:41:56.097] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.097] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.097] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.097] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.097] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.097] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.097] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.097] base::names(...future.oldOptions)) [18:41:56.097] } [18:41:56.097] if (FALSE) { [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] if (TRUE) { [18:41:56.097] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.097] open = "w") [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.097] windows = "NUL", "/dev/null"), open = "w") [18:41:56.097] } [18:41:56.097] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.097] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.097] base::sink(type = "output", split = FALSE) [18:41:56.097] base::close(...future.stdout) [18:41:56.097] }, add = TRUE) [18:41:56.097] } [18:41:56.097] ...future.frame <- base::sys.nframe() [18:41:56.097] ...future.conditions <- base::list() [18:41:56.097] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.097] if (FALSE) { [18:41:56.097] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.097] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.097] } [18:41:56.097] ...future.result <- base::tryCatch({ [18:41:56.097] base::withCallingHandlers({ [18:41:56.097] ...future.value <- base::withVisible(base::local({ [18:41:56.097] ...future.makeSendCondition <- base::local({ [18:41:56.097] sendCondition <- NULL [18:41:56.097] function(frame = 1L) { [18:41:56.097] if (is.function(sendCondition)) [18:41:56.097] return(sendCondition) [18:41:56.097] ns <- getNamespace("parallel") [18:41:56.097] if (exists("sendData", mode = "function", [18:41:56.097] envir = ns)) { [18:41:56.097] parallel_sendData <- get("sendData", mode = "function", [18:41:56.097] envir = ns) [18:41:56.097] envir <- sys.frame(frame) [18:41:56.097] master <- NULL [18:41:56.097] while (!identical(envir, .GlobalEnv) && [18:41:56.097] !identical(envir, emptyenv())) { [18:41:56.097] if (exists("master", mode = "list", envir = envir, [18:41:56.097] inherits = FALSE)) { [18:41:56.097] master <- get("master", mode = "list", [18:41:56.097] envir = envir, inherits = FALSE) [18:41:56.097] if (inherits(master, c("SOCKnode", [18:41:56.097] "SOCK0node"))) { [18:41:56.097] sendCondition <<- function(cond) { [18:41:56.097] data <- list(type = "VALUE", value = cond, [18:41:56.097] success = TRUE) [18:41:56.097] parallel_sendData(master, data) [18:41:56.097] } [18:41:56.097] return(sendCondition) [18:41:56.097] } [18:41:56.097] } [18:41:56.097] frame <- frame + 1L [18:41:56.097] envir <- sys.frame(frame) [18:41:56.097] } [18:41:56.097] } [18:41:56.097] sendCondition <<- function(cond) NULL [18:41:56.097] } [18:41:56.097] }) [18:41:56.097] withCallingHandlers({ [18:41:56.097] { [18:41:56.097] do.call(function(...) { [18:41:56.097] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.097] if (!identical(...future.globals.maxSize.org, [18:41:56.097] ...future.globals.maxSize)) { [18:41:56.097] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.097] on.exit(options(oopts), add = TRUE) [18:41:56.097] } [18:41:56.097] { [18:41:56.097] lapply(seq_along(...future.elements_ii), [18:41:56.097] FUN = function(jj) { [18:41:56.097] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.097] ...future.FUN(...future.X_jj, ...) [18:41:56.097] }) [18:41:56.097] } [18:41:56.097] }, args = future.call.arguments) [18:41:56.097] } [18:41:56.097] }, immediateCondition = function(cond) { [18:41:56.097] sendCondition <- ...future.makeSendCondition() [18:41:56.097] sendCondition(cond) [18:41:56.097] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.097] { [18:41:56.097] inherits <- base::inherits [18:41:56.097] invokeRestart <- base::invokeRestart [18:41:56.097] is.null <- base::is.null [18:41:56.097] muffled <- FALSE [18:41:56.097] if (inherits(cond, "message")) { [18:41:56.097] muffled <- grepl(pattern, "muffleMessage") [18:41:56.097] if (muffled) [18:41:56.097] invokeRestart("muffleMessage") [18:41:56.097] } [18:41:56.097] else if (inherits(cond, "warning")) { [18:41:56.097] muffled <- grepl(pattern, "muffleWarning") [18:41:56.097] if (muffled) [18:41:56.097] invokeRestart("muffleWarning") [18:41:56.097] } [18:41:56.097] else if (inherits(cond, "condition")) { [18:41:56.097] if (!is.null(pattern)) { [18:41:56.097] computeRestarts <- base::computeRestarts [18:41:56.097] grepl <- base::grepl [18:41:56.097] restarts <- computeRestarts(cond) [18:41:56.097] for (restart in restarts) { [18:41:56.097] name <- restart$name [18:41:56.097] if (is.null(name)) [18:41:56.097] next [18:41:56.097] if (!grepl(pattern, name)) [18:41:56.097] next [18:41:56.097] invokeRestart(restart) [18:41:56.097] muffled <- TRUE [18:41:56.097] break [18:41:56.097] } [18:41:56.097] } [18:41:56.097] } [18:41:56.097] invisible(muffled) [18:41:56.097] } [18:41:56.097] muffleCondition(cond) [18:41:56.097] }) [18:41:56.097] })) [18:41:56.097] future::FutureResult(value = ...future.value$value, [18:41:56.097] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.097] ...future.rng), globalenv = if (FALSE) [18:41:56.097] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.097] ...future.globalenv.names)) [18:41:56.097] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.097] }, condition = base::local({ [18:41:56.097] c <- base::c [18:41:56.097] inherits <- base::inherits [18:41:56.097] invokeRestart <- base::invokeRestart [18:41:56.097] length <- base::length [18:41:56.097] list <- base::list [18:41:56.097] seq.int <- base::seq.int [18:41:56.097] signalCondition <- base::signalCondition [18:41:56.097] sys.calls <- base::sys.calls [18:41:56.097] `[[` <- base::`[[` [18:41:56.097] `+` <- base::`+` [18:41:56.097] `<<-` <- base::`<<-` [18:41:56.097] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.097] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.097] 3L)] [18:41:56.097] } [18:41:56.097] function(cond) { [18:41:56.097] is_error <- inherits(cond, "error") [18:41:56.097] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.097] NULL) [18:41:56.097] if (is_error) { [18:41:56.097] sessionInformation <- function() { [18:41:56.097] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.097] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.097] search = base::search(), system = base::Sys.info()) [18:41:56.097] } [18:41:56.097] ...future.conditions[[length(...future.conditions) + [18:41:56.097] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.097] cond$call), session = sessionInformation(), [18:41:56.097] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.097] signalCondition(cond) [18:41:56.097] } [18:41:56.097] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.097] "immediateCondition"))) { [18:41:56.097] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.097] ...future.conditions[[length(...future.conditions) + [18:41:56.097] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.097] if (TRUE && !signal) { [18:41:56.097] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.097] { [18:41:56.097] inherits <- base::inherits [18:41:56.097] invokeRestart <- base::invokeRestart [18:41:56.097] is.null <- base::is.null [18:41:56.097] muffled <- FALSE [18:41:56.097] if (inherits(cond, "message")) { [18:41:56.097] muffled <- grepl(pattern, "muffleMessage") [18:41:56.097] if (muffled) [18:41:56.097] invokeRestart("muffleMessage") [18:41:56.097] } [18:41:56.097] else if (inherits(cond, "warning")) { [18:41:56.097] muffled <- grepl(pattern, "muffleWarning") [18:41:56.097] if (muffled) [18:41:56.097] invokeRestart("muffleWarning") [18:41:56.097] } [18:41:56.097] else if (inherits(cond, "condition")) { [18:41:56.097] if (!is.null(pattern)) { [18:41:56.097] computeRestarts <- base::computeRestarts [18:41:56.097] grepl <- base::grepl [18:41:56.097] restarts <- computeRestarts(cond) [18:41:56.097] for (restart in restarts) { [18:41:56.097] name <- restart$name [18:41:56.097] if (is.null(name)) [18:41:56.097] next [18:41:56.097] if (!grepl(pattern, name)) [18:41:56.097] next [18:41:56.097] invokeRestart(restart) [18:41:56.097] muffled <- TRUE [18:41:56.097] break [18:41:56.097] } [18:41:56.097] } [18:41:56.097] } [18:41:56.097] invisible(muffled) [18:41:56.097] } [18:41:56.097] muffleCondition(cond, pattern = "^muffle") [18:41:56.097] } [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] if (TRUE) { [18:41:56.097] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.097] { [18:41:56.097] inherits <- base::inherits [18:41:56.097] invokeRestart <- base::invokeRestart [18:41:56.097] is.null <- base::is.null [18:41:56.097] muffled <- FALSE [18:41:56.097] if (inherits(cond, "message")) { [18:41:56.097] muffled <- grepl(pattern, "muffleMessage") [18:41:56.097] if (muffled) [18:41:56.097] invokeRestart("muffleMessage") [18:41:56.097] } [18:41:56.097] else if (inherits(cond, "warning")) { [18:41:56.097] muffled <- grepl(pattern, "muffleWarning") [18:41:56.097] if (muffled) [18:41:56.097] invokeRestart("muffleWarning") [18:41:56.097] } [18:41:56.097] else if (inherits(cond, "condition")) { [18:41:56.097] if (!is.null(pattern)) { [18:41:56.097] computeRestarts <- base::computeRestarts [18:41:56.097] grepl <- base::grepl [18:41:56.097] restarts <- computeRestarts(cond) [18:41:56.097] for (restart in restarts) { [18:41:56.097] name <- restart$name [18:41:56.097] if (is.null(name)) [18:41:56.097] next [18:41:56.097] if (!grepl(pattern, name)) [18:41:56.097] next [18:41:56.097] invokeRestart(restart) [18:41:56.097] muffled <- TRUE [18:41:56.097] break [18:41:56.097] } [18:41:56.097] } [18:41:56.097] } [18:41:56.097] invisible(muffled) [18:41:56.097] } [18:41:56.097] muffleCondition(cond, pattern = "^muffle") [18:41:56.097] } [18:41:56.097] } [18:41:56.097] } [18:41:56.097] })) [18:41:56.097] }, error = function(ex) { [18:41:56.097] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.097] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.097] ...future.rng), started = ...future.startTime, [18:41:56.097] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.097] version = "1.8"), class = "FutureResult") [18:41:56.097] }, finally = { [18:41:56.097] if (!identical(...future.workdir, getwd())) [18:41:56.097] setwd(...future.workdir) [18:41:56.097] { [18:41:56.097] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.097] ...future.oldOptions$nwarnings <- NULL [18:41:56.097] } [18:41:56.097] base::options(...future.oldOptions) [18:41:56.097] if (.Platform$OS.type == "windows") { [18:41:56.097] old_names <- names(...future.oldEnvVars) [18:41:56.097] envs <- base::Sys.getenv() [18:41:56.097] names <- names(envs) [18:41:56.097] common <- intersect(names, old_names) [18:41:56.097] added <- setdiff(names, old_names) [18:41:56.097] removed <- setdiff(old_names, names) [18:41:56.097] changed <- common[...future.oldEnvVars[common] != [18:41:56.097] envs[common]] [18:41:56.097] NAMES <- toupper(changed) [18:41:56.097] args <- list() [18:41:56.097] for (kk in seq_along(NAMES)) { [18:41:56.097] name <- changed[[kk]] [18:41:56.097] NAME <- NAMES[[kk]] [18:41:56.097] if (name != NAME && is.element(NAME, old_names)) [18:41:56.097] next [18:41:56.097] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.097] } [18:41:56.097] NAMES <- toupper(added) [18:41:56.097] for (kk in seq_along(NAMES)) { [18:41:56.097] name <- added[[kk]] [18:41:56.097] NAME <- NAMES[[kk]] [18:41:56.097] if (name != NAME && is.element(NAME, old_names)) [18:41:56.097] next [18:41:56.097] args[[name]] <- "" [18:41:56.097] } [18:41:56.097] NAMES <- toupper(removed) [18:41:56.097] for (kk in seq_along(NAMES)) { [18:41:56.097] name <- removed[[kk]] [18:41:56.097] NAME <- NAMES[[kk]] [18:41:56.097] if (name != NAME && is.element(NAME, old_names)) [18:41:56.097] next [18:41:56.097] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.097] } [18:41:56.097] if (length(args) > 0) [18:41:56.097] base::do.call(base::Sys.setenv, args = args) [18:41:56.097] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.097] } [18:41:56.097] { [18:41:56.097] if (base::length(...future.futureOptionsAdded) > [18:41:56.097] 0L) { [18:41:56.097] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.097] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.097] base::options(opts) [18:41:56.097] } [18:41:56.097] { [18:41:56.097] { [18:41:56.097] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.097] NULL [18:41:56.097] } [18:41:56.097] options(future.plan = NULL) [18:41:56.097] if (is.na(NA_character_)) [18:41:56.097] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.097] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.097] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.097] .init = FALSE) [18:41:56.097] } [18:41:56.097] } [18:41:56.097] } [18:41:56.097] }) [18:41:56.097] if (TRUE) { [18:41:56.097] base::sink(type = "output", split = FALSE) [18:41:56.097] if (TRUE) { [18:41:56.097] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.097] } [18:41:56.097] else { [18:41:56.097] ...future.result["stdout"] <- base::list(NULL) [18:41:56.097] } [18:41:56.097] base::close(...future.stdout) [18:41:56.097] ...future.stdout <- NULL [18:41:56.097] } [18:41:56.097] ...future.result$conditions <- ...future.conditions [18:41:56.097] ...future.result$finished <- base::Sys.time() [18:41:56.097] ...future.result [18:41:56.097] } [18:41:56.102] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:56.103] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:56.103] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:56.103] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.104] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.104] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.104] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.105] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.105] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.105] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.106] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.106] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:56.107] MultisessionFuture started [18:41:56.107] - Launch lazy future ... done [18:41:56.107] run() for 'MultisessionFuture' ... done [18:41:56.107] Created future: [18:41:56.122] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.123] - Validating connection of MultisessionFuture [18:41:56.123] - received message: FutureResult [18:41:56.123] - Received FutureResult [18:41:56.123] - Erased future from FutureRegistry [18:41:56.124] result() for ClusterFuture ... [18:41:56.124] - result already collected: FutureResult [18:41:56.124] result() for ClusterFuture ... done [18:41:56.124] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.107] MultisessionFuture: [18:41:56.107] Label: 'future_sapply-1' [18:41:56.107] Expression: [18:41:56.107] { [18:41:56.107] do.call(function(...) { [18:41:56.107] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.107] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.107] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.107] on.exit(options(oopts), add = TRUE) [18:41:56.107] } [18:41:56.107] { [18:41:56.107] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.107] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.107] ...future.FUN(...future.X_jj, ...) [18:41:56.107] }) [18:41:56.107] } [18:41:56.107] }, args = future.call.arguments) [18:41:56.107] } [18:41:56.107] Lazy evaluation: FALSE [18:41:56.107] Asynchronous evaluation: TRUE [18:41:56.107] Local evaluation: TRUE [18:41:56.107] Environment: R_GlobalEnv [18:41:56.107] Capture standard output: TRUE [18:41:56.107] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.107] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.107] Packages: [18:41:56.107] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.107] Resolved: TRUE [18:41:56.107] Value: [18:41:56.107] Conditions captured: [18:41:56.107] Early signaling: FALSE [18:41:56.107] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.107] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.125] Chunk #1 of 2 ... DONE [18:41:56.125] Chunk #2 of 2 ... [18:41:56.125] - Finding globals in 'X' for chunk #2 ... [18:41:56.125] getGlobalsAndPackages() ... [18:41:56.125] Searching for globals... [18:41:56.126] [18:41:56.126] Searching for globals ... DONE [18:41:56.126] - globals: [0] [18:41:56.126] getGlobalsAndPackages() ... DONE [18:41:56.126] + additional globals found: [n=0] [18:41:56.127] + additional namespaces needed: [n=0] [18:41:56.127] - Finding globals in 'X' for chunk #2 ... DONE [18:41:56.127] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.127] - seeds: [18:41:56.127] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.128] getGlobalsAndPackages() ... [18:41:56.128] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.128] Resolving globals: FALSE [18:41:56.128] Tweak future expression to call with '...' arguments ... [18:41:56.128] { [18:41:56.128] do.call(function(...) { [18:41:56.128] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.128] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.128] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.128] on.exit(options(oopts), add = TRUE) [18:41:56.128] } [18:41:56.128] { [18:41:56.128] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.128] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.128] ...future.FUN(...future.X_jj, ...) [18:41:56.128] }) [18:41:56.128] } [18:41:56.128] }, args = future.call.arguments) [18:41:56.128] } [18:41:56.129] Tweak future expression to call with '...' arguments ... DONE [18:41:56.129] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.130] [18:41:56.130] getGlobalsAndPackages() ... DONE [18:41:56.130] run() for 'Future' ... [18:41:56.130] - state: 'created' [18:41:56.130] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.146] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.146] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.146] - Field: 'node' [18:41:56.146] - Field: 'label' [18:41:56.147] - Field: 'local' [18:41:56.147] - Field: 'owner' [18:41:56.147] - Field: 'envir' [18:41:56.147] - Field: 'workers' [18:41:56.147] - Field: 'packages' [18:41:56.148] - Field: 'gc' [18:41:56.148] - Field: 'conditions' [18:41:56.148] - Field: 'persistent' [18:41:56.148] - Field: 'expr' [18:41:56.148] - Field: 'uuid' [18:41:56.148] - Field: 'seed' [18:41:56.149] - Field: 'version' [18:41:56.149] - Field: 'result' [18:41:56.149] - Field: 'asynchronous' [18:41:56.149] - Field: 'calls' [18:41:56.149] - Field: 'globals' [18:41:56.149] - Field: 'stdout' [18:41:56.150] - Field: 'earlySignal' [18:41:56.150] - Field: 'lazy' [18:41:56.150] - Field: 'state' [18:41:56.150] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.150] - Launch lazy future ... [18:41:56.151] Packages needed by the future expression (n = 0): [18:41:56.151] Packages needed by future strategies (n = 0): [18:41:56.151] { [18:41:56.151] { [18:41:56.151] { [18:41:56.151] ...future.startTime <- base::Sys.time() [18:41:56.151] { [18:41:56.151] { [18:41:56.151] { [18:41:56.151] { [18:41:56.151] base::local({ [18:41:56.151] has_future <- base::requireNamespace("future", [18:41:56.151] quietly = TRUE) [18:41:56.151] if (has_future) { [18:41:56.151] ns <- base::getNamespace("future") [18:41:56.151] version <- ns[[".package"]][["version"]] [18:41:56.151] if (is.null(version)) [18:41:56.151] version <- utils::packageVersion("future") [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] version <- NULL [18:41:56.151] } [18:41:56.151] if (!has_future || version < "1.8.0") { [18:41:56.151] info <- base::c(r_version = base::gsub("R version ", [18:41:56.151] "", base::R.version$version.string), [18:41:56.151] platform = base::sprintf("%s (%s-bit)", [18:41:56.151] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.151] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.151] "release", "version")], collapse = " "), [18:41:56.151] hostname = base::Sys.info()[["nodename"]]) [18:41:56.151] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.151] info) [18:41:56.151] info <- base::paste(info, collapse = "; ") [18:41:56.151] if (!has_future) { [18:41:56.151] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.151] info) [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.151] info, version) [18:41:56.151] } [18:41:56.151] base::stop(msg) [18:41:56.151] } [18:41:56.151] }) [18:41:56.151] } [18:41:56.151] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.151] base::options(mc.cores = 1L) [18:41:56.151] } [18:41:56.151] ...future.strategy.old <- future::plan("list") [18:41:56.151] options(future.plan = NULL) [18:41:56.151] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.151] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.151] } [18:41:56.151] ...future.workdir <- getwd() [18:41:56.151] } [18:41:56.151] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.151] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.151] } [18:41:56.151] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.151] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.151] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.151] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.151] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.151] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.151] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.151] base::names(...future.oldOptions)) [18:41:56.151] } [18:41:56.151] if (FALSE) { [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] if (TRUE) { [18:41:56.151] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.151] open = "w") [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.151] windows = "NUL", "/dev/null"), open = "w") [18:41:56.151] } [18:41:56.151] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.151] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.151] base::sink(type = "output", split = FALSE) [18:41:56.151] base::close(...future.stdout) [18:41:56.151] }, add = TRUE) [18:41:56.151] } [18:41:56.151] ...future.frame <- base::sys.nframe() [18:41:56.151] ...future.conditions <- base::list() [18:41:56.151] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.151] if (FALSE) { [18:41:56.151] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.151] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.151] } [18:41:56.151] ...future.result <- base::tryCatch({ [18:41:56.151] base::withCallingHandlers({ [18:41:56.151] ...future.value <- base::withVisible(base::local({ [18:41:56.151] ...future.makeSendCondition <- base::local({ [18:41:56.151] sendCondition <- NULL [18:41:56.151] function(frame = 1L) { [18:41:56.151] if (is.function(sendCondition)) [18:41:56.151] return(sendCondition) [18:41:56.151] ns <- getNamespace("parallel") [18:41:56.151] if (exists("sendData", mode = "function", [18:41:56.151] envir = ns)) { [18:41:56.151] parallel_sendData <- get("sendData", mode = "function", [18:41:56.151] envir = ns) [18:41:56.151] envir <- sys.frame(frame) [18:41:56.151] master <- NULL [18:41:56.151] while (!identical(envir, .GlobalEnv) && [18:41:56.151] !identical(envir, emptyenv())) { [18:41:56.151] if (exists("master", mode = "list", envir = envir, [18:41:56.151] inherits = FALSE)) { [18:41:56.151] master <- get("master", mode = "list", [18:41:56.151] envir = envir, inherits = FALSE) [18:41:56.151] if (inherits(master, c("SOCKnode", [18:41:56.151] "SOCK0node"))) { [18:41:56.151] sendCondition <<- function(cond) { [18:41:56.151] data <- list(type = "VALUE", value = cond, [18:41:56.151] success = TRUE) [18:41:56.151] parallel_sendData(master, data) [18:41:56.151] } [18:41:56.151] return(sendCondition) [18:41:56.151] } [18:41:56.151] } [18:41:56.151] frame <- frame + 1L [18:41:56.151] envir <- sys.frame(frame) [18:41:56.151] } [18:41:56.151] } [18:41:56.151] sendCondition <<- function(cond) NULL [18:41:56.151] } [18:41:56.151] }) [18:41:56.151] withCallingHandlers({ [18:41:56.151] { [18:41:56.151] do.call(function(...) { [18:41:56.151] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.151] if (!identical(...future.globals.maxSize.org, [18:41:56.151] ...future.globals.maxSize)) { [18:41:56.151] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.151] on.exit(options(oopts), add = TRUE) [18:41:56.151] } [18:41:56.151] { [18:41:56.151] lapply(seq_along(...future.elements_ii), [18:41:56.151] FUN = function(jj) { [18:41:56.151] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.151] ...future.FUN(...future.X_jj, ...) [18:41:56.151] }) [18:41:56.151] } [18:41:56.151] }, args = future.call.arguments) [18:41:56.151] } [18:41:56.151] }, immediateCondition = function(cond) { [18:41:56.151] sendCondition <- ...future.makeSendCondition() [18:41:56.151] sendCondition(cond) [18:41:56.151] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.151] { [18:41:56.151] inherits <- base::inherits [18:41:56.151] invokeRestart <- base::invokeRestart [18:41:56.151] is.null <- base::is.null [18:41:56.151] muffled <- FALSE [18:41:56.151] if (inherits(cond, "message")) { [18:41:56.151] muffled <- grepl(pattern, "muffleMessage") [18:41:56.151] if (muffled) [18:41:56.151] invokeRestart("muffleMessage") [18:41:56.151] } [18:41:56.151] else if (inherits(cond, "warning")) { [18:41:56.151] muffled <- grepl(pattern, "muffleWarning") [18:41:56.151] if (muffled) [18:41:56.151] invokeRestart("muffleWarning") [18:41:56.151] } [18:41:56.151] else if (inherits(cond, "condition")) { [18:41:56.151] if (!is.null(pattern)) { [18:41:56.151] computeRestarts <- base::computeRestarts [18:41:56.151] grepl <- base::grepl [18:41:56.151] restarts <- computeRestarts(cond) [18:41:56.151] for (restart in restarts) { [18:41:56.151] name <- restart$name [18:41:56.151] if (is.null(name)) [18:41:56.151] next [18:41:56.151] if (!grepl(pattern, name)) [18:41:56.151] next [18:41:56.151] invokeRestart(restart) [18:41:56.151] muffled <- TRUE [18:41:56.151] break [18:41:56.151] } [18:41:56.151] } [18:41:56.151] } [18:41:56.151] invisible(muffled) [18:41:56.151] } [18:41:56.151] muffleCondition(cond) [18:41:56.151] }) [18:41:56.151] })) [18:41:56.151] future::FutureResult(value = ...future.value$value, [18:41:56.151] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.151] ...future.rng), globalenv = if (FALSE) [18:41:56.151] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.151] ...future.globalenv.names)) [18:41:56.151] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.151] }, condition = base::local({ [18:41:56.151] c <- base::c [18:41:56.151] inherits <- base::inherits [18:41:56.151] invokeRestart <- base::invokeRestart [18:41:56.151] length <- base::length [18:41:56.151] list <- base::list [18:41:56.151] seq.int <- base::seq.int [18:41:56.151] signalCondition <- base::signalCondition [18:41:56.151] sys.calls <- base::sys.calls [18:41:56.151] `[[` <- base::`[[` [18:41:56.151] `+` <- base::`+` [18:41:56.151] `<<-` <- base::`<<-` [18:41:56.151] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.151] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.151] 3L)] [18:41:56.151] } [18:41:56.151] function(cond) { [18:41:56.151] is_error <- inherits(cond, "error") [18:41:56.151] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.151] NULL) [18:41:56.151] if (is_error) { [18:41:56.151] sessionInformation <- function() { [18:41:56.151] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.151] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.151] search = base::search(), system = base::Sys.info()) [18:41:56.151] } [18:41:56.151] ...future.conditions[[length(...future.conditions) + [18:41:56.151] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.151] cond$call), session = sessionInformation(), [18:41:56.151] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.151] signalCondition(cond) [18:41:56.151] } [18:41:56.151] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.151] "immediateCondition"))) { [18:41:56.151] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.151] ...future.conditions[[length(...future.conditions) + [18:41:56.151] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.151] if (TRUE && !signal) { [18:41:56.151] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.151] { [18:41:56.151] inherits <- base::inherits [18:41:56.151] invokeRestart <- base::invokeRestart [18:41:56.151] is.null <- base::is.null [18:41:56.151] muffled <- FALSE [18:41:56.151] if (inherits(cond, "message")) { [18:41:56.151] muffled <- grepl(pattern, "muffleMessage") [18:41:56.151] if (muffled) [18:41:56.151] invokeRestart("muffleMessage") [18:41:56.151] } [18:41:56.151] else if (inherits(cond, "warning")) { [18:41:56.151] muffled <- grepl(pattern, "muffleWarning") [18:41:56.151] if (muffled) [18:41:56.151] invokeRestart("muffleWarning") [18:41:56.151] } [18:41:56.151] else if (inherits(cond, "condition")) { [18:41:56.151] if (!is.null(pattern)) { [18:41:56.151] computeRestarts <- base::computeRestarts [18:41:56.151] grepl <- base::grepl [18:41:56.151] restarts <- computeRestarts(cond) [18:41:56.151] for (restart in restarts) { [18:41:56.151] name <- restart$name [18:41:56.151] if (is.null(name)) [18:41:56.151] next [18:41:56.151] if (!grepl(pattern, name)) [18:41:56.151] next [18:41:56.151] invokeRestart(restart) [18:41:56.151] muffled <- TRUE [18:41:56.151] break [18:41:56.151] } [18:41:56.151] } [18:41:56.151] } [18:41:56.151] invisible(muffled) [18:41:56.151] } [18:41:56.151] muffleCondition(cond, pattern = "^muffle") [18:41:56.151] } [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] if (TRUE) { [18:41:56.151] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.151] { [18:41:56.151] inherits <- base::inherits [18:41:56.151] invokeRestart <- base::invokeRestart [18:41:56.151] is.null <- base::is.null [18:41:56.151] muffled <- FALSE [18:41:56.151] if (inherits(cond, "message")) { [18:41:56.151] muffled <- grepl(pattern, "muffleMessage") [18:41:56.151] if (muffled) [18:41:56.151] invokeRestart("muffleMessage") [18:41:56.151] } [18:41:56.151] else if (inherits(cond, "warning")) { [18:41:56.151] muffled <- grepl(pattern, "muffleWarning") [18:41:56.151] if (muffled) [18:41:56.151] invokeRestart("muffleWarning") [18:41:56.151] } [18:41:56.151] else if (inherits(cond, "condition")) { [18:41:56.151] if (!is.null(pattern)) { [18:41:56.151] computeRestarts <- base::computeRestarts [18:41:56.151] grepl <- base::grepl [18:41:56.151] restarts <- computeRestarts(cond) [18:41:56.151] for (restart in restarts) { [18:41:56.151] name <- restart$name [18:41:56.151] if (is.null(name)) [18:41:56.151] next [18:41:56.151] if (!grepl(pattern, name)) [18:41:56.151] next [18:41:56.151] invokeRestart(restart) [18:41:56.151] muffled <- TRUE [18:41:56.151] break [18:41:56.151] } [18:41:56.151] } [18:41:56.151] } [18:41:56.151] invisible(muffled) [18:41:56.151] } [18:41:56.151] muffleCondition(cond, pattern = "^muffle") [18:41:56.151] } [18:41:56.151] } [18:41:56.151] } [18:41:56.151] })) [18:41:56.151] }, error = function(ex) { [18:41:56.151] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.151] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.151] ...future.rng), started = ...future.startTime, [18:41:56.151] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.151] version = "1.8"), class = "FutureResult") [18:41:56.151] }, finally = { [18:41:56.151] if (!identical(...future.workdir, getwd())) [18:41:56.151] setwd(...future.workdir) [18:41:56.151] { [18:41:56.151] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.151] ...future.oldOptions$nwarnings <- NULL [18:41:56.151] } [18:41:56.151] base::options(...future.oldOptions) [18:41:56.151] if (.Platform$OS.type == "windows") { [18:41:56.151] old_names <- names(...future.oldEnvVars) [18:41:56.151] envs <- base::Sys.getenv() [18:41:56.151] names <- names(envs) [18:41:56.151] common <- intersect(names, old_names) [18:41:56.151] added <- setdiff(names, old_names) [18:41:56.151] removed <- setdiff(old_names, names) [18:41:56.151] changed <- common[...future.oldEnvVars[common] != [18:41:56.151] envs[common]] [18:41:56.151] NAMES <- toupper(changed) [18:41:56.151] args <- list() [18:41:56.151] for (kk in seq_along(NAMES)) { [18:41:56.151] name <- changed[[kk]] [18:41:56.151] NAME <- NAMES[[kk]] [18:41:56.151] if (name != NAME && is.element(NAME, old_names)) [18:41:56.151] next [18:41:56.151] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.151] } [18:41:56.151] NAMES <- toupper(added) [18:41:56.151] for (kk in seq_along(NAMES)) { [18:41:56.151] name <- added[[kk]] [18:41:56.151] NAME <- NAMES[[kk]] [18:41:56.151] if (name != NAME && is.element(NAME, old_names)) [18:41:56.151] next [18:41:56.151] args[[name]] <- "" [18:41:56.151] } [18:41:56.151] NAMES <- toupper(removed) [18:41:56.151] for (kk in seq_along(NAMES)) { [18:41:56.151] name <- removed[[kk]] [18:41:56.151] NAME <- NAMES[[kk]] [18:41:56.151] if (name != NAME && is.element(NAME, old_names)) [18:41:56.151] next [18:41:56.151] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.151] } [18:41:56.151] if (length(args) > 0) [18:41:56.151] base::do.call(base::Sys.setenv, args = args) [18:41:56.151] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.151] } [18:41:56.151] { [18:41:56.151] if (base::length(...future.futureOptionsAdded) > [18:41:56.151] 0L) { [18:41:56.151] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.151] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.151] base::options(opts) [18:41:56.151] } [18:41:56.151] { [18:41:56.151] { [18:41:56.151] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.151] NULL [18:41:56.151] } [18:41:56.151] options(future.plan = NULL) [18:41:56.151] if (is.na(NA_character_)) [18:41:56.151] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.151] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.151] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.151] .init = FALSE) [18:41:56.151] } [18:41:56.151] } [18:41:56.151] } [18:41:56.151] }) [18:41:56.151] if (TRUE) { [18:41:56.151] base::sink(type = "output", split = FALSE) [18:41:56.151] if (TRUE) { [18:41:56.151] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.151] } [18:41:56.151] else { [18:41:56.151] ...future.result["stdout"] <- base::list(NULL) [18:41:56.151] } [18:41:56.151] base::close(...future.stdout) [18:41:56.151] ...future.stdout <- NULL [18:41:56.151] } [18:41:56.151] ...future.result$conditions <- ...future.conditions [18:41:56.151] ...future.result$finished <- base::Sys.time() [18:41:56.151] ...future.result [18:41:56.151] } [18:41:56.157] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:56.157] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:56.157] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:56.158] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.158] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.158] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.159] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.159] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.159] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.159] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.160] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.160] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:56.161] MultisessionFuture started [18:41:56.161] - Launch lazy future ... done [18:41:56.161] run() for 'MultisessionFuture' ... done [18:41:56.161] Created future: [18:41:56.175] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.175] - Validating connection of MultisessionFuture [18:41:56.176] - received message: FutureResult [18:41:56.176] - Received FutureResult [18:41:56.176] - Erased future from FutureRegistry [18:41:56.176] result() for ClusterFuture ... [18:41:56.176] - result already collected: FutureResult [18:41:56.177] result() for ClusterFuture ... done [18:41:56.177] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.162] MultisessionFuture: [18:41:56.162] Label: 'future_sapply-2' [18:41:56.162] Expression: [18:41:56.162] { [18:41:56.162] do.call(function(...) { [18:41:56.162] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.162] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.162] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.162] on.exit(options(oopts), add = TRUE) [18:41:56.162] } [18:41:56.162] { [18:41:56.162] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.162] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.162] ...future.FUN(...future.X_jj, ...) [18:41:56.162] }) [18:41:56.162] } [18:41:56.162] }, args = future.call.arguments) [18:41:56.162] } [18:41:56.162] Lazy evaluation: FALSE [18:41:56.162] Asynchronous evaluation: TRUE [18:41:56.162] Local evaluation: TRUE [18:41:56.162] Environment: R_GlobalEnv [18:41:56.162] Capture standard output: TRUE [18:41:56.162] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.162] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.162] Packages: [18:41:56.162] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.162] Resolved: TRUE [18:41:56.162] Value: [18:41:56.162] Conditions captured: [18:41:56.162] Early signaling: FALSE [18:41:56.162] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.162] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.177] Chunk #2 of 2 ... DONE [18:41:56.177] Launching 2 futures (chunks) ... DONE [18:41:56.177] Resolving 2 futures (chunks) ... [18:41:56.178] resolve() on list ... [18:41:56.178] recursive: 0 [18:41:56.178] length: 2 [18:41:56.178] [18:41:56.182] Future #1 [18:41:56.182] result() for ClusterFuture ... [18:41:56.182] - result already collected: FutureResult [18:41:56.182] result() for ClusterFuture ... done [18:41:56.183] result() for ClusterFuture ... [18:41:56.183] - result already collected: FutureResult [18:41:56.183] result() for ClusterFuture ... done [18:41:56.183] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.183] - nx: 2 [18:41:56.183] - relay: TRUE [18:41:56.184] - stdout: TRUE [18:41:56.184] - signal: TRUE [18:41:56.184] - resignal: FALSE [18:41:56.184] - force: TRUE [18:41:56.184] - relayed: [n=2] FALSE, FALSE [18:41:56.184] - queued futures: [n=2] FALSE, FALSE [18:41:56.184] - until=1 [18:41:56.185] - relaying element #1 [18:41:56.185] result() for ClusterFuture ... [18:41:56.185] - result already collected: FutureResult [18:41:56.185] result() for ClusterFuture ... done [18:41:56.185] result() for ClusterFuture ... [18:41:56.185] - result already collected: FutureResult [18:41:56.186] result() for ClusterFuture ... done [18:41:56.186] result() for ClusterFuture ... [18:41:56.186] - result already collected: FutureResult [18:41:56.186] result() for ClusterFuture ... done [18:41:56.186] result() for ClusterFuture ... [18:41:56.186] - result already collected: FutureResult [18:41:56.187] result() for ClusterFuture ... done [18:41:56.187] - relayed: [n=2] TRUE, FALSE [18:41:56.187] - queued futures: [n=2] TRUE, FALSE [18:41:56.187] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.187] length: 1 (resolved future 1) [18:41:56.187] Future #2 [18:41:56.188] result() for ClusterFuture ... [18:41:56.188] - result already collected: FutureResult [18:41:56.188] result() for ClusterFuture ... done [18:41:56.188] result() for ClusterFuture ... [18:41:56.188] - result already collected: FutureResult [18:41:56.188] result() for ClusterFuture ... done [18:41:56.188] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.189] - nx: 2 [18:41:56.189] - relay: TRUE [18:41:56.189] - stdout: TRUE [18:41:56.189] - signal: TRUE [18:41:56.189] - resignal: FALSE [18:41:56.189] - force: TRUE [18:41:56.189] - relayed: [n=2] TRUE, FALSE [18:41:56.190] - queued futures: [n=2] TRUE, FALSE [18:41:56.190] - until=2 [18:41:56.190] - relaying element #2 [18:41:56.190] result() for ClusterFuture ... [18:41:56.190] - result already collected: FutureResult [18:41:56.190] result() for ClusterFuture ... done [18:41:56.191] result() for ClusterFuture ... [18:41:56.191] - result already collected: FutureResult [18:41:56.191] result() for ClusterFuture ... done [18:41:56.191] result() for ClusterFuture ... [18:41:56.191] - result already collected: FutureResult [18:41:56.191] result() for ClusterFuture ... done [18:41:56.192] result() for ClusterFuture ... [18:41:56.192] - result already collected: FutureResult [18:41:56.192] result() for ClusterFuture ... done [18:41:56.192] - relayed: [n=2] TRUE, TRUE [18:41:56.192] - queued futures: [n=2] TRUE, TRUE [18:41:56.192] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.192] length: 0 (resolved future 2) [18:41:56.193] Relaying remaining futures [18:41:56.193] signalConditionsASAP(NULL, pos=0) ... [18:41:56.193] - nx: 2 [18:41:56.193] - relay: TRUE [18:41:56.193] - stdout: TRUE [18:41:56.193] - signal: TRUE [18:41:56.194] - resignal: FALSE [18:41:56.194] - force: TRUE [18:41:56.194] - relayed: [n=2] TRUE, TRUE [18:41:56.194] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.194] - relayed: [n=2] TRUE, TRUE [18:41:56.194] - queued futures: [n=2] TRUE, TRUE [18:41:56.195] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.195] resolve() on list ... DONE [18:41:56.195] result() for ClusterFuture ... [18:41:56.196] - result already collected: FutureResult [18:41:56.196] result() for ClusterFuture ... done [18:41:56.196] result() for ClusterFuture ... [18:41:56.196] - result already collected: FutureResult [18:41:56.197] result() for ClusterFuture ... done [18:41:56.197] result() for ClusterFuture ... [18:41:56.197] - result already collected: FutureResult [18:41:56.198] result() for ClusterFuture ... done [18:41:56.198] result() for ClusterFuture ... [18:41:56.198] - result already collected: FutureResult [18:41:56.198] result() for ClusterFuture ... done [18:41:56.198] - Number of value chunks collected: 2 [18:41:56.198] Resolving 2 futures (chunks) ... DONE [18:41:56.199] Reducing values from 2 chunks ... [18:41:56.199] - Number of values collected after concatenation: 4 [18:41:56.199] - Number of values expected: 4 [18:41:56.200] Reducing values from 2 chunks ... DONE [18:41:56.200] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:56.205] future_lapply() ... [18:41:56.209] Number of chunks: 2 [18:41:56.209] getGlobalsAndPackagesXApply() ... [18:41:56.209] - future.globals: TRUE [18:41:56.210] getGlobalsAndPackages() ... [18:41:56.210] Searching for globals... [18:41:56.211] - globals found: [1] 'FUN' [18:41:56.211] Searching for globals ... DONE [18:41:56.211] Resolving globals: FALSE [18:41:56.212] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:56.212] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:56.212] - globals: [1] 'FUN' [18:41:56.213] [18:41:56.213] getGlobalsAndPackages() ... DONE [18:41:56.213] - globals found/used: [n=1] 'FUN' [18:41:56.213] - needed namespaces: [n=0] [18:41:56.213] Finding globals ... DONE [18:41:56.213] - use_args: TRUE [18:41:56.214] - Getting '...' globals ... [18:41:56.214] resolve() on list ... [18:41:56.214] recursive: 0 [18:41:56.214] length: 1 [18:41:56.214] elements: '...' [18:41:56.215] length: 0 (resolved future 1) [18:41:56.215] resolve() on list ... DONE [18:41:56.215] - '...' content: [n=0] [18:41:56.215] List of 1 [18:41:56.215] $ ...: list() [18:41:56.215] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.215] - attr(*, "where")=List of 1 [18:41:56.215] ..$ ...: [18:41:56.215] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.215] - attr(*, "resolved")= logi TRUE [18:41:56.215] - attr(*, "total_size")= num NA [18:41:56.218] - Getting '...' globals ... DONE [18:41:56.218] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.218] List of 2 [18:41:56.218] $ ...future.FUN:function (x) [18:41:56.218] $ ... : list() [18:41:56.218] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.218] - attr(*, "where")=List of 2 [18:41:56.218] ..$ ...future.FUN: [18:41:56.218] ..$ ... : [18:41:56.218] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.218] - attr(*, "resolved")= logi FALSE [18:41:56.218] - attr(*, "total_size")= int 4910 [18:41:56.222] Packages to be attached in all futures: [n=0] [18:41:56.222] getGlobalsAndPackagesXApply() ... DONE [18:41:56.222] Number of futures (= number of chunks): 2 [18:41:56.222] Launching 2 futures (chunks) ... [18:41:56.223] Chunk #1 of 2 ... [18:41:56.223] - Finding globals in 'X' for chunk #1 ... [18:41:56.223] getGlobalsAndPackages() ... [18:41:56.223] Searching for globals... [18:41:56.223] [18:41:56.224] Searching for globals ... DONE [18:41:56.224] - globals: [0] [18:41:56.224] getGlobalsAndPackages() ... DONE [18:41:56.224] + additional globals found: [n=0] [18:41:56.224] + additional namespaces needed: [n=0] [18:41:56.224] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.225] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.225] - seeds: [18:41:56.225] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.225] getGlobalsAndPackages() ... [18:41:56.225] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.225] Resolving globals: FALSE [18:41:56.226] Tweak future expression to call with '...' arguments ... [18:41:56.226] { [18:41:56.226] do.call(function(...) { [18:41:56.226] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.226] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.226] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.226] on.exit(options(oopts), add = TRUE) [18:41:56.226] } [18:41:56.226] { [18:41:56.226] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.226] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.226] ...future.FUN(...future.X_jj, ...) [18:41:56.226] }) [18:41:56.226] } [18:41:56.226] }, args = future.call.arguments) [18:41:56.226] } [18:41:56.226] Tweak future expression to call with '...' arguments ... DONE [18:41:56.227] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.227] [18:41:56.227] getGlobalsAndPackages() ... DONE [18:41:56.228] run() for 'Future' ... [18:41:56.228] - state: 'created' [18:41:56.228] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.243] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.243] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.244] - Field: 'node' [18:41:56.244] - Field: 'label' [18:41:56.244] - Field: 'local' [18:41:56.244] - Field: 'owner' [18:41:56.244] - Field: 'envir' [18:41:56.245] - Field: 'workers' [18:41:56.245] - Field: 'packages' [18:41:56.245] - Field: 'gc' [18:41:56.245] - Field: 'conditions' [18:41:56.245] - Field: 'persistent' [18:41:56.245] - Field: 'expr' [18:41:56.246] - Field: 'uuid' [18:41:56.246] - Field: 'seed' [18:41:56.246] - Field: 'version' [18:41:56.246] - Field: 'result' [18:41:56.246] - Field: 'asynchronous' [18:41:56.246] - Field: 'calls' [18:41:56.247] - Field: 'globals' [18:41:56.247] - Field: 'stdout' [18:41:56.247] - Field: 'earlySignal' [18:41:56.247] - Field: 'lazy' [18:41:56.247] - Field: 'state' [18:41:56.248] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.248] - Launch lazy future ... [18:41:56.248] Packages needed by the future expression (n = 0): [18:41:56.248] Packages needed by future strategies (n = 0): [18:41:56.249] { [18:41:56.249] { [18:41:56.249] { [18:41:56.249] ...future.startTime <- base::Sys.time() [18:41:56.249] { [18:41:56.249] { [18:41:56.249] { [18:41:56.249] { [18:41:56.249] base::local({ [18:41:56.249] has_future <- base::requireNamespace("future", [18:41:56.249] quietly = TRUE) [18:41:56.249] if (has_future) { [18:41:56.249] ns <- base::getNamespace("future") [18:41:56.249] version <- ns[[".package"]][["version"]] [18:41:56.249] if (is.null(version)) [18:41:56.249] version <- utils::packageVersion("future") [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] version <- NULL [18:41:56.249] } [18:41:56.249] if (!has_future || version < "1.8.0") { [18:41:56.249] info <- base::c(r_version = base::gsub("R version ", [18:41:56.249] "", base::R.version$version.string), [18:41:56.249] platform = base::sprintf("%s (%s-bit)", [18:41:56.249] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.249] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.249] "release", "version")], collapse = " "), [18:41:56.249] hostname = base::Sys.info()[["nodename"]]) [18:41:56.249] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.249] info) [18:41:56.249] info <- base::paste(info, collapse = "; ") [18:41:56.249] if (!has_future) { [18:41:56.249] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.249] info) [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.249] info, version) [18:41:56.249] } [18:41:56.249] base::stop(msg) [18:41:56.249] } [18:41:56.249] }) [18:41:56.249] } [18:41:56.249] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.249] base::options(mc.cores = 1L) [18:41:56.249] } [18:41:56.249] ...future.strategy.old <- future::plan("list") [18:41:56.249] options(future.plan = NULL) [18:41:56.249] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.249] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.249] } [18:41:56.249] ...future.workdir <- getwd() [18:41:56.249] } [18:41:56.249] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.249] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.249] } [18:41:56.249] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.249] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.249] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.249] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.249] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.249] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.249] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.249] base::names(...future.oldOptions)) [18:41:56.249] } [18:41:56.249] if (FALSE) { [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] if (TRUE) { [18:41:56.249] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.249] open = "w") [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.249] windows = "NUL", "/dev/null"), open = "w") [18:41:56.249] } [18:41:56.249] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.249] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.249] base::sink(type = "output", split = FALSE) [18:41:56.249] base::close(...future.stdout) [18:41:56.249] }, add = TRUE) [18:41:56.249] } [18:41:56.249] ...future.frame <- base::sys.nframe() [18:41:56.249] ...future.conditions <- base::list() [18:41:56.249] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.249] if (FALSE) { [18:41:56.249] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.249] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.249] } [18:41:56.249] ...future.result <- base::tryCatch({ [18:41:56.249] base::withCallingHandlers({ [18:41:56.249] ...future.value <- base::withVisible(base::local({ [18:41:56.249] ...future.makeSendCondition <- base::local({ [18:41:56.249] sendCondition <- NULL [18:41:56.249] function(frame = 1L) { [18:41:56.249] if (is.function(sendCondition)) [18:41:56.249] return(sendCondition) [18:41:56.249] ns <- getNamespace("parallel") [18:41:56.249] if (exists("sendData", mode = "function", [18:41:56.249] envir = ns)) { [18:41:56.249] parallel_sendData <- get("sendData", mode = "function", [18:41:56.249] envir = ns) [18:41:56.249] envir <- sys.frame(frame) [18:41:56.249] master <- NULL [18:41:56.249] while (!identical(envir, .GlobalEnv) && [18:41:56.249] !identical(envir, emptyenv())) { [18:41:56.249] if (exists("master", mode = "list", envir = envir, [18:41:56.249] inherits = FALSE)) { [18:41:56.249] master <- get("master", mode = "list", [18:41:56.249] envir = envir, inherits = FALSE) [18:41:56.249] if (inherits(master, c("SOCKnode", [18:41:56.249] "SOCK0node"))) { [18:41:56.249] sendCondition <<- function(cond) { [18:41:56.249] data <- list(type = "VALUE", value = cond, [18:41:56.249] success = TRUE) [18:41:56.249] parallel_sendData(master, data) [18:41:56.249] } [18:41:56.249] return(sendCondition) [18:41:56.249] } [18:41:56.249] } [18:41:56.249] frame <- frame + 1L [18:41:56.249] envir <- sys.frame(frame) [18:41:56.249] } [18:41:56.249] } [18:41:56.249] sendCondition <<- function(cond) NULL [18:41:56.249] } [18:41:56.249] }) [18:41:56.249] withCallingHandlers({ [18:41:56.249] { [18:41:56.249] do.call(function(...) { [18:41:56.249] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.249] if (!identical(...future.globals.maxSize.org, [18:41:56.249] ...future.globals.maxSize)) { [18:41:56.249] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.249] on.exit(options(oopts), add = TRUE) [18:41:56.249] } [18:41:56.249] { [18:41:56.249] lapply(seq_along(...future.elements_ii), [18:41:56.249] FUN = function(jj) { [18:41:56.249] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.249] ...future.FUN(...future.X_jj, ...) [18:41:56.249] }) [18:41:56.249] } [18:41:56.249] }, args = future.call.arguments) [18:41:56.249] } [18:41:56.249] }, immediateCondition = function(cond) { [18:41:56.249] sendCondition <- ...future.makeSendCondition() [18:41:56.249] sendCondition(cond) [18:41:56.249] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.249] { [18:41:56.249] inherits <- base::inherits [18:41:56.249] invokeRestart <- base::invokeRestart [18:41:56.249] is.null <- base::is.null [18:41:56.249] muffled <- FALSE [18:41:56.249] if (inherits(cond, "message")) { [18:41:56.249] muffled <- grepl(pattern, "muffleMessage") [18:41:56.249] if (muffled) [18:41:56.249] invokeRestart("muffleMessage") [18:41:56.249] } [18:41:56.249] else if (inherits(cond, "warning")) { [18:41:56.249] muffled <- grepl(pattern, "muffleWarning") [18:41:56.249] if (muffled) [18:41:56.249] invokeRestart("muffleWarning") [18:41:56.249] } [18:41:56.249] else if (inherits(cond, "condition")) { [18:41:56.249] if (!is.null(pattern)) { [18:41:56.249] computeRestarts <- base::computeRestarts [18:41:56.249] grepl <- base::grepl [18:41:56.249] restarts <- computeRestarts(cond) [18:41:56.249] for (restart in restarts) { [18:41:56.249] name <- restart$name [18:41:56.249] if (is.null(name)) [18:41:56.249] next [18:41:56.249] if (!grepl(pattern, name)) [18:41:56.249] next [18:41:56.249] invokeRestart(restart) [18:41:56.249] muffled <- TRUE [18:41:56.249] break [18:41:56.249] } [18:41:56.249] } [18:41:56.249] } [18:41:56.249] invisible(muffled) [18:41:56.249] } [18:41:56.249] muffleCondition(cond) [18:41:56.249] }) [18:41:56.249] })) [18:41:56.249] future::FutureResult(value = ...future.value$value, [18:41:56.249] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.249] ...future.rng), globalenv = if (FALSE) [18:41:56.249] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.249] ...future.globalenv.names)) [18:41:56.249] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.249] }, condition = base::local({ [18:41:56.249] c <- base::c [18:41:56.249] inherits <- base::inherits [18:41:56.249] invokeRestart <- base::invokeRestart [18:41:56.249] length <- base::length [18:41:56.249] list <- base::list [18:41:56.249] seq.int <- base::seq.int [18:41:56.249] signalCondition <- base::signalCondition [18:41:56.249] sys.calls <- base::sys.calls [18:41:56.249] `[[` <- base::`[[` [18:41:56.249] `+` <- base::`+` [18:41:56.249] `<<-` <- base::`<<-` [18:41:56.249] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.249] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.249] 3L)] [18:41:56.249] } [18:41:56.249] function(cond) { [18:41:56.249] is_error <- inherits(cond, "error") [18:41:56.249] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.249] NULL) [18:41:56.249] if (is_error) { [18:41:56.249] sessionInformation <- function() { [18:41:56.249] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.249] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.249] search = base::search(), system = base::Sys.info()) [18:41:56.249] } [18:41:56.249] ...future.conditions[[length(...future.conditions) + [18:41:56.249] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.249] cond$call), session = sessionInformation(), [18:41:56.249] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.249] signalCondition(cond) [18:41:56.249] } [18:41:56.249] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.249] "immediateCondition"))) { [18:41:56.249] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.249] ...future.conditions[[length(...future.conditions) + [18:41:56.249] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.249] if (TRUE && !signal) { [18:41:56.249] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.249] { [18:41:56.249] inherits <- base::inherits [18:41:56.249] invokeRestart <- base::invokeRestart [18:41:56.249] is.null <- base::is.null [18:41:56.249] muffled <- FALSE [18:41:56.249] if (inherits(cond, "message")) { [18:41:56.249] muffled <- grepl(pattern, "muffleMessage") [18:41:56.249] if (muffled) [18:41:56.249] invokeRestart("muffleMessage") [18:41:56.249] } [18:41:56.249] else if (inherits(cond, "warning")) { [18:41:56.249] muffled <- grepl(pattern, "muffleWarning") [18:41:56.249] if (muffled) [18:41:56.249] invokeRestart("muffleWarning") [18:41:56.249] } [18:41:56.249] else if (inherits(cond, "condition")) { [18:41:56.249] if (!is.null(pattern)) { [18:41:56.249] computeRestarts <- base::computeRestarts [18:41:56.249] grepl <- base::grepl [18:41:56.249] restarts <- computeRestarts(cond) [18:41:56.249] for (restart in restarts) { [18:41:56.249] name <- restart$name [18:41:56.249] if (is.null(name)) [18:41:56.249] next [18:41:56.249] if (!grepl(pattern, name)) [18:41:56.249] next [18:41:56.249] invokeRestart(restart) [18:41:56.249] muffled <- TRUE [18:41:56.249] break [18:41:56.249] } [18:41:56.249] } [18:41:56.249] } [18:41:56.249] invisible(muffled) [18:41:56.249] } [18:41:56.249] muffleCondition(cond, pattern = "^muffle") [18:41:56.249] } [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] if (TRUE) { [18:41:56.249] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.249] { [18:41:56.249] inherits <- base::inherits [18:41:56.249] invokeRestart <- base::invokeRestart [18:41:56.249] is.null <- base::is.null [18:41:56.249] muffled <- FALSE [18:41:56.249] if (inherits(cond, "message")) { [18:41:56.249] muffled <- grepl(pattern, "muffleMessage") [18:41:56.249] if (muffled) [18:41:56.249] invokeRestart("muffleMessage") [18:41:56.249] } [18:41:56.249] else if (inherits(cond, "warning")) { [18:41:56.249] muffled <- grepl(pattern, "muffleWarning") [18:41:56.249] if (muffled) [18:41:56.249] invokeRestart("muffleWarning") [18:41:56.249] } [18:41:56.249] else if (inherits(cond, "condition")) { [18:41:56.249] if (!is.null(pattern)) { [18:41:56.249] computeRestarts <- base::computeRestarts [18:41:56.249] grepl <- base::grepl [18:41:56.249] restarts <- computeRestarts(cond) [18:41:56.249] for (restart in restarts) { [18:41:56.249] name <- restart$name [18:41:56.249] if (is.null(name)) [18:41:56.249] next [18:41:56.249] if (!grepl(pattern, name)) [18:41:56.249] next [18:41:56.249] invokeRestart(restart) [18:41:56.249] muffled <- TRUE [18:41:56.249] break [18:41:56.249] } [18:41:56.249] } [18:41:56.249] } [18:41:56.249] invisible(muffled) [18:41:56.249] } [18:41:56.249] muffleCondition(cond, pattern = "^muffle") [18:41:56.249] } [18:41:56.249] } [18:41:56.249] } [18:41:56.249] })) [18:41:56.249] }, error = function(ex) { [18:41:56.249] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.249] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.249] ...future.rng), started = ...future.startTime, [18:41:56.249] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.249] version = "1.8"), class = "FutureResult") [18:41:56.249] }, finally = { [18:41:56.249] if (!identical(...future.workdir, getwd())) [18:41:56.249] setwd(...future.workdir) [18:41:56.249] { [18:41:56.249] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.249] ...future.oldOptions$nwarnings <- NULL [18:41:56.249] } [18:41:56.249] base::options(...future.oldOptions) [18:41:56.249] if (.Platform$OS.type == "windows") { [18:41:56.249] old_names <- names(...future.oldEnvVars) [18:41:56.249] envs <- base::Sys.getenv() [18:41:56.249] names <- names(envs) [18:41:56.249] common <- intersect(names, old_names) [18:41:56.249] added <- setdiff(names, old_names) [18:41:56.249] removed <- setdiff(old_names, names) [18:41:56.249] changed <- common[...future.oldEnvVars[common] != [18:41:56.249] envs[common]] [18:41:56.249] NAMES <- toupper(changed) [18:41:56.249] args <- list() [18:41:56.249] for (kk in seq_along(NAMES)) { [18:41:56.249] name <- changed[[kk]] [18:41:56.249] NAME <- NAMES[[kk]] [18:41:56.249] if (name != NAME && is.element(NAME, old_names)) [18:41:56.249] next [18:41:56.249] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.249] } [18:41:56.249] NAMES <- toupper(added) [18:41:56.249] for (kk in seq_along(NAMES)) { [18:41:56.249] name <- added[[kk]] [18:41:56.249] NAME <- NAMES[[kk]] [18:41:56.249] if (name != NAME && is.element(NAME, old_names)) [18:41:56.249] next [18:41:56.249] args[[name]] <- "" [18:41:56.249] } [18:41:56.249] NAMES <- toupper(removed) [18:41:56.249] for (kk in seq_along(NAMES)) { [18:41:56.249] name <- removed[[kk]] [18:41:56.249] NAME <- NAMES[[kk]] [18:41:56.249] if (name != NAME && is.element(NAME, old_names)) [18:41:56.249] next [18:41:56.249] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.249] } [18:41:56.249] if (length(args) > 0) [18:41:56.249] base::do.call(base::Sys.setenv, args = args) [18:41:56.249] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.249] } [18:41:56.249] { [18:41:56.249] if (base::length(...future.futureOptionsAdded) > [18:41:56.249] 0L) { [18:41:56.249] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.249] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.249] base::options(opts) [18:41:56.249] } [18:41:56.249] { [18:41:56.249] { [18:41:56.249] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.249] NULL [18:41:56.249] } [18:41:56.249] options(future.plan = NULL) [18:41:56.249] if (is.na(NA_character_)) [18:41:56.249] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.249] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.249] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.249] .init = FALSE) [18:41:56.249] } [18:41:56.249] } [18:41:56.249] } [18:41:56.249] }) [18:41:56.249] if (TRUE) { [18:41:56.249] base::sink(type = "output", split = FALSE) [18:41:56.249] if (TRUE) { [18:41:56.249] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.249] } [18:41:56.249] else { [18:41:56.249] ...future.result["stdout"] <- base::list(NULL) [18:41:56.249] } [18:41:56.249] base::close(...future.stdout) [18:41:56.249] ...future.stdout <- NULL [18:41:56.249] } [18:41:56.249] ...future.result$conditions <- ...future.conditions [18:41:56.249] ...future.result$finished <- base::Sys.time() [18:41:56.249] ...future.result [18:41:56.249] } [18:41:56.254] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:56.254] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:56.255] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:56.255] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.255] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.256] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.256] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.256] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.257] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.257] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.257] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.257] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:56.258] MultisessionFuture started [18:41:56.258] - Launch lazy future ... done [18:41:56.258] run() for 'MultisessionFuture' ... done [18:41:56.259] Created future: [18:41:56.274] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.274] - Validating connection of MultisessionFuture [18:41:56.274] - received message: FutureResult [18:41:56.274] - Received FutureResult [18:41:56.275] - Erased future from FutureRegistry [18:41:56.275] result() for ClusterFuture ... [18:41:56.275] - result already collected: FutureResult [18:41:56.275] result() for ClusterFuture ... done [18:41:56.275] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.259] MultisessionFuture: [18:41:56.259] Label: 'future_sapply-1' [18:41:56.259] Expression: [18:41:56.259] { [18:41:56.259] do.call(function(...) { [18:41:56.259] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.259] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.259] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.259] on.exit(options(oopts), add = TRUE) [18:41:56.259] } [18:41:56.259] { [18:41:56.259] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.259] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.259] ...future.FUN(...future.X_jj, ...) [18:41:56.259] }) [18:41:56.259] } [18:41:56.259] }, args = future.call.arguments) [18:41:56.259] } [18:41:56.259] Lazy evaluation: FALSE [18:41:56.259] Asynchronous evaluation: TRUE [18:41:56.259] Local evaluation: TRUE [18:41:56.259] Environment: R_GlobalEnv [18:41:56.259] Capture standard output: TRUE [18:41:56.259] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.259] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.259] Packages: [18:41:56.259] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.259] Resolved: TRUE [18:41:56.259] Value: [18:41:56.259] Conditions captured: [18:41:56.259] Early signaling: FALSE [18:41:56.259] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.259] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.276] Chunk #1 of 2 ... DONE [18:41:56.276] Chunk #2 of 2 ... [18:41:56.276] - Finding globals in 'X' for chunk #2 ... [18:41:56.276] getGlobalsAndPackages() ... [18:41:56.276] Searching for globals... [18:41:56.277] [18:41:56.277] Searching for globals ... DONE [18:41:56.277] - globals: [0] [18:41:56.277] getGlobalsAndPackages() ... DONE [18:41:56.277] + additional globals found: [n=0] [18:41:56.277] + additional namespaces needed: [n=0] [18:41:56.278] - Finding globals in 'X' for chunk #2 ... DONE [18:41:56.278] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.278] - seeds: [18:41:56.278] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.278] getGlobalsAndPackages() ... [18:41:56.278] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.279] Resolving globals: FALSE [18:41:56.279] Tweak future expression to call with '...' arguments ... [18:41:56.279] { [18:41:56.279] do.call(function(...) { [18:41:56.279] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.279] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.279] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.279] on.exit(options(oopts), add = TRUE) [18:41:56.279] } [18:41:56.279] { [18:41:56.279] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.279] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.279] ...future.FUN(...future.X_jj, ...) [18:41:56.279] }) [18:41:56.279] } [18:41:56.279] }, args = future.call.arguments) [18:41:56.279] } [18:41:56.279] Tweak future expression to call with '...' arguments ... DONE [18:41:56.280] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.280] [18:41:56.280] getGlobalsAndPackages() ... DONE [18:41:56.281] run() for 'Future' ... [18:41:56.281] - state: 'created' [18:41:56.281] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.297] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.297] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.297] - Field: 'node' [18:41:56.297] - Field: 'label' [18:41:56.297] - Field: 'local' [18:41:56.298] - Field: 'owner' [18:41:56.298] - Field: 'envir' [18:41:56.298] - Field: 'workers' [18:41:56.298] - Field: 'packages' [18:41:56.298] - Field: 'gc' [18:41:56.298] - Field: 'conditions' [18:41:56.299] - Field: 'persistent' [18:41:56.299] - Field: 'expr' [18:41:56.299] - Field: 'uuid' [18:41:56.299] - Field: 'seed' [18:41:56.299] - Field: 'version' [18:41:56.299] - Field: 'result' [18:41:56.300] - Field: 'asynchronous' [18:41:56.300] - Field: 'calls' [18:41:56.300] - Field: 'globals' [18:41:56.300] - Field: 'stdout' [18:41:56.300] - Field: 'earlySignal' [18:41:56.301] - Field: 'lazy' [18:41:56.301] - Field: 'state' [18:41:56.301] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.301] - Launch lazy future ... [18:41:56.301] Packages needed by the future expression (n = 0): [18:41:56.302] Packages needed by future strategies (n = 0): [18:41:56.302] { [18:41:56.302] { [18:41:56.302] { [18:41:56.302] ...future.startTime <- base::Sys.time() [18:41:56.302] { [18:41:56.302] { [18:41:56.302] { [18:41:56.302] { [18:41:56.302] base::local({ [18:41:56.302] has_future <- base::requireNamespace("future", [18:41:56.302] quietly = TRUE) [18:41:56.302] if (has_future) { [18:41:56.302] ns <- base::getNamespace("future") [18:41:56.302] version <- ns[[".package"]][["version"]] [18:41:56.302] if (is.null(version)) [18:41:56.302] version <- utils::packageVersion("future") [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] version <- NULL [18:41:56.302] } [18:41:56.302] if (!has_future || version < "1.8.0") { [18:41:56.302] info <- base::c(r_version = base::gsub("R version ", [18:41:56.302] "", base::R.version$version.string), [18:41:56.302] platform = base::sprintf("%s (%s-bit)", [18:41:56.302] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.302] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.302] "release", "version")], collapse = " "), [18:41:56.302] hostname = base::Sys.info()[["nodename"]]) [18:41:56.302] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.302] info) [18:41:56.302] info <- base::paste(info, collapse = "; ") [18:41:56.302] if (!has_future) { [18:41:56.302] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.302] info) [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.302] info, version) [18:41:56.302] } [18:41:56.302] base::stop(msg) [18:41:56.302] } [18:41:56.302] }) [18:41:56.302] } [18:41:56.302] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.302] base::options(mc.cores = 1L) [18:41:56.302] } [18:41:56.302] ...future.strategy.old <- future::plan("list") [18:41:56.302] options(future.plan = NULL) [18:41:56.302] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.302] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.302] } [18:41:56.302] ...future.workdir <- getwd() [18:41:56.302] } [18:41:56.302] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.302] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.302] } [18:41:56.302] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.302] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.302] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.302] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.302] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.302] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.302] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.302] base::names(...future.oldOptions)) [18:41:56.302] } [18:41:56.302] if (FALSE) { [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] if (TRUE) { [18:41:56.302] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.302] open = "w") [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.302] windows = "NUL", "/dev/null"), open = "w") [18:41:56.302] } [18:41:56.302] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.302] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.302] base::sink(type = "output", split = FALSE) [18:41:56.302] base::close(...future.stdout) [18:41:56.302] }, add = TRUE) [18:41:56.302] } [18:41:56.302] ...future.frame <- base::sys.nframe() [18:41:56.302] ...future.conditions <- base::list() [18:41:56.302] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.302] if (FALSE) { [18:41:56.302] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.302] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.302] } [18:41:56.302] ...future.result <- base::tryCatch({ [18:41:56.302] base::withCallingHandlers({ [18:41:56.302] ...future.value <- base::withVisible(base::local({ [18:41:56.302] ...future.makeSendCondition <- base::local({ [18:41:56.302] sendCondition <- NULL [18:41:56.302] function(frame = 1L) { [18:41:56.302] if (is.function(sendCondition)) [18:41:56.302] return(sendCondition) [18:41:56.302] ns <- getNamespace("parallel") [18:41:56.302] if (exists("sendData", mode = "function", [18:41:56.302] envir = ns)) { [18:41:56.302] parallel_sendData <- get("sendData", mode = "function", [18:41:56.302] envir = ns) [18:41:56.302] envir <- sys.frame(frame) [18:41:56.302] master <- NULL [18:41:56.302] while (!identical(envir, .GlobalEnv) && [18:41:56.302] !identical(envir, emptyenv())) { [18:41:56.302] if (exists("master", mode = "list", envir = envir, [18:41:56.302] inherits = FALSE)) { [18:41:56.302] master <- get("master", mode = "list", [18:41:56.302] envir = envir, inherits = FALSE) [18:41:56.302] if (inherits(master, c("SOCKnode", [18:41:56.302] "SOCK0node"))) { [18:41:56.302] sendCondition <<- function(cond) { [18:41:56.302] data <- list(type = "VALUE", value = cond, [18:41:56.302] success = TRUE) [18:41:56.302] parallel_sendData(master, data) [18:41:56.302] } [18:41:56.302] return(sendCondition) [18:41:56.302] } [18:41:56.302] } [18:41:56.302] frame <- frame + 1L [18:41:56.302] envir <- sys.frame(frame) [18:41:56.302] } [18:41:56.302] } [18:41:56.302] sendCondition <<- function(cond) NULL [18:41:56.302] } [18:41:56.302] }) [18:41:56.302] withCallingHandlers({ [18:41:56.302] { [18:41:56.302] do.call(function(...) { [18:41:56.302] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.302] if (!identical(...future.globals.maxSize.org, [18:41:56.302] ...future.globals.maxSize)) { [18:41:56.302] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.302] on.exit(options(oopts), add = TRUE) [18:41:56.302] } [18:41:56.302] { [18:41:56.302] lapply(seq_along(...future.elements_ii), [18:41:56.302] FUN = function(jj) { [18:41:56.302] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.302] ...future.FUN(...future.X_jj, ...) [18:41:56.302] }) [18:41:56.302] } [18:41:56.302] }, args = future.call.arguments) [18:41:56.302] } [18:41:56.302] }, immediateCondition = function(cond) { [18:41:56.302] sendCondition <- ...future.makeSendCondition() [18:41:56.302] sendCondition(cond) [18:41:56.302] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.302] { [18:41:56.302] inherits <- base::inherits [18:41:56.302] invokeRestart <- base::invokeRestart [18:41:56.302] is.null <- base::is.null [18:41:56.302] muffled <- FALSE [18:41:56.302] if (inherits(cond, "message")) { [18:41:56.302] muffled <- grepl(pattern, "muffleMessage") [18:41:56.302] if (muffled) [18:41:56.302] invokeRestart("muffleMessage") [18:41:56.302] } [18:41:56.302] else if (inherits(cond, "warning")) { [18:41:56.302] muffled <- grepl(pattern, "muffleWarning") [18:41:56.302] if (muffled) [18:41:56.302] invokeRestart("muffleWarning") [18:41:56.302] } [18:41:56.302] else if (inherits(cond, "condition")) { [18:41:56.302] if (!is.null(pattern)) { [18:41:56.302] computeRestarts <- base::computeRestarts [18:41:56.302] grepl <- base::grepl [18:41:56.302] restarts <- computeRestarts(cond) [18:41:56.302] for (restart in restarts) { [18:41:56.302] name <- restart$name [18:41:56.302] if (is.null(name)) [18:41:56.302] next [18:41:56.302] if (!grepl(pattern, name)) [18:41:56.302] next [18:41:56.302] invokeRestart(restart) [18:41:56.302] muffled <- TRUE [18:41:56.302] break [18:41:56.302] } [18:41:56.302] } [18:41:56.302] } [18:41:56.302] invisible(muffled) [18:41:56.302] } [18:41:56.302] muffleCondition(cond) [18:41:56.302] }) [18:41:56.302] })) [18:41:56.302] future::FutureResult(value = ...future.value$value, [18:41:56.302] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.302] ...future.rng), globalenv = if (FALSE) [18:41:56.302] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.302] ...future.globalenv.names)) [18:41:56.302] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.302] }, condition = base::local({ [18:41:56.302] c <- base::c [18:41:56.302] inherits <- base::inherits [18:41:56.302] invokeRestart <- base::invokeRestart [18:41:56.302] length <- base::length [18:41:56.302] list <- base::list [18:41:56.302] seq.int <- base::seq.int [18:41:56.302] signalCondition <- base::signalCondition [18:41:56.302] sys.calls <- base::sys.calls [18:41:56.302] `[[` <- base::`[[` [18:41:56.302] `+` <- base::`+` [18:41:56.302] `<<-` <- base::`<<-` [18:41:56.302] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.302] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.302] 3L)] [18:41:56.302] } [18:41:56.302] function(cond) { [18:41:56.302] is_error <- inherits(cond, "error") [18:41:56.302] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.302] NULL) [18:41:56.302] if (is_error) { [18:41:56.302] sessionInformation <- function() { [18:41:56.302] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.302] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.302] search = base::search(), system = base::Sys.info()) [18:41:56.302] } [18:41:56.302] ...future.conditions[[length(...future.conditions) + [18:41:56.302] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.302] cond$call), session = sessionInformation(), [18:41:56.302] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.302] signalCondition(cond) [18:41:56.302] } [18:41:56.302] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.302] "immediateCondition"))) { [18:41:56.302] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.302] ...future.conditions[[length(...future.conditions) + [18:41:56.302] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.302] if (TRUE && !signal) { [18:41:56.302] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.302] { [18:41:56.302] inherits <- base::inherits [18:41:56.302] invokeRestart <- base::invokeRestart [18:41:56.302] is.null <- base::is.null [18:41:56.302] muffled <- FALSE [18:41:56.302] if (inherits(cond, "message")) { [18:41:56.302] muffled <- grepl(pattern, "muffleMessage") [18:41:56.302] if (muffled) [18:41:56.302] invokeRestart("muffleMessage") [18:41:56.302] } [18:41:56.302] else if (inherits(cond, "warning")) { [18:41:56.302] muffled <- grepl(pattern, "muffleWarning") [18:41:56.302] if (muffled) [18:41:56.302] invokeRestart("muffleWarning") [18:41:56.302] } [18:41:56.302] else if (inherits(cond, "condition")) { [18:41:56.302] if (!is.null(pattern)) { [18:41:56.302] computeRestarts <- base::computeRestarts [18:41:56.302] grepl <- base::grepl [18:41:56.302] restarts <- computeRestarts(cond) [18:41:56.302] for (restart in restarts) { [18:41:56.302] name <- restart$name [18:41:56.302] if (is.null(name)) [18:41:56.302] next [18:41:56.302] if (!grepl(pattern, name)) [18:41:56.302] next [18:41:56.302] invokeRestart(restart) [18:41:56.302] muffled <- TRUE [18:41:56.302] break [18:41:56.302] } [18:41:56.302] } [18:41:56.302] } [18:41:56.302] invisible(muffled) [18:41:56.302] } [18:41:56.302] muffleCondition(cond, pattern = "^muffle") [18:41:56.302] } [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] if (TRUE) { [18:41:56.302] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.302] { [18:41:56.302] inherits <- base::inherits [18:41:56.302] invokeRestart <- base::invokeRestart [18:41:56.302] is.null <- base::is.null [18:41:56.302] muffled <- FALSE [18:41:56.302] if (inherits(cond, "message")) { [18:41:56.302] muffled <- grepl(pattern, "muffleMessage") [18:41:56.302] if (muffled) [18:41:56.302] invokeRestart("muffleMessage") [18:41:56.302] } [18:41:56.302] else if (inherits(cond, "warning")) { [18:41:56.302] muffled <- grepl(pattern, "muffleWarning") [18:41:56.302] if (muffled) [18:41:56.302] invokeRestart("muffleWarning") [18:41:56.302] } [18:41:56.302] else if (inherits(cond, "condition")) { [18:41:56.302] if (!is.null(pattern)) { [18:41:56.302] computeRestarts <- base::computeRestarts [18:41:56.302] grepl <- base::grepl [18:41:56.302] restarts <- computeRestarts(cond) [18:41:56.302] for (restart in restarts) { [18:41:56.302] name <- restart$name [18:41:56.302] if (is.null(name)) [18:41:56.302] next [18:41:56.302] if (!grepl(pattern, name)) [18:41:56.302] next [18:41:56.302] invokeRestart(restart) [18:41:56.302] muffled <- TRUE [18:41:56.302] break [18:41:56.302] } [18:41:56.302] } [18:41:56.302] } [18:41:56.302] invisible(muffled) [18:41:56.302] } [18:41:56.302] muffleCondition(cond, pattern = "^muffle") [18:41:56.302] } [18:41:56.302] } [18:41:56.302] } [18:41:56.302] })) [18:41:56.302] }, error = function(ex) { [18:41:56.302] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.302] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.302] ...future.rng), started = ...future.startTime, [18:41:56.302] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.302] version = "1.8"), class = "FutureResult") [18:41:56.302] }, finally = { [18:41:56.302] if (!identical(...future.workdir, getwd())) [18:41:56.302] setwd(...future.workdir) [18:41:56.302] { [18:41:56.302] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.302] ...future.oldOptions$nwarnings <- NULL [18:41:56.302] } [18:41:56.302] base::options(...future.oldOptions) [18:41:56.302] if (.Platform$OS.type == "windows") { [18:41:56.302] old_names <- names(...future.oldEnvVars) [18:41:56.302] envs <- base::Sys.getenv() [18:41:56.302] names <- names(envs) [18:41:56.302] common <- intersect(names, old_names) [18:41:56.302] added <- setdiff(names, old_names) [18:41:56.302] removed <- setdiff(old_names, names) [18:41:56.302] changed <- common[...future.oldEnvVars[common] != [18:41:56.302] envs[common]] [18:41:56.302] NAMES <- toupper(changed) [18:41:56.302] args <- list() [18:41:56.302] for (kk in seq_along(NAMES)) { [18:41:56.302] name <- changed[[kk]] [18:41:56.302] NAME <- NAMES[[kk]] [18:41:56.302] if (name != NAME && is.element(NAME, old_names)) [18:41:56.302] next [18:41:56.302] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.302] } [18:41:56.302] NAMES <- toupper(added) [18:41:56.302] for (kk in seq_along(NAMES)) { [18:41:56.302] name <- added[[kk]] [18:41:56.302] NAME <- NAMES[[kk]] [18:41:56.302] if (name != NAME && is.element(NAME, old_names)) [18:41:56.302] next [18:41:56.302] args[[name]] <- "" [18:41:56.302] } [18:41:56.302] NAMES <- toupper(removed) [18:41:56.302] for (kk in seq_along(NAMES)) { [18:41:56.302] name <- removed[[kk]] [18:41:56.302] NAME <- NAMES[[kk]] [18:41:56.302] if (name != NAME && is.element(NAME, old_names)) [18:41:56.302] next [18:41:56.302] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.302] } [18:41:56.302] if (length(args) > 0) [18:41:56.302] base::do.call(base::Sys.setenv, args = args) [18:41:56.302] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.302] } [18:41:56.302] { [18:41:56.302] if (base::length(...future.futureOptionsAdded) > [18:41:56.302] 0L) { [18:41:56.302] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.302] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.302] base::options(opts) [18:41:56.302] } [18:41:56.302] { [18:41:56.302] { [18:41:56.302] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.302] NULL [18:41:56.302] } [18:41:56.302] options(future.plan = NULL) [18:41:56.302] if (is.na(NA_character_)) [18:41:56.302] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.302] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.302] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.302] .init = FALSE) [18:41:56.302] } [18:41:56.302] } [18:41:56.302] } [18:41:56.302] }) [18:41:56.302] if (TRUE) { [18:41:56.302] base::sink(type = "output", split = FALSE) [18:41:56.302] if (TRUE) { [18:41:56.302] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.302] } [18:41:56.302] else { [18:41:56.302] ...future.result["stdout"] <- base::list(NULL) [18:41:56.302] } [18:41:56.302] base::close(...future.stdout) [18:41:56.302] ...future.stdout <- NULL [18:41:56.302] } [18:41:56.302] ...future.result$conditions <- ...future.conditions [18:41:56.302] ...future.result$finished <- base::Sys.time() [18:41:56.302] ...future.result [18:41:56.302] } [18:41:56.307] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:56.308] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:56.308] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:56.308] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.309] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.309] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.309] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.309] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.310] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.310] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.310] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.311] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:56.311] MultisessionFuture started [18:41:56.311] - Launch lazy future ... done [18:41:56.312] run() for 'MultisessionFuture' ... done [18:41:56.312] Created future: [18:41:56.326] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.326] - Validating connection of MultisessionFuture [18:41:56.327] - received message: FutureResult [18:41:56.327] - Received FutureResult [18:41:56.327] - Erased future from FutureRegistry [18:41:56.327] result() for ClusterFuture ... [18:41:56.327] - result already collected: FutureResult [18:41:56.328] result() for ClusterFuture ... done [18:41:56.328] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.312] MultisessionFuture: [18:41:56.312] Label: 'future_sapply-2' [18:41:56.312] Expression: [18:41:56.312] { [18:41:56.312] do.call(function(...) { [18:41:56.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.312] on.exit(options(oopts), add = TRUE) [18:41:56.312] } [18:41:56.312] { [18:41:56.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.312] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.312] ...future.FUN(...future.X_jj, ...) [18:41:56.312] }) [18:41:56.312] } [18:41:56.312] }, args = future.call.arguments) [18:41:56.312] } [18:41:56.312] Lazy evaluation: FALSE [18:41:56.312] Asynchronous evaluation: TRUE [18:41:56.312] Local evaluation: TRUE [18:41:56.312] Environment: R_GlobalEnv [18:41:56.312] Capture standard output: TRUE [18:41:56.312] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.312] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.312] Packages: [18:41:56.312] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.312] Resolved: TRUE [18:41:56.312] Value: [18:41:56.312] Conditions captured: [18:41:56.312] Early signaling: FALSE [18:41:56.312] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.312] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.328] Chunk #2 of 2 ... DONE [18:41:56.328] Launching 2 futures (chunks) ... DONE [18:41:56.329] Resolving 2 futures (chunks) ... [18:41:56.329] resolve() on list ... [18:41:56.329] recursive: 0 [18:41:56.329] length: 2 [18:41:56.329] [18:41:56.329] Future #1 [18:41:56.330] result() for ClusterFuture ... [18:41:56.330] - result already collected: FutureResult [18:41:56.330] result() for ClusterFuture ... done [18:41:56.330] result() for ClusterFuture ... [18:41:56.330] - result already collected: FutureResult [18:41:56.330] result() for ClusterFuture ... done [18:41:56.330] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.331] - nx: 2 [18:41:56.331] - relay: TRUE [18:41:56.331] - stdout: TRUE [18:41:56.331] - signal: TRUE [18:41:56.331] - resignal: FALSE [18:41:56.331] - force: TRUE [18:41:56.332] - relayed: [n=2] FALSE, FALSE [18:41:56.332] - queued futures: [n=2] FALSE, FALSE [18:41:56.332] - until=1 [18:41:56.332] - relaying element #1 [18:41:56.332] result() for ClusterFuture ... [18:41:56.332] - result already collected: FutureResult [18:41:56.332] result() for ClusterFuture ... done [18:41:56.333] result() for ClusterFuture ... [18:41:56.333] - result already collected: FutureResult [18:41:56.333] result() for ClusterFuture ... done [18:41:56.333] result() for ClusterFuture ... [18:41:56.333] - result already collected: FutureResult [18:41:56.333] result() for ClusterFuture ... done [18:41:56.334] result() for ClusterFuture ... [18:41:56.334] - result already collected: FutureResult [18:41:56.334] result() for ClusterFuture ... done [18:41:56.334] - relayed: [n=2] TRUE, FALSE [18:41:56.334] - queued futures: [n=2] TRUE, FALSE [18:41:56.334] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.335] length: 1 (resolved future 1) [18:41:56.335] Future #2 [18:41:56.335] result() for ClusterFuture ... [18:41:56.335] - result already collected: FutureResult [18:41:56.335] result() for ClusterFuture ... done [18:41:56.335] result() for ClusterFuture ... [18:41:56.336] - result already collected: FutureResult [18:41:56.336] result() for ClusterFuture ... done [18:41:56.336] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.336] - nx: 2 [18:41:56.336] - relay: TRUE [18:41:56.336] - stdout: TRUE [18:41:56.336] - signal: TRUE [18:41:56.337] - resignal: FALSE [18:41:56.337] - force: TRUE [18:41:56.337] - relayed: [n=2] TRUE, FALSE [18:41:56.337] - queued futures: [n=2] TRUE, FALSE [18:41:56.337] - until=2 [18:41:56.337] - relaying element #2 [18:41:56.338] result() for ClusterFuture ... [18:41:56.338] - result already collected: FutureResult [18:41:56.338] result() for ClusterFuture ... done [18:41:56.338] result() for ClusterFuture ... [18:41:56.338] - result already collected: FutureResult [18:41:56.338] result() for ClusterFuture ... done [18:41:56.339] result() for ClusterFuture ... [18:41:56.339] - result already collected: FutureResult [18:41:56.339] result() for ClusterFuture ... done [18:41:56.339] result() for ClusterFuture ... [18:41:56.339] - result already collected: FutureResult [18:41:56.339] result() for ClusterFuture ... done [18:41:56.343] - relayed: [n=2] TRUE, TRUE [18:41:56.343] - queued futures: [n=2] TRUE, TRUE [18:41:56.343] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.344] length: 0 (resolved future 2) [18:41:56.344] Relaying remaining futures [18:41:56.344] signalConditionsASAP(NULL, pos=0) ... [18:41:56.344] - nx: 2 [18:41:56.344] - relay: TRUE [18:41:56.345] - stdout: TRUE [18:41:56.345] - signal: TRUE [18:41:56.345] - resignal: FALSE [18:41:56.345] - force: TRUE [18:41:56.345] - relayed: [n=2] TRUE, TRUE [18:41:56.345] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.346] - relayed: [n=2] TRUE, TRUE [18:41:56.346] - queued futures: [n=2] TRUE, TRUE [18:41:56.346] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.346] resolve() on list ... DONE [18:41:56.346] result() for ClusterFuture ... [18:41:56.346] - result already collected: FutureResult [18:41:56.346] result() for ClusterFuture ... done [18:41:56.347] result() for ClusterFuture ... [18:41:56.347] - result already collected: FutureResult [18:41:56.347] result() for ClusterFuture ... done [18:41:56.347] result() for ClusterFuture ... [18:41:56.347] - result already collected: FutureResult [18:41:56.347] result() for ClusterFuture ... done [18:41:56.348] result() for ClusterFuture ... [18:41:56.348] - result already collected: FutureResult [18:41:56.348] result() for ClusterFuture ... done [18:41:56.348] - Number of value chunks collected: 2 [18:41:56.348] Resolving 2 futures (chunks) ... DONE [18:41:56.349] Reducing values from 2 chunks ... [18:41:56.349] - Number of values collected after concatenation: 4 [18:41:56.349] - Number of values expected: 4 [18:41:56.349] Reducing values from 2 chunks ... DONE [18:41:56.349] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y1:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 List of 2 $ y0:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 $ y2:List of 4 ..$ A: num 50 ..$ B: num 60 ..$ C: num 70 ..$ D: num 80 [18:41:56.357] future_lapply() ... [18:41:56.360] Number of chunks: 2 [18:41:56.360] getGlobalsAndPackagesXApply() ... [18:41:56.360] - future.globals: TRUE [18:41:56.361] getGlobalsAndPackages() ... [18:41:56.361] Searching for globals... [18:41:56.362] - globals found: [2] 'FUN', 'UseMethod' [18:41:56.362] Searching for globals ... DONE [18:41:56.362] Resolving globals: FALSE [18:41:56.363] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:56.363] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:56.364] - globals: [1] 'FUN' [18:41:56.364] [18:41:56.364] getGlobalsAndPackages() ... DONE [18:41:56.364] - globals found/used: [n=1] 'FUN' [18:41:56.364] - needed namespaces: [n=0] [18:41:56.364] Finding globals ... DONE [18:41:56.365] - use_args: TRUE [18:41:56.365] - Getting '...' globals ... [18:41:56.365] resolve() on list ... [18:41:56.365] recursive: 0 [18:41:56.365] length: 1 [18:41:56.366] elements: '...' [18:41:56.366] length: 0 (resolved future 1) [18:41:56.366] resolve() on list ... DONE [18:41:56.366] - '...' content: [n=0] [18:41:56.366] List of 1 [18:41:56.366] $ ...: list() [18:41:56.366] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.366] - attr(*, "where")=List of 1 [18:41:56.366] ..$ ...: [18:41:56.366] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.366] - attr(*, "resolved")= logi TRUE [18:41:56.366] - attr(*, "total_size")= num NA [18:41:56.369] - Getting '...' globals ... DONE [18:41:56.369] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.370] List of 2 [18:41:56.370] $ ...future.FUN:function (x, ...) [18:41:56.370] $ ... : list() [18:41:56.370] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.370] - attr(*, "where")=List of 2 [18:41:56.370] ..$ ...future.FUN: [18:41:56.370] ..$ ... : [18:41:56.370] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.370] - attr(*, "resolved")= logi FALSE [18:41:56.370] - attr(*, "total_size")= int 5150 [18:41:56.373] Packages to be attached in all futures: [n=0] [18:41:56.373] getGlobalsAndPackagesXApply() ... DONE [18:41:56.373] Number of futures (= number of chunks): 2 [18:41:56.374] Launching 2 futures (chunks) ... [18:41:56.374] Chunk #1 of 2 ... [18:41:56.374] - Finding globals in 'X' for chunk #1 ... [18:41:56.374] getGlobalsAndPackages() ... [18:41:56.374] Searching for globals... [18:41:56.375] [18:41:56.375] Searching for globals ... DONE [18:41:56.375] - globals: [0] [18:41:56.375] getGlobalsAndPackages() ... DONE [18:41:56.375] + additional globals found: [n=0] [18:41:56.376] + additional namespaces needed: [n=0] [18:41:56.376] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.376] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.376] - seeds: [18:41:56.376] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.376] getGlobalsAndPackages() ... [18:41:56.376] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.377] Resolving globals: FALSE [18:41:56.377] Tweak future expression to call with '...' arguments ... [18:41:56.377] { [18:41:56.377] do.call(function(...) { [18:41:56.377] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.377] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.377] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.377] on.exit(options(oopts), add = TRUE) [18:41:56.377] } [18:41:56.377] { [18:41:56.377] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.377] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.377] ...future.FUN(...future.X_jj, ...) [18:41:56.377] }) [18:41:56.377] } [18:41:56.377] }, args = future.call.arguments) [18:41:56.377] } [18:41:56.377] Tweak future expression to call with '...' arguments ... DONE [18:41:56.378] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.378] [18:41:56.378] getGlobalsAndPackages() ... DONE [18:41:56.379] run() for 'Future' ... [18:41:56.379] - state: 'created' [18:41:56.379] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.394] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.394] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.395] - Field: 'node' [18:41:56.395] - Field: 'label' [18:41:56.395] - Field: 'local' [18:41:56.395] - Field: 'owner' [18:41:56.396] - Field: 'envir' [18:41:56.396] - Field: 'workers' [18:41:56.396] - Field: 'packages' [18:41:56.396] - Field: 'gc' [18:41:56.396] - Field: 'conditions' [18:41:56.396] - Field: 'persistent' [18:41:56.397] - Field: 'expr' [18:41:56.397] - Field: 'uuid' [18:41:56.397] - Field: 'seed' [18:41:56.397] - Field: 'version' [18:41:56.397] - Field: 'result' [18:41:56.397] - Field: 'asynchronous' [18:41:56.398] - Field: 'calls' [18:41:56.398] - Field: 'globals' [18:41:56.398] - Field: 'stdout' [18:41:56.398] - Field: 'earlySignal' [18:41:56.398] - Field: 'lazy' [18:41:56.398] - Field: 'state' [18:41:56.399] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.399] - Launch lazy future ... [18:41:56.399] Packages needed by the future expression (n = 0): [18:41:56.399] Packages needed by future strategies (n = 0): [18:41:56.400] { [18:41:56.400] { [18:41:56.400] { [18:41:56.400] ...future.startTime <- base::Sys.time() [18:41:56.400] { [18:41:56.400] { [18:41:56.400] { [18:41:56.400] { [18:41:56.400] base::local({ [18:41:56.400] has_future <- base::requireNamespace("future", [18:41:56.400] quietly = TRUE) [18:41:56.400] if (has_future) { [18:41:56.400] ns <- base::getNamespace("future") [18:41:56.400] version <- ns[[".package"]][["version"]] [18:41:56.400] if (is.null(version)) [18:41:56.400] version <- utils::packageVersion("future") [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] version <- NULL [18:41:56.400] } [18:41:56.400] if (!has_future || version < "1.8.0") { [18:41:56.400] info <- base::c(r_version = base::gsub("R version ", [18:41:56.400] "", base::R.version$version.string), [18:41:56.400] platform = base::sprintf("%s (%s-bit)", [18:41:56.400] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.400] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.400] "release", "version")], collapse = " "), [18:41:56.400] hostname = base::Sys.info()[["nodename"]]) [18:41:56.400] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.400] info) [18:41:56.400] info <- base::paste(info, collapse = "; ") [18:41:56.400] if (!has_future) { [18:41:56.400] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.400] info) [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.400] info, version) [18:41:56.400] } [18:41:56.400] base::stop(msg) [18:41:56.400] } [18:41:56.400] }) [18:41:56.400] } [18:41:56.400] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.400] base::options(mc.cores = 1L) [18:41:56.400] } [18:41:56.400] ...future.strategy.old <- future::plan("list") [18:41:56.400] options(future.plan = NULL) [18:41:56.400] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.400] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.400] } [18:41:56.400] ...future.workdir <- getwd() [18:41:56.400] } [18:41:56.400] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.400] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.400] } [18:41:56.400] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.400] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.400] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.400] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.400] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.400] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.400] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.400] base::names(...future.oldOptions)) [18:41:56.400] } [18:41:56.400] if (FALSE) { [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] if (TRUE) { [18:41:56.400] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.400] open = "w") [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.400] windows = "NUL", "/dev/null"), open = "w") [18:41:56.400] } [18:41:56.400] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.400] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.400] base::sink(type = "output", split = FALSE) [18:41:56.400] base::close(...future.stdout) [18:41:56.400] }, add = TRUE) [18:41:56.400] } [18:41:56.400] ...future.frame <- base::sys.nframe() [18:41:56.400] ...future.conditions <- base::list() [18:41:56.400] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.400] if (FALSE) { [18:41:56.400] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.400] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.400] } [18:41:56.400] ...future.result <- base::tryCatch({ [18:41:56.400] base::withCallingHandlers({ [18:41:56.400] ...future.value <- base::withVisible(base::local({ [18:41:56.400] ...future.makeSendCondition <- base::local({ [18:41:56.400] sendCondition <- NULL [18:41:56.400] function(frame = 1L) { [18:41:56.400] if (is.function(sendCondition)) [18:41:56.400] return(sendCondition) [18:41:56.400] ns <- getNamespace("parallel") [18:41:56.400] if (exists("sendData", mode = "function", [18:41:56.400] envir = ns)) { [18:41:56.400] parallel_sendData <- get("sendData", mode = "function", [18:41:56.400] envir = ns) [18:41:56.400] envir <- sys.frame(frame) [18:41:56.400] master <- NULL [18:41:56.400] while (!identical(envir, .GlobalEnv) && [18:41:56.400] !identical(envir, emptyenv())) { [18:41:56.400] if (exists("master", mode = "list", envir = envir, [18:41:56.400] inherits = FALSE)) { [18:41:56.400] master <- get("master", mode = "list", [18:41:56.400] envir = envir, inherits = FALSE) [18:41:56.400] if (inherits(master, c("SOCKnode", [18:41:56.400] "SOCK0node"))) { [18:41:56.400] sendCondition <<- function(cond) { [18:41:56.400] data <- list(type = "VALUE", value = cond, [18:41:56.400] success = TRUE) [18:41:56.400] parallel_sendData(master, data) [18:41:56.400] } [18:41:56.400] return(sendCondition) [18:41:56.400] } [18:41:56.400] } [18:41:56.400] frame <- frame + 1L [18:41:56.400] envir <- sys.frame(frame) [18:41:56.400] } [18:41:56.400] } [18:41:56.400] sendCondition <<- function(cond) NULL [18:41:56.400] } [18:41:56.400] }) [18:41:56.400] withCallingHandlers({ [18:41:56.400] { [18:41:56.400] do.call(function(...) { [18:41:56.400] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.400] if (!identical(...future.globals.maxSize.org, [18:41:56.400] ...future.globals.maxSize)) { [18:41:56.400] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.400] on.exit(options(oopts), add = TRUE) [18:41:56.400] } [18:41:56.400] { [18:41:56.400] lapply(seq_along(...future.elements_ii), [18:41:56.400] FUN = function(jj) { [18:41:56.400] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.400] ...future.FUN(...future.X_jj, ...) [18:41:56.400] }) [18:41:56.400] } [18:41:56.400] }, args = future.call.arguments) [18:41:56.400] } [18:41:56.400] }, immediateCondition = function(cond) { [18:41:56.400] sendCondition <- ...future.makeSendCondition() [18:41:56.400] sendCondition(cond) [18:41:56.400] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.400] { [18:41:56.400] inherits <- base::inherits [18:41:56.400] invokeRestart <- base::invokeRestart [18:41:56.400] is.null <- base::is.null [18:41:56.400] muffled <- FALSE [18:41:56.400] if (inherits(cond, "message")) { [18:41:56.400] muffled <- grepl(pattern, "muffleMessage") [18:41:56.400] if (muffled) [18:41:56.400] invokeRestart("muffleMessage") [18:41:56.400] } [18:41:56.400] else if (inherits(cond, "warning")) { [18:41:56.400] muffled <- grepl(pattern, "muffleWarning") [18:41:56.400] if (muffled) [18:41:56.400] invokeRestart("muffleWarning") [18:41:56.400] } [18:41:56.400] else if (inherits(cond, "condition")) { [18:41:56.400] if (!is.null(pattern)) { [18:41:56.400] computeRestarts <- base::computeRestarts [18:41:56.400] grepl <- base::grepl [18:41:56.400] restarts <- computeRestarts(cond) [18:41:56.400] for (restart in restarts) { [18:41:56.400] name <- restart$name [18:41:56.400] if (is.null(name)) [18:41:56.400] next [18:41:56.400] if (!grepl(pattern, name)) [18:41:56.400] next [18:41:56.400] invokeRestart(restart) [18:41:56.400] muffled <- TRUE [18:41:56.400] break [18:41:56.400] } [18:41:56.400] } [18:41:56.400] } [18:41:56.400] invisible(muffled) [18:41:56.400] } [18:41:56.400] muffleCondition(cond) [18:41:56.400] }) [18:41:56.400] })) [18:41:56.400] future::FutureResult(value = ...future.value$value, [18:41:56.400] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.400] ...future.rng), globalenv = if (FALSE) [18:41:56.400] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.400] ...future.globalenv.names)) [18:41:56.400] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.400] }, condition = base::local({ [18:41:56.400] c <- base::c [18:41:56.400] inherits <- base::inherits [18:41:56.400] invokeRestart <- base::invokeRestart [18:41:56.400] length <- base::length [18:41:56.400] list <- base::list [18:41:56.400] seq.int <- base::seq.int [18:41:56.400] signalCondition <- base::signalCondition [18:41:56.400] sys.calls <- base::sys.calls [18:41:56.400] `[[` <- base::`[[` [18:41:56.400] `+` <- base::`+` [18:41:56.400] `<<-` <- base::`<<-` [18:41:56.400] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.400] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.400] 3L)] [18:41:56.400] } [18:41:56.400] function(cond) { [18:41:56.400] is_error <- inherits(cond, "error") [18:41:56.400] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.400] NULL) [18:41:56.400] if (is_error) { [18:41:56.400] sessionInformation <- function() { [18:41:56.400] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.400] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.400] search = base::search(), system = base::Sys.info()) [18:41:56.400] } [18:41:56.400] ...future.conditions[[length(...future.conditions) + [18:41:56.400] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.400] cond$call), session = sessionInformation(), [18:41:56.400] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.400] signalCondition(cond) [18:41:56.400] } [18:41:56.400] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.400] "immediateCondition"))) { [18:41:56.400] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.400] ...future.conditions[[length(...future.conditions) + [18:41:56.400] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.400] if (TRUE && !signal) { [18:41:56.400] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.400] { [18:41:56.400] inherits <- base::inherits [18:41:56.400] invokeRestart <- base::invokeRestart [18:41:56.400] is.null <- base::is.null [18:41:56.400] muffled <- FALSE [18:41:56.400] if (inherits(cond, "message")) { [18:41:56.400] muffled <- grepl(pattern, "muffleMessage") [18:41:56.400] if (muffled) [18:41:56.400] invokeRestart("muffleMessage") [18:41:56.400] } [18:41:56.400] else if (inherits(cond, "warning")) { [18:41:56.400] muffled <- grepl(pattern, "muffleWarning") [18:41:56.400] if (muffled) [18:41:56.400] invokeRestart("muffleWarning") [18:41:56.400] } [18:41:56.400] else if (inherits(cond, "condition")) { [18:41:56.400] if (!is.null(pattern)) { [18:41:56.400] computeRestarts <- base::computeRestarts [18:41:56.400] grepl <- base::grepl [18:41:56.400] restarts <- computeRestarts(cond) [18:41:56.400] for (restart in restarts) { [18:41:56.400] name <- restart$name [18:41:56.400] if (is.null(name)) [18:41:56.400] next [18:41:56.400] if (!grepl(pattern, name)) [18:41:56.400] next [18:41:56.400] invokeRestart(restart) [18:41:56.400] muffled <- TRUE [18:41:56.400] break [18:41:56.400] } [18:41:56.400] } [18:41:56.400] } [18:41:56.400] invisible(muffled) [18:41:56.400] } [18:41:56.400] muffleCondition(cond, pattern = "^muffle") [18:41:56.400] } [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] if (TRUE) { [18:41:56.400] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.400] { [18:41:56.400] inherits <- base::inherits [18:41:56.400] invokeRestart <- base::invokeRestart [18:41:56.400] is.null <- base::is.null [18:41:56.400] muffled <- FALSE [18:41:56.400] if (inherits(cond, "message")) { [18:41:56.400] muffled <- grepl(pattern, "muffleMessage") [18:41:56.400] if (muffled) [18:41:56.400] invokeRestart("muffleMessage") [18:41:56.400] } [18:41:56.400] else if (inherits(cond, "warning")) { [18:41:56.400] muffled <- grepl(pattern, "muffleWarning") [18:41:56.400] if (muffled) [18:41:56.400] invokeRestart("muffleWarning") [18:41:56.400] } [18:41:56.400] else if (inherits(cond, "condition")) { [18:41:56.400] if (!is.null(pattern)) { [18:41:56.400] computeRestarts <- base::computeRestarts [18:41:56.400] grepl <- base::grepl [18:41:56.400] restarts <- computeRestarts(cond) [18:41:56.400] for (restart in restarts) { [18:41:56.400] name <- restart$name [18:41:56.400] if (is.null(name)) [18:41:56.400] next [18:41:56.400] if (!grepl(pattern, name)) [18:41:56.400] next [18:41:56.400] invokeRestart(restart) [18:41:56.400] muffled <- TRUE [18:41:56.400] break [18:41:56.400] } [18:41:56.400] } [18:41:56.400] } [18:41:56.400] invisible(muffled) [18:41:56.400] } [18:41:56.400] muffleCondition(cond, pattern = "^muffle") [18:41:56.400] } [18:41:56.400] } [18:41:56.400] } [18:41:56.400] })) [18:41:56.400] }, error = function(ex) { [18:41:56.400] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.400] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.400] ...future.rng), started = ...future.startTime, [18:41:56.400] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.400] version = "1.8"), class = "FutureResult") [18:41:56.400] }, finally = { [18:41:56.400] if (!identical(...future.workdir, getwd())) [18:41:56.400] setwd(...future.workdir) [18:41:56.400] { [18:41:56.400] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.400] ...future.oldOptions$nwarnings <- NULL [18:41:56.400] } [18:41:56.400] base::options(...future.oldOptions) [18:41:56.400] if (.Platform$OS.type == "windows") { [18:41:56.400] old_names <- names(...future.oldEnvVars) [18:41:56.400] envs <- base::Sys.getenv() [18:41:56.400] names <- names(envs) [18:41:56.400] common <- intersect(names, old_names) [18:41:56.400] added <- setdiff(names, old_names) [18:41:56.400] removed <- setdiff(old_names, names) [18:41:56.400] changed <- common[...future.oldEnvVars[common] != [18:41:56.400] envs[common]] [18:41:56.400] NAMES <- toupper(changed) [18:41:56.400] args <- list() [18:41:56.400] for (kk in seq_along(NAMES)) { [18:41:56.400] name <- changed[[kk]] [18:41:56.400] NAME <- NAMES[[kk]] [18:41:56.400] if (name != NAME && is.element(NAME, old_names)) [18:41:56.400] next [18:41:56.400] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.400] } [18:41:56.400] NAMES <- toupper(added) [18:41:56.400] for (kk in seq_along(NAMES)) { [18:41:56.400] name <- added[[kk]] [18:41:56.400] NAME <- NAMES[[kk]] [18:41:56.400] if (name != NAME && is.element(NAME, old_names)) [18:41:56.400] next [18:41:56.400] args[[name]] <- "" [18:41:56.400] } [18:41:56.400] NAMES <- toupper(removed) [18:41:56.400] for (kk in seq_along(NAMES)) { [18:41:56.400] name <- removed[[kk]] [18:41:56.400] NAME <- NAMES[[kk]] [18:41:56.400] if (name != NAME && is.element(NAME, old_names)) [18:41:56.400] next [18:41:56.400] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.400] } [18:41:56.400] if (length(args) > 0) [18:41:56.400] base::do.call(base::Sys.setenv, args = args) [18:41:56.400] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.400] } [18:41:56.400] { [18:41:56.400] if (base::length(...future.futureOptionsAdded) > [18:41:56.400] 0L) { [18:41:56.400] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.400] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.400] base::options(opts) [18:41:56.400] } [18:41:56.400] { [18:41:56.400] { [18:41:56.400] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.400] NULL [18:41:56.400] } [18:41:56.400] options(future.plan = NULL) [18:41:56.400] if (is.na(NA_character_)) [18:41:56.400] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.400] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.400] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.400] .init = FALSE) [18:41:56.400] } [18:41:56.400] } [18:41:56.400] } [18:41:56.400] }) [18:41:56.400] if (TRUE) { [18:41:56.400] base::sink(type = "output", split = FALSE) [18:41:56.400] if (TRUE) { [18:41:56.400] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.400] } [18:41:56.400] else { [18:41:56.400] ...future.result["stdout"] <- base::list(NULL) [18:41:56.400] } [18:41:56.400] base::close(...future.stdout) [18:41:56.400] ...future.stdout <- NULL [18:41:56.400] } [18:41:56.400] ...future.result$conditions <- ...future.conditions [18:41:56.400] ...future.result$finished <- base::Sys.time() [18:41:56.400] ...future.result [18:41:56.400] } [18:41:56.405] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:56.405] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:56.406] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:56.406] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.406] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.407] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.407] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.407] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.408] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.408] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.408] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.408] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:56.409] MultisessionFuture started [18:41:56.409] - Launch lazy future ... done [18:41:56.409] run() for 'MultisessionFuture' ... done [18:41:56.410] Created future: [18:41:56.423] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.424] - Validating connection of MultisessionFuture [18:41:56.424] - received message: FutureResult [18:41:56.424] - Received FutureResult [18:41:56.424] - Erased future from FutureRegistry [18:41:56.424] result() for ClusterFuture ... [18:41:56.425] - result already collected: FutureResult [18:41:56.425] result() for ClusterFuture ... done [18:41:56.425] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.410] MultisessionFuture: [18:41:56.410] Label: 'future_sapply-1' [18:41:56.410] Expression: [18:41:56.410] { [18:41:56.410] do.call(function(...) { [18:41:56.410] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.410] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.410] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.410] on.exit(options(oopts), add = TRUE) [18:41:56.410] } [18:41:56.410] { [18:41:56.410] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.410] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.410] ...future.FUN(...future.X_jj, ...) [18:41:56.410] }) [18:41:56.410] } [18:41:56.410] }, args = future.call.arguments) [18:41:56.410] } [18:41:56.410] Lazy evaluation: FALSE [18:41:56.410] Asynchronous evaluation: TRUE [18:41:56.410] Local evaluation: TRUE [18:41:56.410] Environment: R_GlobalEnv [18:41:56.410] Capture standard output: TRUE [18:41:56.410] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.410] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.410] Packages: [18:41:56.410] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.410] Resolved: TRUE [18:41:56.410] Value: [18:41:56.410] Conditions captured: [18:41:56.410] Early signaling: FALSE [18:41:56.410] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.410] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.425] Chunk #1 of 2 ... DONE [18:41:56.426] Chunk #2 of 2 ... [18:41:56.426] - Finding globals in 'X' for chunk #2 ... [18:41:56.426] getGlobalsAndPackages() ... [18:41:56.426] Searching for globals... [18:41:56.426] [18:41:56.427] Searching for globals ... DONE [18:41:56.427] - globals: [0] [18:41:56.427] getGlobalsAndPackages() ... DONE [18:41:56.427] + additional globals found: [n=0] [18:41:56.427] + additional namespaces needed: [n=0] [18:41:56.427] - Finding globals in 'X' for chunk #2 ... DONE [18:41:56.428] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.428] - seeds: [18:41:56.428] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.428] getGlobalsAndPackages() ... [18:41:56.428] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.428] Resolving globals: FALSE [18:41:56.429] Tweak future expression to call with '...' arguments ... [18:41:56.429] { [18:41:56.429] do.call(function(...) { [18:41:56.429] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.429] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.429] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.429] on.exit(options(oopts), add = TRUE) [18:41:56.429] } [18:41:56.429] { [18:41:56.429] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.429] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.429] ...future.FUN(...future.X_jj, ...) [18:41:56.429] }) [18:41:56.429] } [18:41:56.429] }, args = future.call.arguments) [18:41:56.429] } [18:41:56.429] Tweak future expression to call with '...' arguments ... DONE [18:41:56.430] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.430] [18:41:56.430] getGlobalsAndPackages() ... DONE [18:41:56.430] run() for 'Future' ... [18:41:56.431] - state: 'created' [18:41:56.431] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.446] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.446] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.446] - Field: 'node' [18:41:56.447] - Field: 'label' [18:41:56.447] - Field: 'local' [18:41:56.447] - Field: 'owner' [18:41:56.447] - Field: 'envir' [18:41:56.447] - Field: 'workers' [18:41:56.447] - Field: 'packages' [18:41:56.448] - Field: 'gc' [18:41:56.448] - Field: 'conditions' [18:41:56.448] - Field: 'persistent' [18:41:56.448] - Field: 'expr' [18:41:56.448] - Field: 'uuid' [18:41:56.448] - Field: 'seed' [18:41:56.449] - Field: 'version' [18:41:56.449] - Field: 'result' [18:41:56.449] - Field: 'asynchronous' [18:41:56.449] - Field: 'calls' [18:41:56.449] - Field: 'globals' [18:41:56.450] - Field: 'stdout' [18:41:56.450] - Field: 'earlySignal' [18:41:56.450] - Field: 'lazy' [18:41:56.450] - Field: 'state' [18:41:56.450] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.450] - Launch lazy future ... [18:41:56.451] Packages needed by the future expression (n = 0): [18:41:56.451] Packages needed by future strategies (n = 0): [18:41:56.451] { [18:41:56.451] { [18:41:56.451] { [18:41:56.451] ...future.startTime <- base::Sys.time() [18:41:56.451] { [18:41:56.451] { [18:41:56.451] { [18:41:56.451] { [18:41:56.451] base::local({ [18:41:56.451] has_future <- base::requireNamespace("future", [18:41:56.451] quietly = TRUE) [18:41:56.451] if (has_future) { [18:41:56.451] ns <- base::getNamespace("future") [18:41:56.451] version <- ns[[".package"]][["version"]] [18:41:56.451] if (is.null(version)) [18:41:56.451] version <- utils::packageVersion("future") [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] version <- NULL [18:41:56.451] } [18:41:56.451] if (!has_future || version < "1.8.0") { [18:41:56.451] info <- base::c(r_version = base::gsub("R version ", [18:41:56.451] "", base::R.version$version.string), [18:41:56.451] platform = base::sprintf("%s (%s-bit)", [18:41:56.451] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.451] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.451] "release", "version")], collapse = " "), [18:41:56.451] hostname = base::Sys.info()[["nodename"]]) [18:41:56.451] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.451] info) [18:41:56.451] info <- base::paste(info, collapse = "; ") [18:41:56.451] if (!has_future) { [18:41:56.451] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.451] info) [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.451] info, version) [18:41:56.451] } [18:41:56.451] base::stop(msg) [18:41:56.451] } [18:41:56.451] }) [18:41:56.451] } [18:41:56.451] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.451] base::options(mc.cores = 1L) [18:41:56.451] } [18:41:56.451] ...future.strategy.old <- future::plan("list") [18:41:56.451] options(future.plan = NULL) [18:41:56.451] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.451] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.451] } [18:41:56.451] ...future.workdir <- getwd() [18:41:56.451] } [18:41:56.451] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.451] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.451] } [18:41:56.451] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.451] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.451] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.451] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.451] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.451] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.451] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.451] base::names(...future.oldOptions)) [18:41:56.451] } [18:41:56.451] if (FALSE) { [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] if (TRUE) { [18:41:56.451] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.451] open = "w") [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.451] windows = "NUL", "/dev/null"), open = "w") [18:41:56.451] } [18:41:56.451] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.451] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.451] base::sink(type = "output", split = FALSE) [18:41:56.451] base::close(...future.stdout) [18:41:56.451] }, add = TRUE) [18:41:56.451] } [18:41:56.451] ...future.frame <- base::sys.nframe() [18:41:56.451] ...future.conditions <- base::list() [18:41:56.451] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.451] if (FALSE) { [18:41:56.451] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.451] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.451] } [18:41:56.451] ...future.result <- base::tryCatch({ [18:41:56.451] base::withCallingHandlers({ [18:41:56.451] ...future.value <- base::withVisible(base::local({ [18:41:56.451] ...future.makeSendCondition <- base::local({ [18:41:56.451] sendCondition <- NULL [18:41:56.451] function(frame = 1L) { [18:41:56.451] if (is.function(sendCondition)) [18:41:56.451] return(sendCondition) [18:41:56.451] ns <- getNamespace("parallel") [18:41:56.451] if (exists("sendData", mode = "function", [18:41:56.451] envir = ns)) { [18:41:56.451] parallel_sendData <- get("sendData", mode = "function", [18:41:56.451] envir = ns) [18:41:56.451] envir <- sys.frame(frame) [18:41:56.451] master <- NULL [18:41:56.451] while (!identical(envir, .GlobalEnv) && [18:41:56.451] !identical(envir, emptyenv())) { [18:41:56.451] if (exists("master", mode = "list", envir = envir, [18:41:56.451] inherits = FALSE)) { [18:41:56.451] master <- get("master", mode = "list", [18:41:56.451] envir = envir, inherits = FALSE) [18:41:56.451] if (inherits(master, c("SOCKnode", [18:41:56.451] "SOCK0node"))) { [18:41:56.451] sendCondition <<- function(cond) { [18:41:56.451] data <- list(type = "VALUE", value = cond, [18:41:56.451] success = TRUE) [18:41:56.451] parallel_sendData(master, data) [18:41:56.451] } [18:41:56.451] return(sendCondition) [18:41:56.451] } [18:41:56.451] } [18:41:56.451] frame <- frame + 1L [18:41:56.451] envir <- sys.frame(frame) [18:41:56.451] } [18:41:56.451] } [18:41:56.451] sendCondition <<- function(cond) NULL [18:41:56.451] } [18:41:56.451] }) [18:41:56.451] withCallingHandlers({ [18:41:56.451] { [18:41:56.451] do.call(function(...) { [18:41:56.451] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.451] if (!identical(...future.globals.maxSize.org, [18:41:56.451] ...future.globals.maxSize)) { [18:41:56.451] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.451] on.exit(options(oopts), add = TRUE) [18:41:56.451] } [18:41:56.451] { [18:41:56.451] lapply(seq_along(...future.elements_ii), [18:41:56.451] FUN = function(jj) { [18:41:56.451] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.451] ...future.FUN(...future.X_jj, ...) [18:41:56.451] }) [18:41:56.451] } [18:41:56.451] }, args = future.call.arguments) [18:41:56.451] } [18:41:56.451] }, immediateCondition = function(cond) { [18:41:56.451] sendCondition <- ...future.makeSendCondition() [18:41:56.451] sendCondition(cond) [18:41:56.451] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.451] { [18:41:56.451] inherits <- base::inherits [18:41:56.451] invokeRestart <- base::invokeRestart [18:41:56.451] is.null <- base::is.null [18:41:56.451] muffled <- FALSE [18:41:56.451] if (inherits(cond, "message")) { [18:41:56.451] muffled <- grepl(pattern, "muffleMessage") [18:41:56.451] if (muffled) [18:41:56.451] invokeRestart("muffleMessage") [18:41:56.451] } [18:41:56.451] else if (inherits(cond, "warning")) { [18:41:56.451] muffled <- grepl(pattern, "muffleWarning") [18:41:56.451] if (muffled) [18:41:56.451] invokeRestart("muffleWarning") [18:41:56.451] } [18:41:56.451] else if (inherits(cond, "condition")) { [18:41:56.451] if (!is.null(pattern)) { [18:41:56.451] computeRestarts <- base::computeRestarts [18:41:56.451] grepl <- base::grepl [18:41:56.451] restarts <- computeRestarts(cond) [18:41:56.451] for (restart in restarts) { [18:41:56.451] name <- restart$name [18:41:56.451] if (is.null(name)) [18:41:56.451] next [18:41:56.451] if (!grepl(pattern, name)) [18:41:56.451] next [18:41:56.451] invokeRestart(restart) [18:41:56.451] muffled <- TRUE [18:41:56.451] break [18:41:56.451] } [18:41:56.451] } [18:41:56.451] } [18:41:56.451] invisible(muffled) [18:41:56.451] } [18:41:56.451] muffleCondition(cond) [18:41:56.451] }) [18:41:56.451] })) [18:41:56.451] future::FutureResult(value = ...future.value$value, [18:41:56.451] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.451] ...future.rng), globalenv = if (FALSE) [18:41:56.451] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.451] ...future.globalenv.names)) [18:41:56.451] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.451] }, condition = base::local({ [18:41:56.451] c <- base::c [18:41:56.451] inherits <- base::inherits [18:41:56.451] invokeRestart <- base::invokeRestart [18:41:56.451] length <- base::length [18:41:56.451] list <- base::list [18:41:56.451] seq.int <- base::seq.int [18:41:56.451] signalCondition <- base::signalCondition [18:41:56.451] sys.calls <- base::sys.calls [18:41:56.451] `[[` <- base::`[[` [18:41:56.451] `+` <- base::`+` [18:41:56.451] `<<-` <- base::`<<-` [18:41:56.451] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.451] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.451] 3L)] [18:41:56.451] } [18:41:56.451] function(cond) { [18:41:56.451] is_error <- inherits(cond, "error") [18:41:56.451] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.451] NULL) [18:41:56.451] if (is_error) { [18:41:56.451] sessionInformation <- function() { [18:41:56.451] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.451] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.451] search = base::search(), system = base::Sys.info()) [18:41:56.451] } [18:41:56.451] ...future.conditions[[length(...future.conditions) + [18:41:56.451] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.451] cond$call), session = sessionInformation(), [18:41:56.451] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.451] signalCondition(cond) [18:41:56.451] } [18:41:56.451] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.451] "immediateCondition"))) { [18:41:56.451] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.451] ...future.conditions[[length(...future.conditions) + [18:41:56.451] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.451] if (TRUE && !signal) { [18:41:56.451] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.451] { [18:41:56.451] inherits <- base::inherits [18:41:56.451] invokeRestart <- base::invokeRestart [18:41:56.451] is.null <- base::is.null [18:41:56.451] muffled <- FALSE [18:41:56.451] if (inherits(cond, "message")) { [18:41:56.451] muffled <- grepl(pattern, "muffleMessage") [18:41:56.451] if (muffled) [18:41:56.451] invokeRestart("muffleMessage") [18:41:56.451] } [18:41:56.451] else if (inherits(cond, "warning")) { [18:41:56.451] muffled <- grepl(pattern, "muffleWarning") [18:41:56.451] if (muffled) [18:41:56.451] invokeRestart("muffleWarning") [18:41:56.451] } [18:41:56.451] else if (inherits(cond, "condition")) { [18:41:56.451] if (!is.null(pattern)) { [18:41:56.451] computeRestarts <- base::computeRestarts [18:41:56.451] grepl <- base::grepl [18:41:56.451] restarts <- computeRestarts(cond) [18:41:56.451] for (restart in restarts) { [18:41:56.451] name <- restart$name [18:41:56.451] if (is.null(name)) [18:41:56.451] next [18:41:56.451] if (!grepl(pattern, name)) [18:41:56.451] next [18:41:56.451] invokeRestart(restart) [18:41:56.451] muffled <- TRUE [18:41:56.451] break [18:41:56.451] } [18:41:56.451] } [18:41:56.451] } [18:41:56.451] invisible(muffled) [18:41:56.451] } [18:41:56.451] muffleCondition(cond, pattern = "^muffle") [18:41:56.451] } [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] if (TRUE) { [18:41:56.451] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.451] { [18:41:56.451] inherits <- base::inherits [18:41:56.451] invokeRestart <- base::invokeRestart [18:41:56.451] is.null <- base::is.null [18:41:56.451] muffled <- FALSE [18:41:56.451] if (inherits(cond, "message")) { [18:41:56.451] muffled <- grepl(pattern, "muffleMessage") [18:41:56.451] if (muffled) [18:41:56.451] invokeRestart("muffleMessage") [18:41:56.451] } [18:41:56.451] else if (inherits(cond, "warning")) { [18:41:56.451] muffled <- grepl(pattern, "muffleWarning") [18:41:56.451] if (muffled) [18:41:56.451] invokeRestart("muffleWarning") [18:41:56.451] } [18:41:56.451] else if (inherits(cond, "condition")) { [18:41:56.451] if (!is.null(pattern)) { [18:41:56.451] computeRestarts <- base::computeRestarts [18:41:56.451] grepl <- base::grepl [18:41:56.451] restarts <- computeRestarts(cond) [18:41:56.451] for (restart in restarts) { [18:41:56.451] name <- restart$name [18:41:56.451] if (is.null(name)) [18:41:56.451] next [18:41:56.451] if (!grepl(pattern, name)) [18:41:56.451] next [18:41:56.451] invokeRestart(restart) [18:41:56.451] muffled <- TRUE [18:41:56.451] break [18:41:56.451] } [18:41:56.451] } [18:41:56.451] } [18:41:56.451] invisible(muffled) [18:41:56.451] } [18:41:56.451] muffleCondition(cond, pattern = "^muffle") [18:41:56.451] } [18:41:56.451] } [18:41:56.451] } [18:41:56.451] })) [18:41:56.451] }, error = function(ex) { [18:41:56.451] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.451] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.451] ...future.rng), started = ...future.startTime, [18:41:56.451] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.451] version = "1.8"), class = "FutureResult") [18:41:56.451] }, finally = { [18:41:56.451] if (!identical(...future.workdir, getwd())) [18:41:56.451] setwd(...future.workdir) [18:41:56.451] { [18:41:56.451] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.451] ...future.oldOptions$nwarnings <- NULL [18:41:56.451] } [18:41:56.451] base::options(...future.oldOptions) [18:41:56.451] if (.Platform$OS.type == "windows") { [18:41:56.451] old_names <- names(...future.oldEnvVars) [18:41:56.451] envs <- base::Sys.getenv() [18:41:56.451] names <- names(envs) [18:41:56.451] common <- intersect(names, old_names) [18:41:56.451] added <- setdiff(names, old_names) [18:41:56.451] removed <- setdiff(old_names, names) [18:41:56.451] changed <- common[...future.oldEnvVars[common] != [18:41:56.451] envs[common]] [18:41:56.451] NAMES <- toupper(changed) [18:41:56.451] args <- list() [18:41:56.451] for (kk in seq_along(NAMES)) { [18:41:56.451] name <- changed[[kk]] [18:41:56.451] NAME <- NAMES[[kk]] [18:41:56.451] if (name != NAME && is.element(NAME, old_names)) [18:41:56.451] next [18:41:56.451] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.451] } [18:41:56.451] NAMES <- toupper(added) [18:41:56.451] for (kk in seq_along(NAMES)) { [18:41:56.451] name <- added[[kk]] [18:41:56.451] NAME <- NAMES[[kk]] [18:41:56.451] if (name != NAME && is.element(NAME, old_names)) [18:41:56.451] next [18:41:56.451] args[[name]] <- "" [18:41:56.451] } [18:41:56.451] NAMES <- toupper(removed) [18:41:56.451] for (kk in seq_along(NAMES)) { [18:41:56.451] name <- removed[[kk]] [18:41:56.451] NAME <- NAMES[[kk]] [18:41:56.451] if (name != NAME && is.element(NAME, old_names)) [18:41:56.451] next [18:41:56.451] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.451] } [18:41:56.451] if (length(args) > 0) [18:41:56.451] base::do.call(base::Sys.setenv, args = args) [18:41:56.451] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.451] } [18:41:56.451] { [18:41:56.451] if (base::length(...future.futureOptionsAdded) > [18:41:56.451] 0L) { [18:41:56.451] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.451] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.451] base::options(opts) [18:41:56.451] } [18:41:56.451] { [18:41:56.451] { [18:41:56.451] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.451] NULL [18:41:56.451] } [18:41:56.451] options(future.plan = NULL) [18:41:56.451] if (is.na(NA_character_)) [18:41:56.451] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.451] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.451] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.451] .init = FALSE) [18:41:56.451] } [18:41:56.451] } [18:41:56.451] } [18:41:56.451] }) [18:41:56.451] if (TRUE) { [18:41:56.451] base::sink(type = "output", split = FALSE) [18:41:56.451] if (TRUE) { [18:41:56.451] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.451] } [18:41:56.451] else { [18:41:56.451] ...future.result["stdout"] <- base::list(NULL) [18:41:56.451] } [18:41:56.451] base::close(...future.stdout) [18:41:56.451] ...future.stdout <- NULL [18:41:56.451] } [18:41:56.451] ...future.result$conditions <- ...future.conditions [18:41:56.451] ...future.result$finished <- base::Sys.time() [18:41:56.451] ...future.result [18:41:56.451] } [18:41:56.457] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:56.457] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:56.457] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:56.458] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.458] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.458] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.459] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.459] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.459] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.459] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.460] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.460] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:56.461] MultisessionFuture started [18:41:56.461] - Launch lazy future ... done [18:41:56.461] run() for 'MultisessionFuture' ... done [18:41:56.461] Created future: [18:41:56.476] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.476] - Validating connection of MultisessionFuture [18:41:56.476] - received message: FutureResult [18:41:56.476] - Received FutureResult [18:41:56.477] - Erased future from FutureRegistry [18:41:56.477] result() for ClusterFuture ... [18:41:56.477] - result already collected: FutureResult [18:41:56.477] result() for ClusterFuture ... done [18:41:56.477] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.461] MultisessionFuture: [18:41:56.461] Label: 'future_sapply-2' [18:41:56.461] Expression: [18:41:56.461] { [18:41:56.461] do.call(function(...) { [18:41:56.461] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.461] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.461] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.461] on.exit(options(oopts), add = TRUE) [18:41:56.461] } [18:41:56.461] { [18:41:56.461] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.461] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.461] ...future.FUN(...future.X_jj, ...) [18:41:56.461] }) [18:41:56.461] } [18:41:56.461] }, args = future.call.arguments) [18:41:56.461] } [18:41:56.461] Lazy evaluation: FALSE [18:41:56.461] Asynchronous evaluation: TRUE [18:41:56.461] Local evaluation: TRUE [18:41:56.461] Environment: R_GlobalEnv [18:41:56.461] Capture standard output: TRUE [18:41:56.461] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.461] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.461] Packages: [18:41:56.461] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.461] Resolved: TRUE [18:41:56.461] Value: [18:41:56.461] Conditions captured: [18:41:56.461] Early signaling: FALSE [18:41:56.461] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.461] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.478] Chunk #2 of 2 ... DONE [18:41:56.478] Launching 2 futures (chunks) ... DONE [18:41:56.478] Resolving 2 futures (chunks) ... [18:41:56.478] resolve() on list ... [18:41:56.478] recursive: 0 [18:41:56.478] length: 2 [18:41:56.479] [18:41:56.479] Future #1 [18:41:56.479] result() for ClusterFuture ... [18:41:56.479] - result already collected: FutureResult [18:41:56.479] result() for ClusterFuture ... done [18:41:56.479] result() for ClusterFuture ... [18:41:56.480] - result already collected: FutureResult [18:41:56.480] result() for ClusterFuture ... done [18:41:56.480] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.480] - nx: 2 [18:41:56.480] - relay: TRUE [18:41:56.480] - stdout: TRUE [18:41:56.481] - signal: TRUE [18:41:56.481] - resignal: FALSE [18:41:56.481] - force: TRUE [18:41:56.481] - relayed: [n=2] FALSE, FALSE [18:41:56.481] - queued futures: [n=2] FALSE, FALSE [18:41:56.481] - until=1 [18:41:56.481] - relaying element #1 [18:41:56.482] result() for ClusterFuture ... [18:41:56.482] - result already collected: FutureResult [18:41:56.482] result() for ClusterFuture ... done [18:41:56.482] result() for ClusterFuture ... [18:41:56.482] - result already collected: FutureResult [18:41:56.482] result() for ClusterFuture ... done [18:41:56.483] result() for ClusterFuture ... [18:41:56.483] - result already collected: FutureResult [18:41:56.483] result() for ClusterFuture ... done [18:41:56.483] result() for ClusterFuture ... [18:41:56.483] - result already collected: FutureResult [18:41:56.483] result() for ClusterFuture ... done [18:41:56.484] - relayed: [n=2] TRUE, FALSE [18:41:56.484] - queued futures: [n=2] TRUE, FALSE [18:41:56.484] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.484] length: 1 (resolved future 1) [18:41:56.484] Future #2 [18:41:56.485] result() for ClusterFuture ... [18:41:56.485] - result already collected: FutureResult [18:41:56.485] result() for ClusterFuture ... done [18:41:56.485] result() for ClusterFuture ... [18:41:56.485] - result already collected: FutureResult [18:41:56.485] result() for ClusterFuture ... done [18:41:56.485] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.486] - nx: 2 [18:41:56.486] - relay: TRUE [18:41:56.486] - stdout: TRUE [18:41:56.486] - signal: TRUE [18:41:56.486] - resignal: FALSE [18:41:56.486] - force: TRUE [18:41:56.487] - relayed: [n=2] TRUE, FALSE [18:41:56.487] - queued futures: [n=2] TRUE, FALSE [18:41:56.487] - until=2 [18:41:56.487] - relaying element #2 [18:41:56.487] result() for ClusterFuture ... [18:41:56.487] - result already collected: FutureResult [18:41:56.487] result() for ClusterFuture ... done [18:41:56.488] result() for ClusterFuture ... [18:41:56.488] - result already collected: FutureResult [18:41:56.488] result() for ClusterFuture ... done [18:41:56.488] result() for ClusterFuture ... [18:41:56.488] - result already collected: FutureResult [18:41:56.488] result() for ClusterFuture ... done [18:41:56.489] result() for ClusterFuture ... [18:41:56.489] - result already collected: FutureResult [18:41:56.489] result() for ClusterFuture ... done [18:41:56.489] - relayed: [n=2] TRUE, TRUE [18:41:56.489] - queued futures: [n=2] TRUE, TRUE [18:41:56.490] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.490] length: 0 (resolved future 2) [18:41:56.490] Relaying remaining futures [18:41:56.490] signalConditionsASAP(NULL, pos=0) ... [18:41:56.490] - nx: 2 [18:41:56.490] - relay: TRUE [18:41:56.490] - stdout: TRUE [18:41:56.491] - signal: TRUE [18:41:56.491] - resignal: FALSE [18:41:56.491] - force: TRUE [18:41:56.491] - relayed: [n=2] TRUE, TRUE [18:41:56.491] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.492] - relayed: [n=2] TRUE, TRUE [18:41:56.492] - queued futures: [n=2] TRUE, TRUE [18:41:56.492] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.501] resolve() on list ... DONE [18:41:56.501] result() for ClusterFuture ... [18:41:56.501] - result already collected: FutureResult [18:41:56.501] result() for ClusterFuture ... done [18:41:56.501] result() for ClusterFuture ... [18:41:56.502] - result already collected: FutureResult [18:41:56.502] result() for ClusterFuture ... done [18:41:56.502] result() for ClusterFuture ... [18:41:56.502] - result already collected: FutureResult [18:41:56.502] result() for ClusterFuture ... done [18:41:56.503] result() for ClusterFuture ... [18:41:56.503] - result already collected: FutureResult [18:41:56.503] result() for ClusterFuture ... done [18:41:56.503] - Number of value chunks collected: 2 [18:41:56.503] Resolving 2 futures (chunks) ... DONE [18:41:56.503] Reducing values from 2 chunks ... [18:41:56.504] - Number of values collected after concatenation: 4 [18:41:56.504] - Number of values expected: 4 [18:41:56.504] Reducing values from 2 chunks ... DONE [18:41:56.504] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y1:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 List of 2 $ y0:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 $ y2:List of 4 ..$ A: num [1, 1] 50 ..$ B: num [1, 1] 60 ..$ C: num [1, 1] 70 ..$ D: num [1, 1] 80 [18:41:56.513] future_lapply() ... [18:41:56.516] Number of chunks: 2 [18:41:56.517] getGlobalsAndPackagesXApply() ... [18:41:56.517] - future.globals: TRUE [18:41:56.517] getGlobalsAndPackages() ... [18:41:56.517] Searching for globals... [18:41:56.519] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:56.519] Searching for globals ... DONE [18:41:56.519] Resolving globals: FALSE [18:41:56.520] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:56.520] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:56.520] - globals: [1] 'FUN' [18:41:56.521] [18:41:56.521] getGlobalsAndPackages() ... DONE [18:41:56.521] - globals found/used: [n=1] 'FUN' [18:41:56.521] - needed namespaces: [n=0] [18:41:56.521] Finding globals ... DONE [18:41:56.521] - use_args: TRUE [18:41:56.522] - Getting '...' globals ... [18:41:56.522] resolve() on list ... [18:41:56.522] recursive: 0 [18:41:56.522] length: 1 [18:41:56.522] elements: '...' [18:41:56.523] length: 0 (resolved future 1) [18:41:56.523] resolve() on list ... DONE [18:41:56.523] - '...' content: [n=0] [18:41:56.523] List of 1 [18:41:56.523] $ ...: list() [18:41:56.523] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.523] - attr(*, "where")=List of 1 [18:41:56.523] ..$ ...: [18:41:56.523] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.523] - attr(*, "resolved")= logi TRUE [18:41:56.523] - attr(*, "total_size")= num NA [18:41:56.526] - Getting '...' globals ... DONE [18:41:56.526] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.526] List of 2 [18:41:56.526] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:56.526] $ ... : list() [18:41:56.526] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.526] - attr(*, "where")=List of 2 [18:41:56.526] ..$ ...future.FUN: [18:41:56.526] ..$ ... : [18:41:56.526] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.526] - attr(*, "resolved")= logi FALSE [18:41:56.526] - attr(*, "total_size")= int 6632 [18:41:56.530] Packages to be attached in all futures: [n=0] [18:41:56.530] getGlobalsAndPackagesXApply() ... DONE [18:41:56.530] Number of futures (= number of chunks): 2 [18:41:56.530] Launching 2 futures (chunks) ... [18:41:56.531] Chunk #1 of 2 ... [18:41:56.531] - Finding globals in 'X' for chunk #1 ... [18:41:56.531] getGlobalsAndPackages() ... [18:41:56.531] Searching for globals... [18:41:56.531] [18:41:56.532] Searching for globals ... DONE [18:41:56.532] - globals: [0] [18:41:56.532] getGlobalsAndPackages() ... DONE [18:41:56.532] + additional globals found: [n=0] [18:41:56.532] + additional namespaces needed: [n=0] [18:41:56.532] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.532] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.533] - seeds: [18:41:56.533] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.533] getGlobalsAndPackages() ... [18:41:56.533] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.533] Resolving globals: FALSE [18:41:56.533] Tweak future expression to call with '...' arguments ... [18:41:56.534] { [18:41:56.534] do.call(function(...) { [18:41:56.534] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.534] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.534] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.534] on.exit(options(oopts), add = TRUE) [18:41:56.534] } [18:41:56.534] { [18:41:56.534] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.534] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.534] ...future.FUN(...future.X_jj, ...) [18:41:56.534] }) [18:41:56.534] } [18:41:56.534] }, args = future.call.arguments) [18:41:56.534] } [18:41:56.534] Tweak future expression to call with '...' arguments ... DONE [18:41:56.535] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.535] [18:41:56.535] getGlobalsAndPackages() ... DONE [18:41:56.535] run() for 'Future' ... [18:41:56.536] - state: 'created' [18:41:56.536] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.552] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.552] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.552] - Field: 'node' [18:41:56.553] - Field: 'label' [18:41:56.553] - Field: 'local' [18:41:56.553] - Field: 'owner' [18:41:56.553] - Field: 'envir' [18:41:56.553] - Field: 'workers' [18:41:56.553] - Field: 'packages' [18:41:56.554] - Field: 'gc' [18:41:56.554] - Field: 'conditions' [18:41:56.554] - Field: 'persistent' [18:41:56.554] - Field: 'expr' [18:41:56.554] - Field: 'uuid' [18:41:56.554] - Field: 'seed' [18:41:56.555] - Field: 'version' [18:41:56.555] - Field: 'result' [18:41:56.555] - Field: 'asynchronous' [18:41:56.555] - Field: 'calls' [18:41:56.555] - Field: 'globals' [18:41:56.556] - Field: 'stdout' [18:41:56.556] - Field: 'earlySignal' [18:41:56.556] - Field: 'lazy' [18:41:56.556] - Field: 'state' [18:41:56.556] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.556] - Launch lazy future ... [18:41:56.557] Packages needed by the future expression (n = 0): [18:41:56.557] Packages needed by future strategies (n = 0): [18:41:56.557] { [18:41:56.557] { [18:41:56.557] { [18:41:56.557] ...future.startTime <- base::Sys.time() [18:41:56.557] { [18:41:56.557] { [18:41:56.557] { [18:41:56.557] { [18:41:56.557] base::local({ [18:41:56.557] has_future <- base::requireNamespace("future", [18:41:56.557] quietly = TRUE) [18:41:56.557] if (has_future) { [18:41:56.557] ns <- base::getNamespace("future") [18:41:56.557] version <- ns[[".package"]][["version"]] [18:41:56.557] if (is.null(version)) [18:41:56.557] version <- utils::packageVersion("future") [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] version <- NULL [18:41:56.557] } [18:41:56.557] if (!has_future || version < "1.8.0") { [18:41:56.557] info <- base::c(r_version = base::gsub("R version ", [18:41:56.557] "", base::R.version$version.string), [18:41:56.557] platform = base::sprintf("%s (%s-bit)", [18:41:56.557] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.557] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.557] "release", "version")], collapse = " "), [18:41:56.557] hostname = base::Sys.info()[["nodename"]]) [18:41:56.557] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.557] info) [18:41:56.557] info <- base::paste(info, collapse = "; ") [18:41:56.557] if (!has_future) { [18:41:56.557] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.557] info) [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.557] info, version) [18:41:56.557] } [18:41:56.557] base::stop(msg) [18:41:56.557] } [18:41:56.557] }) [18:41:56.557] } [18:41:56.557] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.557] base::options(mc.cores = 1L) [18:41:56.557] } [18:41:56.557] ...future.strategy.old <- future::plan("list") [18:41:56.557] options(future.plan = NULL) [18:41:56.557] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.557] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.557] } [18:41:56.557] ...future.workdir <- getwd() [18:41:56.557] } [18:41:56.557] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.557] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.557] } [18:41:56.557] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.557] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.557] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.557] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.557] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.557] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.557] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.557] base::names(...future.oldOptions)) [18:41:56.557] } [18:41:56.557] if (FALSE) { [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] if (TRUE) { [18:41:56.557] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.557] open = "w") [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.557] windows = "NUL", "/dev/null"), open = "w") [18:41:56.557] } [18:41:56.557] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.557] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.557] base::sink(type = "output", split = FALSE) [18:41:56.557] base::close(...future.stdout) [18:41:56.557] }, add = TRUE) [18:41:56.557] } [18:41:56.557] ...future.frame <- base::sys.nframe() [18:41:56.557] ...future.conditions <- base::list() [18:41:56.557] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.557] if (FALSE) { [18:41:56.557] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.557] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.557] } [18:41:56.557] ...future.result <- base::tryCatch({ [18:41:56.557] base::withCallingHandlers({ [18:41:56.557] ...future.value <- base::withVisible(base::local({ [18:41:56.557] ...future.makeSendCondition <- base::local({ [18:41:56.557] sendCondition <- NULL [18:41:56.557] function(frame = 1L) { [18:41:56.557] if (is.function(sendCondition)) [18:41:56.557] return(sendCondition) [18:41:56.557] ns <- getNamespace("parallel") [18:41:56.557] if (exists("sendData", mode = "function", [18:41:56.557] envir = ns)) { [18:41:56.557] parallel_sendData <- get("sendData", mode = "function", [18:41:56.557] envir = ns) [18:41:56.557] envir <- sys.frame(frame) [18:41:56.557] master <- NULL [18:41:56.557] while (!identical(envir, .GlobalEnv) && [18:41:56.557] !identical(envir, emptyenv())) { [18:41:56.557] if (exists("master", mode = "list", envir = envir, [18:41:56.557] inherits = FALSE)) { [18:41:56.557] master <- get("master", mode = "list", [18:41:56.557] envir = envir, inherits = FALSE) [18:41:56.557] if (inherits(master, c("SOCKnode", [18:41:56.557] "SOCK0node"))) { [18:41:56.557] sendCondition <<- function(cond) { [18:41:56.557] data <- list(type = "VALUE", value = cond, [18:41:56.557] success = TRUE) [18:41:56.557] parallel_sendData(master, data) [18:41:56.557] } [18:41:56.557] return(sendCondition) [18:41:56.557] } [18:41:56.557] } [18:41:56.557] frame <- frame + 1L [18:41:56.557] envir <- sys.frame(frame) [18:41:56.557] } [18:41:56.557] } [18:41:56.557] sendCondition <<- function(cond) NULL [18:41:56.557] } [18:41:56.557] }) [18:41:56.557] withCallingHandlers({ [18:41:56.557] { [18:41:56.557] do.call(function(...) { [18:41:56.557] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.557] if (!identical(...future.globals.maxSize.org, [18:41:56.557] ...future.globals.maxSize)) { [18:41:56.557] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.557] on.exit(options(oopts), add = TRUE) [18:41:56.557] } [18:41:56.557] { [18:41:56.557] lapply(seq_along(...future.elements_ii), [18:41:56.557] FUN = function(jj) { [18:41:56.557] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.557] ...future.FUN(...future.X_jj, ...) [18:41:56.557] }) [18:41:56.557] } [18:41:56.557] }, args = future.call.arguments) [18:41:56.557] } [18:41:56.557] }, immediateCondition = function(cond) { [18:41:56.557] sendCondition <- ...future.makeSendCondition() [18:41:56.557] sendCondition(cond) [18:41:56.557] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.557] { [18:41:56.557] inherits <- base::inherits [18:41:56.557] invokeRestart <- base::invokeRestart [18:41:56.557] is.null <- base::is.null [18:41:56.557] muffled <- FALSE [18:41:56.557] if (inherits(cond, "message")) { [18:41:56.557] muffled <- grepl(pattern, "muffleMessage") [18:41:56.557] if (muffled) [18:41:56.557] invokeRestart("muffleMessage") [18:41:56.557] } [18:41:56.557] else if (inherits(cond, "warning")) { [18:41:56.557] muffled <- grepl(pattern, "muffleWarning") [18:41:56.557] if (muffled) [18:41:56.557] invokeRestart("muffleWarning") [18:41:56.557] } [18:41:56.557] else if (inherits(cond, "condition")) { [18:41:56.557] if (!is.null(pattern)) { [18:41:56.557] computeRestarts <- base::computeRestarts [18:41:56.557] grepl <- base::grepl [18:41:56.557] restarts <- computeRestarts(cond) [18:41:56.557] for (restart in restarts) { [18:41:56.557] name <- restart$name [18:41:56.557] if (is.null(name)) [18:41:56.557] next [18:41:56.557] if (!grepl(pattern, name)) [18:41:56.557] next [18:41:56.557] invokeRestart(restart) [18:41:56.557] muffled <- TRUE [18:41:56.557] break [18:41:56.557] } [18:41:56.557] } [18:41:56.557] } [18:41:56.557] invisible(muffled) [18:41:56.557] } [18:41:56.557] muffleCondition(cond) [18:41:56.557] }) [18:41:56.557] })) [18:41:56.557] future::FutureResult(value = ...future.value$value, [18:41:56.557] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.557] ...future.rng), globalenv = if (FALSE) [18:41:56.557] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.557] ...future.globalenv.names)) [18:41:56.557] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.557] }, condition = base::local({ [18:41:56.557] c <- base::c [18:41:56.557] inherits <- base::inherits [18:41:56.557] invokeRestart <- base::invokeRestart [18:41:56.557] length <- base::length [18:41:56.557] list <- base::list [18:41:56.557] seq.int <- base::seq.int [18:41:56.557] signalCondition <- base::signalCondition [18:41:56.557] sys.calls <- base::sys.calls [18:41:56.557] `[[` <- base::`[[` [18:41:56.557] `+` <- base::`+` [18:41:56.557] `<<-` <- base::`<<-` [18:41:56.557] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.557] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.557] 3L)] [18:41:56.557] } [18:41:56.557] function(cond) { [18:41:56.557] is_error <- inherits(cond, "error") [18:41:56.557] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.557] NULL) [18:41:56.557] if (is_error) { [18:41:56.557] sessionInformation <- function() { [18:41:56.557] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.557] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.557] search = base::search(), system = base::Sys.info()) [18:41:56.557] } [18:41:56.557] ...future.conditions[[length(...future.conditions) + [18:41:56.557] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.557] cond$call), session = sessionInformation(), [18:41:56.557] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.557] signalCondition(cond) [18:41:56.557] } [18:41:56.557] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.557] "immediateCondition"))) { [18:41:56.557] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.557] ...future.conditions[[length(...future.conditions) + [18:41:56.557] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.557] if (TRUE && !signal) { [18:41:56.557] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.557] { [18:41:56.557] inherits <- base::inherits [18:41:56.557] invokeRestart <- base::invokeRestart [18:41:56.557] is.null <- base::is.null [18:41:56.557] muffled <- FALSE [18:41:56.557] if (inherits(cond, "message")) { [18:41:56.557] muffled <- grepl(pattern, "muffleMessage") [18:41:56.557] if (muffled) [18:41:56.557] invokeRestart("muffleMessage") [18:41:56.557] } [18:41:56.557] else if (inherits(cond, "warning")) { [18:41:56.557] muffled <- grepl(pattern, "muffleWarning") [18:41:56.557] if (muffled) [18:41:56.557] invokeRestart("muffleWarning") [18:41:56.557] } [18:41:56.557] else if (inherits(cond, "condition")) { [18:41:56.557] if (!is.null(pattern)) { [18:41:56.557] computeRestarts <- base::computeRestarts [18:41:56.557] grepl <- base::grepl [18:41:56.557] restarts <- computeRestarts(cond) [18:41:56.557] for (restart in restarts) { [18:41:56.557] name <- restart$name [18:41:56.557] if (is.null(name)) [18:41:56.557] next [18:41:56.557] if (!grepl(pattern, name)) [18:41:56.557] next [18:41:56.557] invokeRestart(restart) [18:41:56.557] muffled <- TRUE [18:41:56.557] break [18:41:56.557] } [18:41:56.557] } [18:41:56.557] } [18:41:56.557] invisible(muffled) [18:41:56.557] } [18:41:56.557] muffleCondition(cond, pattern = "^muffle") [18:41:56.557] } [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] if (TRUE) { [18:41:56.557] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.557] { [18:41:56.557] inherits <- base::inherits [18:41:56.557] invokeRestart <- base::invokeRestart [18:41:56.557] is.null <- base::is.null [18:41:56.557] muffled <- FALSE [18:41:56.557] if (inherits(cond, "message")) { [18:41:56.557] muffled <- grepl(pattern, "muffleMessage") [18:41:56.557] if (muffled) [18:41:56.557] invokeRestart("muffleMessage") [18:41:56.557] } [18:41:56.557] else if (inherits(cond, "warning")) { [18:41:56.557] muffled <- grepl(pattern, "muffleWarning") [18:41:56.557] if (muffled) [18:41:56.557] invokeRestart("muffleWarning") [18:41:56.557] } [18:41:56.557] else if (inherits(cond, "condition")) { [18:41:56.557] if (!is.null(pattern)) { [18:41:56.557] computeRestarts <- base::computeRestarts [18:41:56.557] grepl <- base::grepl [18:41:56.557] restarts <- computeRestarts(cond) [18:41:56.557] for (restart in restarts) { [18:41:56.557] name <- restart$name [18:41:56.557] if (is.null(name)) [18:41:56.557] next [18:41:56.557] if (!grepl(pattern, name)) [18:41:56.557] next [18:41:56.557] invokeRestart(restart) [18:41:56.557] muffled <- TRUE [18:41:56.557] break [18:41:56.557] } [18:41:56.557] } [18:41:56.557] } [18:41:56.557] invisible(muffled) [18:41:56.557] } [18:41:56.557] muffleCondition(cond, pattern = "^muffle") [18:41:56.557] } [18:41:56.557] } [18:41:56.557] } [18:41:56.557] })) [18:41:56.557] }, error = function(ex) { [18:41:56.557] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.557] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.557] ...future.rng), started = ...future.startTime, [18:41:56.557] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.557] version = "1.8"), class = "FutureResult") [18:41:56.557] }, finally = { [18:41:56.557] if (!identical(...future.workdir, getwd())) [18:41:56.557] setwd(...future.workdir) [18:41:56.557] { [18:41:56.557] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.557] ...future.oldOptions$nwarnings <- NULL [18:41:56.557] } [18:41:56.557] base::options(...future.oldOptions) [18:41:56.557] if (.Platform$OS.type == "windows") { [18:41:56.557] old_names <- names(...future.oldEnvVars) [18:41:56.557] envs <- base::Sys.getenv() [18:41:56.557] names <- names(envs) [18:41:56.557] common <- intersect(names, old_names) [18:41:56.557] added <- setdiff(names, old_names) [18:41:56.557] removed <- setdiff(old_names, names) [18:41:56.557] changed <- common[...future.oldEnvVars[common] != [18:41:56.557] envs[common]] [18:41:56.557] NAMES <- toupper(changed) [18:41:56.557] args <- list() [18:41:56.557] for (kk in seq_along(NAMES)) { [18:41:56.557] name <- changed[[kk]] [18:41:56.557] NAME <- NAMES[[kk]] [18:41:56.557] if (name != NAME && is.element(NAME, old_names)) [18:41:56.557] next [18:41:56.557] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.557] } [18:41:56.557] NAMES <- toupper(added) [18:41:56.557] for (kk in seq_along(NAMES)) { [18:41:56.557] name <- added[[kk]] [18:41:56.557] NAME <- NAMES[[kk]] [18:41:56.557] if (name != NAME && is.element(NAME, old_names)) [18:41:56.557] next [18:41:56.557] args[[name]] <- "" [18:41:56.557] } [18:41:56.557] NAMES <- toupper(removed) [18:41:56.557] for (kk in seq_along(NAMES)) { [18:41:56.557] name <- removed[[kk]] [18:41:56.557] NAME <- NAMES[[kk]] [18:41:56.557] if (name != NAME && is.element(NAME, old_names)) [18:41:56.557] next [18:41:56.557] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.557] } [18:41:56.557] if (length(args) > 0) [18:41:56.557] base::do.call(base::Sys.setenv, args = args) [18:41:56.557] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.557] } [18:41:56.557] { [18:41:56.557] if (base::length(...future.futureOptionsAdded) > [18:41:56.557] 0L) { [18:41:56.557] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.557] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.557] base::options(opts) [18:41:56.557] } [18:41:56.557] { [18:41:56.557] { [18:41:56.557] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.557] NULL [18:41:56.557] } [18:41:56.557] options(future.plan = NULL) [18:41:56.557] if (is.na(NA_character_)) [18:41:56.557] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.557] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.557] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.557] .init = FALSE) [18:41:56.557] } [18:41:56.557] } [18:41:56.557] } [18:41:56.557] }) [18:41:56.557] if (TRUE) { [18:41:56.557] base::sink(type = "output", split = FALSE) [18:41:56.557] if (TRUE) { [18:41:56.557] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.557] } [18:41:56.557] else { [18:41:56.557] ...future.result["stdout"] <- base::list(NULL) [18:41:56.557] } [18:41:56.557] base::close(...future.stdout) [18:41:56.557] ...future.stdout <- NULL [18:41:56.557] } [18:41:56.557] ...future.result$conditions <- ...future.conditions [18:41:56.557] ...future.result$finished <- base::Sys.time() [18:41:56.557] ...future.result [18:41:56.557] } [18:41:56.563] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:56.563] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:56.563] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:56.564] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.564] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.564] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.565] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.565] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.565] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.565] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.566] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.566] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:56.567] MultisessionFuture started [18:41:56.567] - Launch lazy future ... done [18:41:56.567] run() for 'MultisessionFuture' ... done [18:41:56.567] Created future: [18:41:56.582] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.582] - Validating connection of MultisessionFuture [18:41:56.582] - received message: FutureResult [18:41:56.582] - Received FutureResult [18:41:56.583] - Erased future from FutureRegistry [18:41:56.583] result() for ClusterFuture ... [18:41:56.583] - result already collected: FutureResult [18:41:56.583] result() for ClusterFuture ... done [18:41:56.583] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.567] MultisessionFuture: [18:41:56.567] Label: 'future_sapply-1' [18:41:56.567] Expression: [18:41:56.567] { [18:41:56.567] do.call(function(...) { [18:41:56.567] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.567] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.567] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.567] on.exit(options(oopts), add = TRUE) [18:41:56.567] } [18:41:56.567] { [18:41:56.567] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.567] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.567] ...future.FUN(...future.X_jj, ...) [18:41:56.567] }) [18:41:56.567] } [18:41:56.567] }, args = future.call.arguments) [18:41:56.567] } [18:41:56.567] Lazy evaluation: FALSE [18:41:56.567] Asynchronous evaluation: TRUE [18:41:56.567] Local evaluation: TRUE [18:41:56.567] Environment: R_GlobalEnv [18:41:56.567] Capture standard output: TRUE [18:41:56.567] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.567] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.567] Packages: [18:41:56.567] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.567] Resolved: TRUE [18:41:56.567] Value: [18:41:56.567] Conditions captured: [18:41:56.567] Early signaling: FALSE [18:41:56.567] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.567] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.584] Chunk #1 of 2 ... DONE [18:41:56.584] Chunk #2 of 2 ... [18:41:56.584] - Finding globals in 'X' for chunk #2 ... [18:41:56.584] getGlobalsAndPackages() ... [18:41:56.584] Searching for globals... [18:41:56.585] [18:41:56.585] Searching for globals ... DONE [18:41:56.585] - globals: [0] [18:41:56.585] getGlobalsAndPackages() ... DONE [18:41:56.585] + additional globals found: [n=0] [18:41:56.585] + additional namespaces needed: [n=0] [18:41:56.586] - Finding globals in 'X' for chunk #2 ... DONE [18:41:56.586] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.586] - seeds: [18:41:56.586] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.586] getGlobalsAndPackages() ... [18:41:56.586] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.587] Resolving globals: FALSE [18:41:56.587] Tweak future expression to call with '...' arguments ... [18:41:56.587] { [18:41:56.587] do.call(function(...) { [18:41:56.587] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.587] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.587] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.587] on.exit(options(oopts), add = TRUE) [18:41:56.587] } [18:41:56.587] { [18:41:56.587] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.587] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.587] ...future.FUN(...future.X_jj, ...) [18:41:56.587] }) [18:41:56.587] } [18:41:56.587] }, args = future.call.arguments) [18:41:56.587] } [18:41:56.587] Tweak future expression to call with '...' arguments ... DONE [18:41:56.588] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.588] [18:41:56.588] getGlobalsAndPackages() ... DONE [18:41:56.589] run() for 'Future' ... [18:41:56.589] - state: 'created' [18:41:56.589] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.605] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.605] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.605] - Field: 'node' [18:41:56.606] - Field: 'label' [18:41:56.606] - Field: 'local' [18:41:56.606] - Field: 'owner' [18:41:56.606] - Field: 'envir' [18:41:56.606] - Field: 'workers' [18:41:56.606] - Field: 'packages' [18:41:56.607] - Field: 'gc' [18:41:56.607] - Field: 'conditions' [18:41:56.607] - Field: 'persistent' [18:41:56.607] - Field: 'expr' [18:41:56.607] - Field: 'uuid' [18:41:56.608] - Field: 'seed' [18:41:56.608] - Field: 'version' [18:41:56.608] - Field: 'result' [18:41:56.608] - Field: 'asynchronous' [18:41:56.608] - Field: 'calls' [18:41:56.608] - Field: 'globals' [18:41:56.609] - Field: 'stdout' [18:41:56.609] - Field: 'earlySignal' [18:41:56.609] - Field: 'lazy' [18:41:56.609] - Field: 'state' [18:41:56.609] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.609] - Launch lazy future ... [18:41:56.610] Packages needed by the future expression (n = 0): [18:41:56.610] Packages needed by future strategies (n = 0): [18:41:56.611] { [18:41:56.611] { [18:41:56.611] { [18:41:56.611] ...future.startTime <- base::Sys.time() [18:41:56.611] { [18:41:56.611] { [18:41:56.611] { [18:41:56.611] { [18:41:56.611] base::local({ [18:41:56.611] has_future <- base::requireNamespace("future", [18:41:56.611] quietly = TRUE) [18:41:56.611] if (has_future) { [18:41:56.611] ns <- base::getNamespace("future") [18:41:56.611] version <- ns[[".package"]][["version"]] [18:41:56.611] if (is.null(version)) [18:41:56.611] version <- utils::packageVersion("future") [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] version <- NULL [18:41:56.611] } [18:41:56.611] if (!has_future || version < "1.8.0") { [18:41:56.611] info <- base::c(r_version = base::gsub("R version ", [18:41:56.611] "", base::R.version$version.string), [18:41:56.611] platform = base::sprintf("%s (%s-bit)", [18:41:56.611] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.611] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.611] "release", "version")], collapse = " "), [18:41:56.611] hostname = base::Sys.info()[["nodename"]]) [18:41:56.611] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.611] info) [18:41:56.611] info <- base::paste(info, collapse = "; ") [18:41:56.611] if (!has_future) { [18:41:56.611] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.611] info) [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.611] info, version) [18:41:56.611] } [18:41:56.611] base::stop(msg) [18:41:56.611] } [18:41:56.611] }) [18:41:56.611] } [18:41:56.611] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.611] base::options(mc.cores = 1L) [18:41:56.611] } [18:41:56.611] ...future.strategy.old <- future::plan("list") [18:41:56.611] options(future.plan = NULL) [18:41:56.611] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.611] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.611] } [18:41:56.611] ...future.workdir <- getwd() [18:41:56.611] } [18:41:56.611] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.611] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.611] } [18:41:56.611] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.611] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.611] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.611] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.611] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.611] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.611] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.611] base::names(...future.oldOptions)) [18:41:56.611] } [18:41:56.611] if (FALSE) { [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] if (TRUE) { [18:41:56.611] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.611] open = "w") [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.611] windows = "NUL", "/dev/null"), open = "w") [18:41:56.611] } [18:41:56.611] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.611] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.611] base::sink(type = "output", split = FALSE) [18:41:56.611] base::close(...future.stdout) [18:41:56.611] }, add = TRUE) [18:41:56.611] } [18:41:56.611] ...future.frame <- base::sys.nframe() [18:41:56.611] ...future.conditions <- base::list() [18:41:56.611] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.611] if (FALSE) { [18:41:56.611] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.611] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.611] } [18:41:56.611] ...future.result <- base::tryCatch({ [18:41:56.611] base::withCallingHandlers({ [18:41:56.611] ...future.value <- base::withVisible(base::local({ [18:41:56.611] ...future.makeSendCondition <- base::local({ [18:41:56.611] sendCondition <- NULL [18:41:56.611] function(frame = 1L) { [18:41:56.611] if (is.function(sendCondition)) [18:41:56.611] return(sendCondition) [18:41:56.611] ns <- getNamespace("parallel") [18:41:56.611] if (exists("sendData", mode = "function", [18:41:56.611] envir = ns)) { [18:41:56.611] parallel_sendData <- get("sendData", mode = "function", [18:41:56.611] envir = ns) [18:41:56.611] envir <- sys.frame(frame) [18:41:56.611] master <- NULL [18:41:56.611] while (!identical(envir, .GlobalEnv) && [18:41:56.611] !identical(envir, emptyenv())) { [18:41:56.611] if (exists("master", mode = "list", envir = envir, [18:41:56.611] inherits = FALSE)) { [18:41:56.611] master <- get("master", mode = "list", [18:41:56.611] envir = envir, inherits = FALSE) [18:41:56.611] if (inherits(master, c("SOCKnode", [18:41:56.611] "SOCK0node"))) { [18:41:56.611] sendCondition <<- function(cond) { [18:41:56.611] data <- list(type = "VALUE", value = cond, [18:41:56.611] success = TRUE) [18:41:56.611] parallel_sendData(master, data) [18:41:56.611] } [18:41:56.611] return(sendCondition) [18:41:56.611] } [18:41:56.611] } [18:41:56.611] frame <- frame + 1L [18:41:56.611] envir <- sys.frame(frame) [18:41:56.611] } [18:41:56.611] } [18:41:56.611] sendCondition <<- function(cond) NULL [18:41:56.611] } [18:41:56.611] }) [18:41:56.611] withCallingHandlers({ [18:41:56.611] { [18:41:56.611] do.call(function(...) { [18:41:56.611] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.611] if (!identical(...future.globals.maxSize.org, [18:41:56.611] ...future.globals.maxSize)) { [18:41:56.611] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.611] on.exit(options(oopts), add = TRUE) [18:41:56.611] } [18:41:56.611] { [18:41:56.611] lapply(seq_along(...future.elements_ii), [18:41:56.611] FUN = function(jj) { [18:41:56.611] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.611] ...future.FUN(...future.X_jj, ...) [18:41:56.611] }) [18:41:56.611] } [18:41:56.611] }, args = future.call.arguments) [18:41:56.611] } [18:41:56.611] }, immediateCondition = function(cond) { [18:41:56.611] sendCondition <- ...future.makeSendCondition() [18:41:56.611] sendCondition(cond) [18:41:56.611] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.611] { [18:41:56.611] inherits <- base::inherits [18:41:56.611] invokeRestart <- base::invokeRestart [18:41:56.611] is.null <- base::is.null [18:41:56.611] muffled <- FALSE [18:41:56.611] if (inherits(cond, "message")) { [18:41:56.611] muffled <- grepl(pattern, "muffleMessage") [18:41:56.611] if (muffled) [18:41:56.611] invokeRestart("muffleMessage") [18:41:56.611] } [18:41:56.611] else if (inherits(cond, "warning")) { [18:41:56.611] muffled <- grepl(pattern, "muffleWarning") [18:41:56.611] if (muffled) [18:41:56.611] invokeRestart("muffleWarning") [18:41:56.611] } [18:41:56.611] else if (inherits(cond, "condition")) { [18:41:56.611] if (!is.null(pattern)) { [18:41:56.611] computeRestarts <- base::computeRestarts [18:41:56.611] grepl <- base::grepl [18:41:56.611] restarts <- computeRestarts(cond) [18:41:56.611] for (restart in restarts) { [18:41:56.611] name <- restart$name [18:41:56.611] if (is.null(name)) [18:41:56.611] next [18:41:56.611] if (!grepl(pattern, name)) [18:41:56.611] next [18:41:56.611] invokeRestart(restart) [18:41:56.611] muffled <- TRUE [18:41:56.611] break [18:41:56.611] } [18:41:56.611] } [18:41:56.611] } [18:41:56.611] invisible(muffled) [18:41:56.611] } [18:41:56.611] muffleCondition(cond) [18:41:56.611] }) [18:41:56.611] })) [18:41:56.611] future::FutureResult(value = ...future.value$value, [18:41:56.611] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.611] ...future.rng), globalenv = if (FALSE) [18:41:56.611] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.611] ...future.globalenv.names)) [18:41:56.611] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.611] }, condition = base::local({ [18:41:56.611] c <- base::c [18:41:56.611] inherits <- base::inherits [18:41:56.611] invokeRestart <- base::invokeRestart [18:41:56.611] length <- base::length [18:41:56.611] list <- base::list [18:41:56.611] seq.int <- base::seq.int [18:41:56.611] signalCondition <- base::signalCondition [18:41:56.611] sys.calls <- base::sys.calls [18:41:56.611] `[[` <- base::`[[` [18:41:56.611] `+` <- base::`+` [18:41:56.611] `<<-` <- base::`<<-` [18:41:56.611] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.611] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.611] 3L)] [18:41:56.611] } [18:41:56.611] function(cond) { [18:41:56.611] is_error <- inherits(cond, "error") [18:41:56.611] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.611] NULL) [18:41:56.611] if (is_error) { [18:41:56.611] sessionInformation <- function() { [18:41:56.611] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.611] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.611] search = base::search(), system = base::Sys.info()) [18:41:56.611] } [18:41:56.611] ...future.conditions[[length(...future.conditions) + [18:41:56.611] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.611] cond$call), session = sessionInformation(), [18:41:56.611] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.611] signalCondition(cond) [18:41:56.611] } [18:41:56.611] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.611] "immediateCondition"))) { [18:41:56.611] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.611] ...future.conditions[[length(...future.conditions) + [18:41:56.611] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.611] if (TRUE && !signal) { [18:41:56.611] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.611] { [18:41:56.611] inherits <- base::inherits [18:41:56.611] invokeRestart <- base::invokeRestart [18:41:56.611] is.null <- base::is.null [18:41:56.611] muffled <- FALSE [18:41:56.611] if (inherits(cond, "message")) { [18:41:56.611] muffled <- grepl(pattern, "muffleMessage") [18:41:56.611] if (muffled) [18:41:56.611] invokeRestart("muffleMessage") [18:41:56.611] } [18:41:56.611] else if (inherits(cond, "warning")) { [18:41:56.611] muffled <- grepl(pattern, "muffleWarning") [18:41:56.611] if (muffled) [18:41:56.611] invokeRestart("muffleWarning") [18:41:56.611] } [18:41:56.611] else if (inherits(cond, "condition")) { [18:41:56.611] if (!is.null(pattern)) { [18:41:56.611] computeRestarts <- base::computeRestarts [18:41:56.611] grepl <- base::grepl [18:41:56.611] restarts <- computeRestarts(cond) [18:41:56.611] for (restart in restarts) { [18:41:56.611] name <- restart$name [18:41:56.611] if (is.null(name)) [18:41:56.611] next [18:41:56.611] if (!grepl(pattern, name)) [18:41:56.611] next [18:41:56.611] invokeRestart(restart) [18:41:56.611] muffled <- TRUE [18:41:56.611] break [18:41:56.611] } [18:41:56.611] } [18:41:56.611] } [18:41:56.611] invisible(muffled) [18:41:56.611] } [18:41:56.611] muffleCondition(cond, pattern = "^muffle") [18:41:56.611] } [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] if (TRUE) { [18:41:56.611] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.611] { [18:41:56.611] inherits <- base::inherits [18:41:56.611] invokeRestart <- base::invokeRestart [18:41:56.611] is.null <- base::is.null [18:41:56.611] muffled <- FALSE [18:41:56.611] if (inherits(cond, "message")) { [18:41:56.611] muffled <- grepl(pattern, "muffleMessage") [18:41:56.611] if (muffled) [18:41:56.611] invokeRestart("muffleMessage") [18:41:56.611] } [18:41:56.611] else if (inherits(cond, "warning")) { [18:41:56.611] muffled <- grepl(pattern, "muffleWarning") [18:41:56.611] if (muffled) [18:41:56.611] invokeRestart("muffleWarning") [18:41:56.611] } [18:41:56.611] else if (inherits(cond, "condition")) { [18:41:56.611] if (!is.null(pattern)) { [18:41:56.611] computeRestarts <- base::computeRestarts [18:41:56.611] grepl <- base::grepl [18:41:56.611] restarts <- computeRestarts(cond) [18:41:56.611] for (restart in restarts) { [18:41:56.611] name <- restart$name [18:41:56.611] if (is.null(name)) [18:41:56.611] next [18:41:56.611] if (!grepl(pattern, name)) [18:41:56.611] next [18:41:56.611] invokeRestart(restart) [18:41:56.611] muffled <- TRUE [18:41:56.611] break [18:41:56.611] } [18:41:56.611] } [18:41:56.611] } [18:41:56.611] invisible(muffled) [18:41:56.611] } [18:41:56.611] muffleCondition(cond, pattern = "^muffle") [18:41:56.611] } [18:41:56.611] } [18:41:56.611] } [18:41:56.611] })) [18:41:56.611] }, error = function(ex) { [18:41:56.611] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.611] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.611] ...future.rng), started = ...future.startTime, [18:41:56.611] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.611] version = "1.8"), class = "FutureResult") [18:41:56.611] }, finally = { [18:41:56.611] if (!identical(...future.workdir, getwd())) [18:41:56.611] setwd(...future.workdir) [18:41:56.611] { [18:41:56.611] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.611] ...future.oldOptions$nwarnings <- NULL [18:41:56.611] } [18:41:56.611] base::options(...future.oldOptions) [18:41:56.611] if (.Platform$OS.type == "windows") { [18:41:56.611] old_names <- names(...future.oldEnvVars) [18:41:56.611] envs <- base::Sys.getenv() [18:41:56.611] names <- names(envs) [18:41:56.611] common <- intersect(names, old_names) [18:41:56.611] added <- setdiff(names, old_names) [18:41:56.611] removed <- setdiff(old_names, names) [18:41:56.611] changed <- common[...future.oldEnvVars[common] != [18:41:56.611] envs[common]] [18:41:56.611] NAMES <- toupper(changed) [18:41:56.611] args <- list() [18:41:56.611] for (kk in seq_along(NAMES)) { [18:41:56.611] name <- changed[[kk]] [18:41:56.611] NAME <- NAMES[[kk]] [18:41:56.611] if (name != NAME && is.element(NAME, old_names)) [18:41:56.611] next [18:41:56.611] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.611] } [18:41:56.611] NAMES <- toupper(added) [18:41:56.611] for (kk in seq_along(NAMES)) { [18:41:56.611] name <- added[[kk]] [18:41:56.611] NAME <- NAMES[[kk]] [18:41:56.611] if (name != NAME && is.element(NAME, old_names)) [18:41:56.611] next [18:41:56.611] args[[name]] <- "" [18:41:56.611] } [18:41:56.611] NAMES <- toupper(removed) [18:41:56.611] for (kk in seq_along(NAMES)) { [18:41:56.611] name <- removed[[kk]] [18:41:56.611] NAME <- NAMES[[kk]] [18:41:56.611] if (name != NAME && is.element(NAME, old_names)) [18:41:56.611] next [18:41:56.611] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.611] } [18:41:56.611] if (length(args) > 0) [18:41:56.611] base::do.call(base::Sys.setenv, args = args) [18:41:56.611] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.611] } [18:41:56.611] { [18:41:56.611] if (base::length(...future.futureOptionsAdded) > [18:41:56.611] 0L) { [18:41:56.611] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.611] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.611] base::options(opts) [18:41:56.611] } [18:41:56.611] { [18:41:56.611] { [18:41:56.611] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.611] NULL [18:41:56.611] } [18:41:56.611] options(future.plan = NULL) [18:41:56.611] if (is.na(NA_character_)) [18:41:56.611] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.611] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.611] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.611] .init = FALSE) [18:41:56.611] } [18:41:56.611] } [18:41:56.611] } [18:41:56.611] }) [18:41:56.611] if (TRUE) { [18:41:56.611] base::sink(type = "output", split = FALSE) [18:41:56.611] if (TRUE) { [18:41:56.611] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.611] } [18:41:56.611] else { [18:41:56.611] ...future.result["stdout"] <- base::list(NULL) [18:41:56.611] } [18:41:56.611] base::close(...future.stdout) [18:41:56.611] ...future.stdout <- NULL [18:41:56.611] } [18:41:56.611] ...future.result$conditions <- ...future.conditions [18:41:56.611] ...future.result$finished <- base::Sys.time() [18:41:56.611] ...future.result [18:41:56.611] } [18:41:56.616] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:56.616] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:56.616] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:56.617] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.617] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.617] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.618] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.618] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.618] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.618] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.619] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.619] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:56.620] MultisessionFuture started [18:41:56.620] - Launch lazy future ... done [18:41:56.620] run() for 'MultisessionFuture' ... done [18:41:56.620] Created future: [18:41:56.634] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.634] - Validating connection of MultisessionFuture [18:41:56.634] - received message: FutureResult [18:41:56.635] - Received FutureResult [18:41:56.635] - Erased future from FutureRegistry [18:41:56.635] result() for ClusterFuture ... [18:41:56.635] - result already collected: FutureResult [18:41:56.635] result() for ClusterFuture ... done [18:41:56.635] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.620] MultisessionFuture: [18:41:56.620] Label: 'future_sapply-2' [18:41:56.620] Expression: [18:41:56.620] { [18:41:56.620] do.call(function(...) { [18:41:56.620] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.620] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.620] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.620] on.exit(options(oopts), add = TRUE) [18:41:56.620] } [18:41:56.620] { [18:41:56.620] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.620] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.620] ...future.FUN(...future.X_jj, ...) [18:41:56.620] }) [18:41:56.620] } [18:41:56.620] }, args = future.call.arguments) [18:41:56.620] } [18:41:56.620] Lazy evaluation: FALSE [18:41:56.620] Asynchronous evaluation: TRUE [18:41:56.620] Local evaluation: TRUE [18:41:56.620] Environment: R_GlobalEnv [18:41:56.620] Capture standard output: TRUE [18:41:56.620] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.620] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.620] Packages: [18:41:56.620] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.620] Resolved: TRUE [18:41:56.620] Value: [18:41:56.620] Conditions captured: [18:41:56.620] Early signaling: FALSE [18:41:56.620] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.620] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.636] Chunk #2 of 2 ... DONE [18:41:56.636] Launching 2 futures (chunks) ... DONE [18:41:56.636] Resolving 2 futures (chunks) ... [18:41:56.636] resolve() on list ... [18:41:56.636] recursive: 0 [18:41:56.637] length: 2 [18:41:56.637] [18:41:56.637] Future #1 [18:41:56.637] result() for ClusterFuture ... [18:41:56.637] - result already collected: FutureResult [18:41:56.637] result() for ClusterFuture ... done [18:41:56.638] result() for ClusterFuture ... [18:41:56.638] - result already collected: FutureResult [18:41:56.638] result() for ClusterFuture ... done [18:41:56.638] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.638] - nx: 2 [18:41:56.638] - relay: TRUE [18:41:56.639] - stdout: TRUE [18:41:56.639] - signal: TRUE [18:41:56.639] - resignal: FALSE [18:41:56.639] - force: TRUE [18:41:56.639] - relayed: [n=2] FALSE, FALSE [18:41:56.639] - queued futures: [n=2] FALSE, FALSE [18:41:56.639] - until=1 [18:41:56.640] - relaying element #1 [18:41:56.640] result() for ClusterFuture ... [18:41:56.640] - result already collected: FutureResult [18:41:56.640] result() for ClusterFuture ... done [18:41:56.640] result() for ClusterFuture ... [18:41:56.640] - result already collected: FutureResult [18:41:56.641] result() for ClusterFuture ... done [18:41:56.641] result() for ClusterFuture ... [18:41:56.641] - result already collected: FutureResult [18:41:56.641] result() for ClusterFuture ... done [18:41:56.641] result() for ClusterFuture ... [18:41:56.641] - result already collected: FutureResult [18:41:56.642] result() for ClusterFuture ... done [18:41:56.642] - relayed: [n=2] TRUE, FALSE [18:41:56.642] - queued futures: [n=2] TRUE, FALSE [18:41:56.642] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.642] length: 1 (resolved future 1) [18:41:56.642] Future #2 [18:41:56.643] result() for ClusterFuture ... [18:41:56.643] - result already collected: FutureResult [18:41:56.643] result() for ClusterFuture ... done [18:41:56.643] result() for ClusterFuture ... [18:41:56.643] - result already collected: FutureResult [18:41:56.643] result() for ClusterFuture ... done [18:41:56.644] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.644] - nx: 2 [18:41:56.644] - relay: TRUE [18:41:56.644] - stdout: TRUE [18:41:56.644] - signal: TRUE [18:41:56.644] - resignal: FALSE [18:41:56.644] - force: TRUE [18:41:56.645] - relayed: [n=2] TRUE, FALSE [18:41:56.645] - queued futures: [n=2] TRUE, FALSE [18:41:56.645] - until=2 [18:41:56.645] - relaying element #2 [18:41:56.645] result() for ClusterFuture ... [18:41:56.646] - result already collected: FutureResult [18:41:56.646] result() for ClusterFuture ... done [18:41:56.646] result() for ClusterFuture ... [18:41:56.646] - result already collected: FutureResult [18:41:56.646] result() for ClusterFuture ... done [18:41:56.646] result() for ClusterFuture ... [18:41:56.647] - result already collected: FutureResult [18:41:56.647] result() for ClusterFuture ... done [18:41:56.647] result() for ClusterFuture ... [18:41:56.647] - result already collected: FutureResult [18:41:56.647] result() for ClusterFuture ... done [18:41:56.647] - relayed: [n=2] TRUE, TRUE [18:41:56.647] - queued futures: [n=2] TRUE, TRUE [18:41:56.648] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.648] length: 0 (resolved future 2) [18:41:56.648] Relaying remaining futures [18:41:56.648] signalConditionsASAP(NULL, pos=0) ... [18:41:56.648] - nx: 2 [18:41:56.648] - relay: TRUE [18:41:56.649] - stdout: TRUE [18:41:56.649] - signal: TRUE [18:41:56.649] - resignal: FALSE [18:41:56.649] - force: TRUE [18:41:56.649] - relayed: [n=2] TRUE, TRUE [18:41:56.649] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.650] - relayed: [n=2] TRUE, TRUE [18:41:56.650] - queued futures: [n=2] TRUE, TRUE [18:41:56.650] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.650] resolve() on list ... DONE [18:41:56.650] result() for ClusterFuture ... [18:41:56.650] - result already collected: FutureResult [18:41:56.651] result() for ClusterFuture ... done [18:41:56.651] result() for ClusterFuture ... [18:41:56.651] - result already collected: FutureResult [18:41:56.651] result() for ClusterFuture ... done [18:41:56.651] result() for ClusterFuture ... [18:41:56.651] - result already collected: FutureResult [18:41:56.651] result() for ClusterFuture ... done [18:41:56.652] result() for ClusterFuture ... [18:41:56.652] - result already collected: FutureResult [18:41:56.652] result() for ClusterFuture ... done [18:41:56.652] - Number of value chunks collected: 2 [18:41:56.652] Resolving 2 futures (chunks) ... DONE [18:41:56.652] Reducing values from 2 chunks ... [18:41:56.653] - Number of values collected after concatenation: 4 [18:41:56.653] - Number of values expected: 4 [18:41:56.653] Reducing values from 2 chunks ... DONE [18:41:56.653] future_lapply() ... DONE List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y1:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... List of 2 $ y0:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... $ y2:List of 4 ..$ A: num [1:3, 1:5] 100 100 100 200 200 200 300 300 300 400 ... ..$ B: num [1:3, 1:5] 120 120 120 240 240 240 360 360 360 480 ... ..$ C: num [1:3, 1:5] 140 140 140 280 280 280 420 420 420 560 ... ..$ D: num [1:3, 1:5] 160 160 160 320 320 320 480 480 480 640 ... [18:41:56.667] future_lapply() ... [18:41:56.670] Number of chunks: 2 [18:41:56.670] getGlobalsAndPackagesXApply() ... [18:41:56.671] - future.globals: TRUE [18:41:56.671] getGlobalsAndPackages() ... [18:41:56.671] Searching for globals... [18:41:56.672] - globals found: [1] 'FUN' [18:41:56.672] Searching for globals ... DONE [18:41:56.673] Resolving globals: FALSE [18:41:56.673] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:56.674] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:56.674] - globals: [1] 'FUN' [18:41:56.674] [18:41:56.674] getGlobalsAndPackages() ... DONE [18:41:56.674] - globals found/used: [n=1] 'FUN' [18:41:56.674] - needed namespaces: [n=0] [18:41:56.675] Finding globals ... DONE [18:41:56.675] - use_args: TRUE [18:41:56.675] - Getting '...' globals ... [18:41:56.675] resolve() on list ... [18:41:56.676] recursive: 0 [18:41:56.676] length: 1 [18:41:56.676] elements: '...' [18:41:56.676] length: 0 (resolved future 1) [18:41:56.676] resolve() on list ... DONE [18:41:56.677] - '...' content: [n=0] [18:41:56.677] List of 1 [18:41:56.677] $ ...: list() [18:41:56.677] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.677] - attr(*, "where")=List of 1 [18:41:56.677] ..$ ...: [18:41:56.677] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.677] - attr(*, "resolved")= logi TRUE [18:41:56.677] - attr(*, "total_size")= num NA [18:41:56.680] - Getting '...' globals ... DONE [18:41:56.680] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.680] List of 2 [18:41:56.680] $ ...future.FUN:function (x) [18:41:56.680] $ ... : list() [18:41:56.680] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.680] - attr(*, "where")=List of 2 [18:41:56.680] ..$ ...future.FUN: [18:41:56.680] ..$ ... : [18:41:56.680] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.680] - attr(*, "resolved")= logi FALSE [18:41:56.680] - attr(*, "total_size")= int 4910 [18:41:56.684] Packages to be attached in all futures: [n=0] [18:41:56.684] getGlobalsAndPackagesXApply() ... DONE [18:41:56.684] Number of futures (= number of chunks): 2 [18:41:56.684] Launching 2 futures (chunks) ... [18:41:56.684] Chunk #1 of 2 ... [18:41:56.685] - Finding globals in 'X' for chunk #1 ... [18:41:56.685] getGlobalsAndPackages() ... [18:41:56.685] Searching for globals... [18:41:56.685] [18:41:56.686] Searching for globals ... DONE [18:41:56.686] - globals: [0] [18:41:56.686] getGlobalsAndPackages() ... DONE [18:41:56.686] + additional globals found: [n=0] [18:41:56.686] + additional namespaces needed: [n=0] [18:41:56.686] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.687] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.687] - seeds: [18:41:56.687] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.687] getGlobalsAndPackages() ... [18:41:56.687] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.687] Resolving globals: FALSE [18:41:56.688] Tweak future expression to call with '...' arguments ... [18:41:56.688] { [18:41:56.688] do.call(function(...) { [18:41:56.688] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.688] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.688] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.688] on.exit(options(oopts), add = TRUE) [18:41:56.688] } [18:41:56.688] { [18:41:56.688] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.688] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.688] ...future.FUN(...future.X_jj, ...) [18:41:56.688] }) [18:41:56.688] } [18:41:56.688] }, args = future.call.arguments) [18:41:56.688] } [18:41:56.688] Tweak future expression to call with '...' arguments ... DONE [18:41:56.689] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.689] [18:41:56.689] getGlobalsAndPackages() ... DONE [18:41:56.690] run() for 'Future' ... [18:41:56.690] - state: 'created' [18:41:56.690] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.706] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.707] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.707] - Field: 'node' [18:41:56.707] - Field: 'label' [18:41:56.707] - Field: 'local' [18:41:56.707] - Field: 'owner' [18:41:56.708] - Field: 'envir' [18:41:56.708] - Field: 'workers' [18:41:56.708] - Field: 'packages' [18:41:56.708] - Field: 'gc' [18:41:56.708] - Field: 'conditions' [18:41:56.708] - Field: 'persistent' [18:41:56.709] - Field: 'expr' [18:41:56.709] - Field: 'uuid' [18:41:56.709] - Field: 'seed' [18:41:56.709] - Field: 'version' [18:41:56.709] - Field: 'result' [18:41:56.709] - Field: 'asynchronous' [18:41:56.710] - Field: 'calls' [18:41:56.710] - Field: 'globals' [18:41:56.710] - Field: 'stdout' [18:41:56.710] - Field: 'earlySignal' [18:41:56.710] - Field: 'lazy' [18:41:56.711] - Field: 'state' [18:41:56.711] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.711] - Launch lazy future ... [18:41:56.711] Packages needed by the future expression (n = 0): [18:41:56.711] Packages needed by future strategies (n = 0): [18:41:56.712] { [18:41:56.712] { [18:41:56.712] { [18:41:56.712] ...future.startTime <- base::Sys.time() [18:41:56.712] { [18:41:56.712] { [18:41:56.712] { [18:41:56.712] { [18:41:56.712] base::local({ [18:41:56.712] has_future <- base::requireNamespace("future", [18:41:56.712] quietly = TRUE) [18:41:56.712] if (has_future) { [18:41:56.712] ns <- base::getNamespace("future") [18:41:56.712] version <- ns[[".package"]][["version"]] [18:41:56.712] if (is.null(version)) [18:41:56.712] version <- utils::packageVersion("future") [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] version <- NULL [18:41:56.712] } [18:41:56.712] if (!has_future || version < "1.8.0") { [18:41:56.712] info <- base::c(r_version = base::gsub("R version ", [18:41:56.712] "", base::R.version$version.string), [18:41:56.712] platform = base::sprintf("%s (%s-bit)", [18:41:56.712] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.712] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.712] "release", "version")], collapse = " "), [18:41:56.712] hostname = base::Sys.info()[["nodename"]]) [18:41:56.712] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.712] info) [18:41:56.712] info <- base::paste(info, collapse = "; ") [18:41:56.712] if (!has_future) { [18:41:56.712] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.712] info) [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.712] info, version) [18:41:56.712] } [18:41:56.712] base::stop(msg) [18:41:56.712] } [18:41:56.712] }) [18:41:56.712] } [18:41:56.712] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.712] base::options(mc.cores = 1L) [18:41:56.712] } [18:41:56.712] ...future.strategy.old <- future::plan("list") [18:41:56.712] options(future.plan = NULL) [18:41:56.712] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.712] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.712] } [18:41:56.712] ...future.workdir <- getwd() [18:41:56.712] } [18:41:56.712] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.712] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.712] } [18:41:56.712] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.712] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.712] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.712] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.712] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.712] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.712] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.712] base::names(...future.oldOptions)) [18:41:56.712] } [18:41:56.712] if (FALSE) { [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] if (TRUE) { [18:41:56.712] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.712] open = "w") [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.712] windows = "NUL", "/dev/null"), open = "w") [18:41:56.712] } [18:41:56.712] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.712] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.712] base::sink(type = "output", split = FALSE) [18:41:56.712] base::close(...future.stdout) [18:41:56.712] }, add = TRUE) [18:41:56.712] } [18:41:56.712] ...future.frame <- base::sys.nframe() [18:41:56.712] ...future.conditions <- base::list() [18:41:56.712] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.712] if (FALSE) { [18:41:56.712] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.712] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.712] } [18:41:56.712] ...future.result <- base::tryCatch({ [18:41:56.712] base::withCallingHandlers({ [18:41:56.712] ...future.value <- base::withVisible(base::local({ [18:41:56.712] ...future.makeSendCondition <- base::local({ [18:41:56.712] sendCondition <- NULL [18:41:56.712] function(frame = 1L) { [18:41:56.712] if (is.function(sendCondition)) [18:41:56.712] return(sendCondition) [18:41:56.712] ns <- getNamespace("parallel") [18:41:56.712] if (exists("sendData", mode = "function", [18:41:56.712] envir = ns)) { [18:41:56.712] parallel_sendData <- get("sendData", mode = "function", [18:41:56.712] envir = ns) [18:41:56.712] envir <- sys.frame(frame) [18:41:56.712] master <- NULL [18:41:56.712] while (!identical(envir, .GlobalEnv) && [18:41:56.712] !identical(envir, emptyenv())) { [18:41:56.712] if (exists("master", mode = "list", envir = envir, [18:41:56.712] inherits = FALSE)) { [18:41:56.712] master <- get("master", mode = "list", [18:41:56.712] envir = envir, inherits = FALSE) [18:41:56.712] if (inherits(master, c("SOCKnode", [18:41:56.712] "SOCK0node"))) { [18:41:56.712] sendCondition <<- function(cond) { [18:41:56.712] data <- list(type = "VALUE", value = cond, [18:41:56.712] success = TRUE) [18:41:56.712] parallel_sendData(master, data) [18:41:56.712] } [18:41:56.712] return(sendCondition) [18:41:56.712] } [18:41:56.712] } [18:41:56.712] frame <- frame + 1L [18:41:56.712] envir <- sys.frame(frame) [18:41:56.712] } [18:41:56.712] } [18:41:56.712] sendCondition <<- function(cond) NULL [18:41:56.712] } [18:41:56.712] }) [18:41:56.712] withCallingHandlers({ [18:41:56.712] { [18:41:56.712] do.call(function(...) { [18:41:56.712] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.712] if (!identical(...future.globals.maxSize.org, [18:41:56.712] ...future.globals.maxSize)) { [18:41:56.712] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.712] on.exit(options(oopts), add = TRUE) [18:41:56.712] } [18:41:56.712] { [18:41:56.712] lapply(seq_along(...future.elements_ii), [18:41:56.712] FUN = function(jj) { [18:41:56.712] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.712] ...future.FUN(...future.X_jj, ...) [18:41:56.712] }) [18:41:56.712] } [18:41:56.712] }, args = future.call.arguments) [18:41:56.712] } [18:41:56.712] }, immediateCondition = function(cond) { [18:41:56.712] sendCondition <- ...future.makeSendCondition() [18:41:56.712] sendCondition(cond) [18:41:56.712] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.712] { [18:41:56.712] inherits <- base::inherits [18:41:56.712] invokeRestart <- base::invokeRestart [18:41:56.712] is.null <- base::is.null [18:41:56.712] muffled <- FALSE [18:41:56.712] if (inherits(cond, "message")) { [18:41:56.712] muffled <- grepl(pattern, "muffleMessage") [18:41:56.712] if (muffled) [18:41:56.712] invokeRestart("muffleMessage") [18:41:56.712] } [18:41:56.712] else if (inherits(cond, "warning")) { [18:41:56.712] muffled <- grepl(pattern, "muffleWarning") [18:41:56.712] if (muffled) [18:41:56.712] invokeRestart("muffleWarning") [18:41:56.712] } [18:41:56.712] else if (inherits(cond, "condition")) { [18:41:56.712] if (!is.null(pattern)) { [18:41:56.712] computeRestarts <- base::computeRestarts [18:41:56.712] grepl <- base::grepl [18:41:56.712] restarts <- computeRestarts(cond) [18:41:56.712] for (restart in restarts) { [18:41:56.712] name <- restart$name [18:41:56.712] if (is.null(name)) [18:41:56.712] next [18:41:56.712] if (!grepl(pattern, name)) [18:41:56.712] next [18:41:56.712] invokeRestart(restart) [18:41:56.712] muffled <- TRUE [18:41:56.712] break [18:41:56.712] } [18:41:56.712] } [18:41:56.712] } [18:41:56.712] invisible(muffled) [18:41:56.712] } [18:41:56.712] muffleCondition(cond) [18:41:56.712] }) [18:41:56.712] })) [18:41:56.712] future::FutureResult(value = ...future.value$value, [18:41:56.712] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.712] ...future.rng), globalenv = if (FALSE) [18:41:56.712] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.712] ...future.globalenv.names)) [18:41:56.712] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.712] }, condition = base::local({ [18:41:56.712] c <- base::c [18:41:56.712] inherits <- base::inherits [18:41:56.712] invokeRestart <- base::invokeRestart [18:41:56.712] length <- base::length [18:41:56.712] list <- base::list [18:41:56.712] seq.int <- base::seq.int [18:41:56.712] signalCondition <- base::signalCondition [18:41:56.712] sys.calls <- base::sys.calls [18:41:56.712] `[[` <- base::`[[` [18:41:56.712] `+` <- base::`+` [18:41:56.712] `<<-` <- base::`<<-` [18:41:56.712] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.712] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.712] 3L)] [18:41:56.712] } [18:41:56.712] function(cond) { [18:41:56.712] is_error <- inherits(cond, "error") [18:41:56.712] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.712] NULL) [18:41:56.712] if (is_error) { [18:41:56.712] sessionInformation <- function() { [18:41:56.712] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.712] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.712] search = base::search(), system = base::Sys.info()) [18:41:56.712] } [18:41:56.712] ...future.conditions[[length(...future.conditions) + [18:41:56.712] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.712] cond$call), session = sessionInformation(), [18:41:56.712] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.712] signalCondition(cond) [18:41:56.712] } [18:41:56.712] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.712] "immediateCondition"))) { [18:41:56.712] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.712] ...future.conditions[[length(...future.conditions) + [18:41:56.712] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.712] if (TRUE && !signal) { [18:41:56.712] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.712] { [18:41:56.712] inherits <- base::inherits [18:41:56.712] invokeRestart <- base::invokeRestart [18:41:56.712] is.null <- base::is.null [18:41:56.712] muffled <- FALSE [18:41:56.712] if (inherits(cond, "message")) { [18:41:56.712] muffled <- grepl(pattern, "muffleMessage") [18:41:56.712] if (muffled) [18:41:56.712] invokeRestart("muffleMessage") [18:41:56.712] } [18:41:56.712] else if (inherits(cond, "warning")) { [18:41:56.712] muffled <- grepl(pattern, "muffleWarning") [18:41:56.712] if (muffled) [18:41:56.712] invokeRestart("muffleWarning") [18:41:56.712] } [18:41:56.712] else if (inherits(cond, "condition")) { [18:41:56.712] if (!is.null(pattern)) { [18:41:56.712] computeRestarts <- base::computeRestarts [18:41:56.712] grepl <- base::grepl [18:41:56.712] restarts <- computeRestarts(cond) [18:41:56.712] for (restart in restarts) { [18:41:56.712] name <- restart$name [18:41:56.712] if (is.null(name)) [18:41:56.712] next [18:41:56.712] if (!grepl(pattern, name)) [18:41:56.712] next [18:41:56.712] invokeRestart(restart) [18:41:56.712] muffled <- TRUE [18:41:56.712] break [18:41:56.712] } [18:41:56.712] } [18:41:56.712] } [18:41:56.712] invisible(muffled) [18:41:56.712] } [18:41:56.712] muffleCondition(cond, pattern = "^muffle") [18:41:56.712] } [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] if (TRUE) { [18:41:56.712] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.712] { [18:41:56.712] inherits <- base::inherits [18:41:56.712] invokeRestart <- base::invokeRestart [18:41:56.712] is.null <- base::is.null [18:41:56.712] muffled <- FALSE [18:41:56.712] if (inherits(cond, "message")) { [18:41:56.712] muffled <- grepl(pattern, "muffleMessage") [18:41:56.712] if (muffled) [18:41:56.712] invokeRestart("muffleMessage") [18:41:56.712] } [18:41:56.712] else if (inherits(cond, "warning")) { [18:41:56.712] muffled <- grepl(pattern, "muffleWarning") [18:41:56.712] if (muffled) [18:41:56.712] invokeRestart("muffleWarning") [18:41:56.712] } [18:41:56.712] else if (inherits(cond, "condition")) { [18:41:56.712] if (!is.null(pattern)) { [18:41:56.712] computeRestarts <- base::computeRestarts [18:41:56.712] grepl <- base::grepl [18:41:56.712] restarts <- computeRestarts(cond) [18:41:56.712] for (restart in restarts) { [18:41:56.712] name <- restart$name [18:41:56.712] if (is.null(name)) [18:41:56.712] next [18:41:56.712] if (!grepl(pattern, name)) [18:41:56.712] next [18:41:56.712] invokeRestart(restart) [18:41:56.712] muffled <- TRUE [18:41:56.712] break [18:41:56.712] } [18:41:56.712] } [18:41:56.712] } [18:41:56.712] invisible(muffled) [18:41:56.712] } [18:41:56.712] muffleCondition(cond, pattern = "^muffle") [18:41:56.712] } [18:41:56.712] } [18:41:56.712] } [18:41:56.712] })) [18:41:56.712] }, error = function(ex) { [18:41:56.712] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.712] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.712] ...future.rng), started = ...future.startTime, [18:41:56.712] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.712] version = "1.8"), class = "FutureResult") [18:41:56.712] }, finally = { [18:41:56.712] if (!identical(...future.workdir, getwd())) [18:41:56.712] setwd(...future.workdir) [18:41:56.712] { [18:41:56.712] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.712] ...future.oldOptions$nwarnings <- NULL [18:41:56.712] } [18:41:56.712] base::options(...future.oldOptions) [18:41:56.712] if (.Platform$OS.type == "windows") { [18:41:56.712] old_names <- names(...future.oldEnvVars) [18:41:56.712] envs <- base::Sys.getenv() [18:41:56.712] names <- names(envs) [18:41:56.712] common <- intersect(names, old_names) [18:41:56.712] added <- setdiff(names, old_names) [18:41:56.712] removed <- setdiff(old_names, names) [18:41:56.712] changed <- common[...future.oldEnvVars[common] != [18:41:56.712] envs[common]] [18:41:56.712] NAMES <- toupper(changed) [18:41:56.712] args <- list() [18:41:56.712] for (kk in seq_along(NAMES)) { [18:41:56.712] name <- changed[[kk]] [18:41:56.712] NAME <- NAMES[[kk]] [18:41:56.712] if (name != NAME && is.element(NAME, old_names)) [18:41:56.712] next [18:41:56.712] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.712] } [18:41:56.712] NAMES <- toupper(added) [18:41:56.712] for (kk in seq_along(NAMES)) { [18:41:56.712] name <- added[[kk]] [18:41:56.712] NAME <- NAMES[[kk]] [18:41:56.712] if (name != NAME && is.element(NAME, old_names)) [18:41:56.712] next [18:41:56.712] args[[name]] <- "" [18:41:56.712] } [18:41:56.712] NAMES <- toupper(removed) [18:41:56.712] for (kk in seq_along(NAMES)) { [18:41:56.712] name <- removed[[kk]] [18:41:56.712] NAME <- NAMES[[kk]] [18:41:56.712] if (name != NAME && is.element(NAME, old_names)) [18:41:56.712] next [18:41:56.712] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.712] } [18:41:56.712] if (length(args) > 0) [18:41:56.712] base::do.call(base::Sys.setenv, args = args) [18:41:56.712] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.712] } [18:41:56.712] { [18:41:56.712] if (base::length(...future.futureOptionsAdded) > [18:41:56.712] 0L) { [18:41:56.712] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.712] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.712] base::options(opts) [18:41:56.712] } [18:41:56.712] { [18:41:56.712] { [18:41:56.712] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.712] NULL [18:41:56.712] } [18:41:56.712] options(future.plan = NULL) [18:41:56.712] if (is.na(NA_character_)) [18:41:56.712] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.712] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.712] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.712] .init = FALSE) [18:41:56.712] } [18:41:56.712] } [18:41:56.712] } [18:41:56.712] }) [18:41:56.712] if (TRUE) { [18:41:56.712] base::sink(type = "output", split = FALSE) [18:41:56.712] if (TRUE) { [18:41:56.712] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.712] } [18:41:56.712] else { [18:41:56.712] ...future.result["stdout"] <- base::list(NULL) [18:41:56.712] } [18:41:56.712] base::close(...future.stdout) [18:41:56.712] ...future.stdout <- NULL [18:41:56.712] } [18:41:56.712] ...future.result$conditions <- ...future.conditions [18:41:56.712] ...future.result$finished <- base::Sys.time() [18:41:56.712] ...future.result [18:41:56.712] } [18:41:56.717] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:56.717] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:56.718] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:56.718] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.719] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.719] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.719] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.720] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.720] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.720] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.721] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.721] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:56.721] MultisessionFuture started [18:41:56.722] - Launch lazy future ... done [18:41:56.722] run() for 'MultisessionFuture' ... done [18:41:56.722] Created future: [18:41:56.741] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.741] - Validating connection of MultisessionFuture [18:41:56.741] - received message: FutureResult [18:41:56.741] - Received FutureResult [18:41:56.742] - Erased future from FutureRegistry [18:41:56.742] result() for ClusterFuture ... [18:41:56.742] - result already collected: FutureResult [18:41:56.742] result() for ClusterFuture ... done [18:41:56.742] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.722] MultisessionFuture: [18:41:56.722] Label: 'future_sapply-1' [18:41:56.722] Expression: [18:41:56.722] { [18:41:56.722] do.call(function(...) { [18:41:56.722] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.722] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.722] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.722] on.exit(options(oopts), add = TRUE) [18:41:56.722] } [18:41:56.722] { [18:41:56.722] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.722] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.722] ...future.FUN(...future.X_jj, ...) [18:41:56.722] }) [18:41:56.722] } [18:41:56.722] }, args = future.call.arguments) [18:41:56.722] } [18:41:56.722] Lazy evaluation: FALSE [18:41:56.722] Asynchronous evaluation: TRUE [18:41:56.722] Local evaluation: TRUE [18:41:56.722] Environment: R_GlobalEnv [18:41:56.722] Capture standard output: TRUE [18:41:56.722] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.722] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.722] Packages: [18:41:56.722] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.722] Resolved: TRUE [18:41:56.722] Value: [18:41:56.722] Conditions captured: [18:41:56.722] Early signaling: FALSE [18:41:56.722] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.722] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.743] Chunk #1 of 2 ... DONE [18:41:56.743] Chunk #2 of 2 ... [18:41:56.743] - Finding globals in 'X' for chunk #2 ... [18:41:56.743] getGlobalsAndPackages() ... [18:41:56.743] Searching for globals... [18:41:56.744] [18:41:56.744] Searching for globals ... DONE [18:41:56.744] - globals: [0] [18:41:56.744] getGlobalsAndPackages() ... DONE [18:41:56.744] + additional globals found: [n=0] [18:41:56.744] + additional namespaces needed: [n=0] [18:41:56.745] - Finding globals in 'X' for chunk #2 ... DONE [18:41:56.745] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.745] - seeds: [18:41:56.745] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.745] getGlobalsAndPackages() ... [18:41:56.745] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.746] Resolving globals: FALSE [18:41:56.746] Tweak future expression to call with '...' arguments ... [18:41:56.746] { [18:41:56.746] do.call(function(...) { [18:41:56.746] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.746] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.746] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.746] on.exit(options(oopts), add = TRUE) [18:41:56.746] } [18:41:56.746] { [18:41:56.746] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.746] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.746] ...future.FUN(...future.X_jj, ...) [18:41:56.746] }) [18:41:56.746] } [18:41:56.746] }, args = future.call.arguments) [18:41:56.746] } [18:41:56.746] Tweak future expression to call with '...' arguments ... DONE [18:41:56.747] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.747] [18:41:56.747] getGlobalsAndPackages() ... DONE [18:41:56.748] run() for 'Future' ... [18:41:56.748] - state: 'created' [18:41:56.748] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.763] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.763] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.763] - Field: 'node' [18:41:56.764] - Field: 'label' [18:41:56.764] - Field: 'local' [18:41:56.764] - Field: 'owner' [18:41:56.764] - Field: 'envir' [18:41:56.764] - Field: 'workers' [18:41:56.765] - Field: 'packages' [18:41:56.765] - Field: 'gc' [18:41:56.765] - Field: 'conditions' [18:41:56.765] - Field: 'persistent' [18:41:56.765] - Field: 'expr' [18:41:56.765] - Field: 'uuid' [18:41:56.766] - Field: 'seed' [18:41:56.766] - Field: 'version' [18:41:56.766] - Field: 'result' [18:41:56.766] - Field: 'asynchronous' [18:41:56.766] - Field: 'calls' [18:41:56.767] - Field: 'globals' [18:41:56.767] - Field: 'stdout' [18:41:56.767] - Field: 'earlySignal' [18:41:56.767] - Field: 'lazy' [18:41:56.767] - Field: 'state' [18:41:56.768] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.768] - Launch lazy future ... [18:41:56.768] Packages needed by the future expression (n = 0): [18:41:56.768] Packages needed by future strategies (n = 0): [18:41:56.769] { [18:41:56.769] { [18:41:56.769] { [18:41:56.769] ...future.startTime <- base::Sys.time() [18:41:56.769] { [18:41:56.769] { [18:41:56.769] { [18:41:56.769] { [18:41:56.769] base::local({ [18:41:56.769] has_future <- base::requireNamespace("future", [18:41:56.769] quietly = TRUE) [18:41:56.769] if (has_future) { [18:41:56.769] ns <- base::getNamespace("future") [18:41:56.769] version <- ns[[".package"]][["version"]] [18:41:56.769] if (is.null(version)) [18:41:56.769] version <- utils::packageVersion("future") [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] version <- NULL [18:41:56.769] } [18:41:56.769] if (!has_future || version < "1.8.0") { [18:41:56.769] info <- base::c(r_version = base::gsub("R version ", [18:41:56.769] "", base::R.version$version.string), [18:41:56.769] platform = base::sprintf("%s (%s-bit)", [18:41:56.769] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.769] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.769] "release", "version")], collapse = " "), [18:41:56.769] hostname = base::Sys.info()[["nodename"]]) [18:41:56.769] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.769] info) [18:41:56.769] info <- base::paste(info, collapse = "; ") [18:41:56.769] if (!has_future) { [18:41:56.769] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.769] info) [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.769] info, version) [18:41:56.769] } [18:41:56.769] base::stop(msg) [18:41:56.769] } [18:41:56.769] }) [18:41:56.769] } [18:41:56.769] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.769] base::options(mc.cores = 1L) [18:41:56.769] } [18:41:56.769] ...future.strategy.old <- future::plan("list") [18:41:56.769] options(future.plan = NULL) [18:41:56.769] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.769] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.769] } [18:41:56.769] ...future.workdir <- getwd() [18:41:56.769] } [18:41:56.769] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.769] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.769] } [18:41:56.769] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.769] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.769] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.769] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.769] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.769] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.769] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.769] base::names(...future.oldOptions)) [18:41:56.769] } [18:41:56.769] if (FALSE) { [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] if (TRUE) { [18:41:56.769] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.769] open = "w") [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.769] windows = "NUL", "/dev/null"), open = "w") [18:41:56.769] } [18:41:56.769] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.769] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.769] base::sink(type = "output", split = FALSE) [18:41:56.769] base::close(...future.stdout) [18:41:56.769] }, add = TRUE) [18:41:56.769] } [18:41:56.769] ...future.frame <- base::sys.nframe() [18:41:56.769] ...future.conditions <- base::list() [18:41:56.769] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.769] if (FALSE) { [18:41:56.769] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.769] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.769] } [18:41:56.769] ...future.result <- base::tryCatch({ [18:41:56.769] base::withCallingHandlers({ [18:41:56.769] ...future.value <- base::withVisible(base::local({ [18:41:56.769] ...future.makeSendCondition <- base::local({ [18:41:56.769] sendCondition <- NULL [18:41:56.769] function(frame = 1L) { [18:41:56.769] if (is.function(sendCondition)) [18:41:56.769] return(sendCondition) [18:41:56.769] ns <- getNamespace("parallel") [18:41:56.769] if (exists("sendData", mode = "function", [18:41:56.769] envir = ns)) { [18:41:56.769] parallel_sendData <- get("sendData", mode = "function", [18:41:56.769] envir = ns) [18:41:56.769] envir <- sys.frame(frame) [18:41:56.769] master <- NULL [18:41:56.769] while (!identical(envir, .GlobalEnv) && [18:41:56.769] !identical(envir, emptyenv())) { [18:41:56.769] if (exists("master", mode = "list", envir = envir, [18:41:56.769] inherits = FALSE)) { [18:41:56.769] master <- get("master", mode = "list", [18:41:56.769] envir = envir, inherits = FALSE) [18:41:56.769] if (inherits(master, c("SOCKnode", [18:41:56.769] "SOCK0node"))) { [18:41:56.769] sendCondition <<- function(cond) { [18:41:56.769] data <- list(type = "VALUE", value = cond, [18:41:56.769] success = TRUE) [18:41:56.769] parallel_sendData(master, data) [18:41:56.769] } [18:41:56.769] return(sendCondition) [18:41:56.769] } [18:41:56.769] } [18:41:56.769] frame <- frame + 1L [18:41:56.769] envir <- sys.frame(frame) [18:41:56.769] } [18:41:56.769] } [18:41:56.769] sendCondition <<- function(cond) NULL [18:41:56.769] } [18:41:56.769] }) [18:41:56.769] withCallingHandlers({ [18:41:56.769] { [18:41:56.769] do.call(function(...) { [18:41:56.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.769] if (!identical(...future.globals.maxSize.org, [18:41:56.769] ...future.globals.maxSize)) { [18:41:56.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.769] on.exit(options(oopts), add = TRUE) [18:41:56.769] } [18:41:56.769] { [18:41:56.769] lapply(seq_along(...future.elements_ii), [18:41:56.769] FUN = function(jj) { [18:41:56.769] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.769] ...future.FUN(...future.X_jj, ...) [18:41:56.769] }) [18:41:56.769] } [18:41:56.769] }, args = future.call.arguments) [18:41:56.769] } [18:41:56.769] }, immediateCondition = function(cond) { [18:41:56.769] sendCondition <- ...future.makeSendCondition() [18:41:56.769] sendCondition(cond) [18:41:56.769] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.769] { [18:41:56.769] inherits <- base::inherits [18:41:56.769] invokeRestart <- base::invokeRestart [18:41:56.769] is.null <- base::is.null [18:41:56.769] muffled <- FALSE [18:41:56.769] if (inherits(cond, "message")) { [18:41:56.769] muffled <- grepl(pattern, "muffleMessage") [18:41:56.769] if (muffled) [18:41:56.769] invokeRestart("muffleMessage") [18:41:56.769] } [18:41:56.769] else if (inherits(cond, "warning")) { [18:41:56.769] muffled <- grepl(pattern, "muffleWarning") [18:41:56.769] if (muffled) [18:41:56.769] invokeRestart("muffleWarning") [18:41:56.769] } [18:41:56.769] else if (inherits(cond, "condition")) { [18:41:56.769] if (!is.null(pattern)) { [18:41:56.769] computeRestarts <- base::computeRestarts [18:41:56.769] grepl <- base::grepl [18:41:56.769] restarts <- computeRestarts(cond) [18:41:56.769] for (restart in restarts) { [18:41:56.769] name <- restart$name [18:41:56.769] if (is.null(name)) [18:41:56.769] next [18:41:56.769] if (!grepl(pattern, name)) [18:41:56.769] next [18:41:56.769] invokeRestart(restart) [18:41:56.769] muffled <- TRUE [18:41:56.769] break [18:41:56.769] } [18:41:56.769] } [18:41:56.769] } [18:41:56.769] invisible(muffled) [18:41:56.769] } [18:41:56.769] muffleCondition(cond) [18:41:56.769] }) [18:41:56.769] })) [18:41:56.769] future::FutureResult(value = ...future.value$value, [18:41:56.769] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.769] ...future.rng), globalenv = if (FALSE) [18:41:56.769] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.769] ...future.globalenv.names)) [18:41:56.769] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.769] }, condition = base::local({ [18:41:56.769] c <- base::c [18:41:56.769] inherits <- base::inherits [18:41:56.769] invokeRestart <- base::invokeRestart [18:41:56.769] length <- base::length [18:41:56.769] list <- base::list [18:41:56.769] seq.int <- base::seq.int [18:41:56.769] signalCondition <- base::signalCondition [18:41:56.769] sys.calls <- base::sys.calls [18:41:56.769] `[[` <- base::`[[` [18:41:56.769] `+` <- base::`+` [18:41:56.769] `<<-` <- base::`<<-` [18:41:56.769] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.769] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.769] 3L)] [18:41:56.769] } [18:41:56.769] function(cond) { [18:41:56.769] is_error <- inherits(cond, "error") [18:41:56.769] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.769] NULL) [18:41:56.769] if (is_error) { [18:41:56.769] sessionInformation <- function() { [18:41:56.769] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.769] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.769] search = base::search(), system = base::Sys.info()) [18:41:56.769] } [18:41:56.769] ...future.conditions[[length(...future.conditions) + [18:41:56.769] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.769] cond$call), session = sessionInformation(), [18:41:56.769] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.769] signalCondition(cond) [18:41:56.769] } [18:41:56.769] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.769] "immediateCondition"))) { [18:41:56.769] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.769] ...future.conditions[[length(...future.conditions) + [18:41:56.769] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.769] if (TRUE && !signal) { [18:41:56.769] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.769] { [18:41:56.769] inherits <- base::inherits [18:41:56.769] invokeRestart <- base::invokeRestart [18:41:56.769] is.null <- base::is.null [18:41:56.769] muffled <- FALSE [18:41:56.769] if (inherits(cond, "message")) { [18:41:56.769] muffled <- grepl(pattern, "muffleMessage") [18:41:56.769] if (muffled) [18:41:56.769] invokeRestart("muffleMessage") [18:41:56.769] } [18:41:56.769] else if (inherits(cond, "warning")) { [18:41:56.769] muffled <- grepl(pattern, "muffleWarning") [18:41:56.769] if (muffled) [18:41:56.769] invokeRestart("muffleWarning") [18:41:56.769] } [18:41:56.769] else if (inherits(cond, "condition")) { [18:41:56.769] if (!is.null(pattern)) { [18:41:56.769] computeRestarts <- base::computeRestarts [18:41:56.769] grepl <- base::grepl [18:41:56.769] restarts <- computeRestarts(cond) [18:41:56.769] for (restart in restarts) { [18:41:56.769] name <- restart$name [18:41:56.769] if (is.null(name)) [18:41:56.769] next [18:41:56.769] if (!grepl(pattern, name)) [18:41:56.769] next [18:41:56.769] invokeRestart(restart) [18:41:56.769] muffled <- TRUE [18:41:56.769] break [18:41:56.769] } [18:41:56.769] } [18:41:56.769] } [18:41:56.769] invisible(muffled) [18:41:56.769] } [18:41:56.769] muffleCondition(cond, pattern = "^muffle") [18:41:56.769] } [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] if (TRUE) { [18:41:56.769] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.769] { [18:41:56.769] inherits <- base::inherits [18:41:56.769] invokeRestart <- base::invokeRestart [18:41:56.769] is.null <- base::is.null [18:41:56.769] muffled <- FALSE [18:41:56.769] if (inherits(cond, "message")) { [18:41:56.769] muffled <- grepl(pattern, "muffleMessage") [18:41:56.769] if (muffled) [18:41:56.769] invokeRestart("muffleMessage") [18:41:56.769] } [18:41:56.769] else if (inherits(cond, "warning")) { [18:41:56.769] muffled <- grepl(pattern, "muffleWarning") [18:41:56.769] if (muffled) [18:41:56.769] invokeRestart("muffleWarning") [18:41:56.769] } [18:41:56.769] else if (inherits(cond, "condition")) { [18:41:56.769] if (!is.null(pattern)) { [18:41:56.769] computeRestarts <- base::computeRestarts [18:41:56.769] grepl <- base::grepl [18:41:56.769] restarts <- computeRestarts(cond) [18:41:56.769] for (restart in restarts) { [18:41:56.769] name <- restart$name [18:41:56.769] if (is.null(name)) [18:41:56.769] next [18:41:56.769] if (!grepl(pattern, name)) [18:41:56.769] next [18:41:56.769] invokeRestart(restart) [18:41:56.769] muffled <- TRUE [18:41:56.769] break [18:41:56.769] } [18:41:56.769] } [18:41:56.769] } [18:41:56.769] invisible(muffled) [18:41:56.769] } [18:41:56.769] muffleCondition(cond, pattern = "^muffle") [18:41:56.769] } [18:41:56.769] } [18:41:56.769] } [18:41:56.769] })) [18:41:56.769] }, error = function(ex) { [18:41:56.769] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.769] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.769] ...future.rng), started = ...future.startTime, [18:41:56.769] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.769] version = "1.8"), class = "FutureResult") [18:41:56.769] }, finally = { [18:41:56.769] if (!identical(...future.workdir, getwd())) [18:41:56.769] setwd(...future.workdir) [18:41:56.769] { [18:41:56.769] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.769] ...future.oldOptions$nwarnings <- NULL [18:41:56.769] } [18:41:56.769] base::options(...future.oldOptions) [18:41:56.769] if (.Platform$OS.type == "windows") { [18:41:56.769] old_names <- names(...future.oldEnvVars) [18:41:56.769] envs <- base::Sys.getenv() [18:41:56.769] names <- names(envs) [18:41:56.769] common <- intersect(names, old_names) [18:41:56.769] added <- setdiff(names, old_names) [18:41:56.769] removed <- setdiff(old_names, names) [18:41:56.769] changed <- common[...future.oldEnvVars[common] != [18:41:56.769] envs[common]] [18:41:56.769] NAMES <- toupper(changed) [18:41:56.769] args <- list() [18:41:56.769] for (kk in seq_along(NAMES)) { [18:41:56.769] name <- changed[[kk]] [18:41:56.769] NAME <- NAMES[[kk]] [18:41:56.769] if (name != NAME && is.element(NAME, old_names)) [18:41:56.769] next [18:41:56.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.769] } [18:41:56.769] NAMES <- toupper(added) [18:41:56.769] for (kk in seq_along(NAMES)) { [18:41:56.769] name <- added[[kk]] [18:41:56.769] NAME <- NAMES[[kk]] [18:41:56.769] if (name != NAME && is.element(NAME, old_names)) [18:41:56.769] next [18:41:56.769] args[[name]] <- "" [18:41:56.769] } [18:41:56.769] NAMES <- toupper(removed) [18:41:56.769] for (kk in seq_along(NAMES)) { [18:41:56.769] name <- removed[[kk]] [18:41:56.769] NAME <- NAMES[[kk]] [18:41:56.769] if (name != NAME && is.element(NAME, old_names)) [18:41:56.769] next [18:41:56.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.769] } [18:41:56.769] if (length(args) > 0) [18:41:56.769] base::do.call(base::Sys.setenv, args = args) [18:41:56.769] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.769] } [18:41:56.769] { [18:41:56.769] if (base::length(...future.futureOptionsAdded) > [18:41:56.769] 0L) { [18:41:56.769] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.769] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.769] base::options(opts) [18:41:56.769] } [18:41:56.769] { [18:41:56.769] { [18:41:56.769] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.769] NULL [18:41:56.769] } [18:41:56.769] options(future.plan = NULL) [18:41:56.769] if (is.na(NA_character_)) [18:41:56.769] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.769] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.769] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.769] .init = FALSE) [18:41:56.769] } [18:41:56.769] } [18:41:56.769] } [18:41:56.769] }) [18:41:56.769] if (TRUE) { [18:41:56.769] base::sink(type = "output", split = FALSE) [18:41:56.769] if (TRUE) { [18:41:56.769] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.769] } [18:41:56.769] else { [18:41:56.769] ...future.result["stdout"] <- base::list(NULL) [18:41:56.769] } [18:41:56.769] base::close(...future.stdout) [18:41:56.769] ...future.stdout <- NULL [18:41:56.769] } [18:41:56.769] ...future.result$conditions <- ...future.conditions [18:41:56.769] ...future.result$finished <- base::Sys.time() [18:41:56.769] ...future.result [18:41:56.769] } [18:41:56.774] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:56.774] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:56.775] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:56.775] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.775] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.776] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.776] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.776] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.777] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.777] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.777] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.777] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:56.778] MultisessionFuture started [18:41:56.778] - Launch lazy future ... done [18:41:56.778] run() for 'MultisessionFuture' ... done [18:41:56.779] Created future: [18:41:56.797] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.797] - Validating connection of MultisessionFuture [18:41:56.797] - received message: FutureResult [18:41:56.797] - Received FutureResult [18:41:56.797] - Erased future from FutureRegistry [18:41:56.798] result() for ClusterFuture ... [18:41:56.798] - result already collected: FutureResult [18:41:56.798] result() for ClusterFuture ... done [18:41:56.798] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.779] MultisessionFuture: [18:41:56.779] Label: 'future_sapply-2' [18:41:56.779] Expression: [18:41:56.779] { [18:41:56.779] do.call(function(...) { [18:41:56.779] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.779] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.779] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.779] on.exit(options(oopts), add = TRUE) [18:41:56.779] } [18:41:56.779] { [18:41:56.779] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.779] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.779] ...future.FUN(...future.X_jj, ...) [18:41:56.779] }) [18:41:56.779] } [18:41:56.779] }, args = future.call.arguments) [18:41:56.779] } [18:41:56.779] Lazy evaluation: FALSE [18:41:56.779] Asynchronous evaluation: TRUE [18:41:56.779] Local evaluation: TRUE [18:41:56.779] Environment: R_GlobalEnv [18:41:56.779] Capture standard output: TRUE [18:41:56.779] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.779] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.779] Packages: [18:41:56.779] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.779] Resolved: TRUE [18:41:56.779] Value: [18:41:56.779] Conditions captured: [18:41:56.779] Early signaling: FALSE [18:41:56.779] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.779] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.799] Chunk #2 of 2 ... DONE [18:41:56.799] Launching 2 futures (chunks) ... DONE [18:41:56.799] Resolving 2 futures (chunks) ... [18:41:56.799] resolve() on list ... [18:41:56.799] recursive: 0 [18:41:56.799] length: 2 [18:41:56.800] [18:41:56.800] Future #1 [18:41:56.800] result() for ClusterFuture ... [18:41:56.800] - result already collected: FutureResult [18:41:56.800] result() for ClusterFuture ... done [18:41:56.800] result() for ClusterFuture ... [18:41:56.800] - result already collected: FutureResult [18:41:56.801] result() for ClusterFuture ... done [18:41:56.801] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.801] - nx: 2 [18:41:56.801] - relay: TRUE [18:41:56.801] - stdout: TRUE [18:41:56.801] - signal: TRUE [18:41:56.802] - resignal: FALSE [18:41:56.802] - force: TRUE [18:41:56.802] - relayed: [n=2] FALSE, FALSE [18:41:56.802] - queued futures: [n=2] FALSE, FALSE [18:41:56.802] - until=1 [18:41:56.802] - relaying element #1 [18:41:56.803] result() for ClusterFuture ... [18:41:56.803] - result already collected: FutureResult [18:41:56.803] result() for ClusterFuture ... done [18:41:56.803] result() for ClusterFuture ... [18:41:56.803] - result already collected: FutureResult [18:41:56.803] result() for ClusterFuture ... done [18:41:56.804] result() for ClusterFuture ... [18:41:56.804] - result already collected: FutureResult [18:41:56.804] result() for ClusterFuture ... done [18:41:56.804] result() for ClusterFuture ... [18:41:56.804] - result already collected: FutureResult [18:41:56.804] result() for ClusterFuture ... done [18:41:56.804] - relayed: [n=2] TRUE, FALSE [18:41:56.805] - queued futures: [n=2] TRUE, FALSE [18:41:56.805] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.805] length: 1 (resolved future 1) [18:41:56.805] Future #2 [18:41:56.805] result() for ClusterFuture ... [18:41:56.806] - result already collected: FutureResult [18:41:56.806] result() for ClusterFuture ... done [18:41:56.806] result() for ClusterFuture ... [18:41:56.806] - result already collected: FutureResult [18:41:56.806] result() for ClusterFuture ... done [18:41:56.806] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.806] - nx: 2 [18:41:56.807] - relay: TRUE [18:41:56.807] - stdout: TRUE [18:41:56.807] - signal: TRUE [18:41:56.807] - resignal: FALSE [18:41:56.807] - force: TRUE [18:41:56.807] - relayed: [n=2] TRUE, FALSE [18:41:56.808] - queued futures: [n=2] TRUE, FALSE [18:41:56.808] - until=2 [18:41:56.808] - relaying element #2 [18:41:56.808] result() for ClusterFuture ... [18:41:56.808] - result already collected: FutureResult [18:41:56.808] result() for ClusterFuture ... done [18:41:56.808] result() for ClusterFuture ... [18:41:56.809] - result already collected: FutureResult [18:41:56.809] result() for ClusterFuture ... done [18:41:56.809] result() for ClusterFuture ... [18:41:56.809] - result already collected: FutureResult [18:41:56.809] result() for ClusterFuture ... done [18:41:56.809] result() for ClusterFuture ... [18:41:56.810] - result already collected: FutureResult [18:41:56.810] result() for ClusterFuture ... done [18:41:56.810] - relayed: [n=2] TRUE, TRUE [18:41:56.810] - queued futures: [n=2] TRUE, TRUE [18:41:56.810] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.810] length: 0 (resolved future 2) [18:41:56.811] Relaying remaining futures [18:41:56.811] signalConditionsASAP(NULL, pos=0) ... [18:41:56.811] - nx: 2 [18:41:56.811] - relay: TRUE [18:41:56.811] - stdout: TRUE [18:41:56.811] - signal: TRUE [18:41:56.811] - resignal: FALSE [18:41:56.812] - force: TRUE [18:41:56.812] - relayed: [n=2] TRUE, TRUE [18:41:56.812] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.812] - relayed: [n=2] TRUE, TRUE [18:41:56.812] - queued futures: [n=2] TRUE, TRUE [18:41:56.813] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.813] resolve() on list ... DONE [18:41:56.813] result() for ClusterFuture ... [18:41:56.813] - result already collected: FutureResult [18:41:56.813] result() for ClusterFuture ... done [18:41:56.813] result() for ClusterFuture ... [18:41:56.813] - result already collected: FutureResult [18:41:56.814] result() for ClusterFuture ... done [18:41:56.814] result() for ClusterFuture ... [18:41:56.814] - result already collected: FutureResult [18:41:56.814] result() for ClusterFuture ... done [18:41:56.814] result() for ClusterFuture ... [18:41:56.814] - result already collected: FutureResult [18:41:56.815] result() for ClusterFuture ... done [18:41:56.815] - Number of value chunks collected: 2 [18:41:56.815] Resolving 2 futures (chunks) ... DONE [18:41:56.815] Reducing values from 2 chunks ... [18:41:56.815] - Number of values collected after concatenation: 4 [18:41:56.815] - Number of values expected: 4 [18:41:56.816] Reducing values from 2 chunks ... DONE [18:41:56.816] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:56.818] future_lapply() ... [18:41:56.821] Number of chunks: 2 [18:41:56.821] getGlobalsAndPackagesXApply() ... [18:41:56.821] - future.globals: TRUE [18:41:56.821] getGlobalsAndPackages() ... [18:41:56.821] Searching for globals... [18:41:56.823] - globals found: [2] 'FUN', 'UseMethod' [18:41:56.823] Searching for globals ... DONE [18:41:56.823] Resolving globals: FALSE [18:41:56.823] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:56.827] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:56.827] - globals: [1] 'FUN' [18:41:56.827] [18:41:56.828] getGlobalsAndPackages() ... DONE [18:41:56.828] - globals found/used: [n=1] 'FUN' [18:41:56.828] - needed namespaces: [n=0] [18:41:56.828] Finding globals ... DONE [18:41:56.828] - use_args: TRUE [18:41:56.829] - Getting '...' globals ... [18:41:56.829] resolve() on list ... [18:41:56.829] recursive: 0 [18:41:56.829] length: 1 [18:41:56.830] elements: '...' [18:41:56.830] length: 0 (resolved future 1) [18:41:56.830] resolve() on list ... DONE [18:41:56.830] - '...' content: [n=0] [18:41:56.830] List of 1 [18:41:56.830] $ ...: list() [18:41:56.830] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.830] - attr(*, "where")=List of 1 [18:41:56.830] ..$ ...: [18:41:56.830] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.830] - attr(*, "resolved")= logi TRUE [18:41:56.830] - attr(*, "total_size")= num NA [18:41:56.833] - Getting '...' globals ... DONE [18:41:56.834] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.834] List of 2 [18:41:56.834] $ ...future.FUN:function (x, ...) [18:41:56.834] $ ... : list() [18:41:56.834] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.834] - attr(*, "where")=List of 2 [18:41:56.834] ..$ ...future.FUN: [18:41:56.834] ..$ ... : [18:41:56.834] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.834] - attr(*, "resolved")= logi FALSE [18:41:56.834] - attr(*, "total_size")= int 5150 [18:41:56.837] Packages to be attached in all futures: [n=0] [18:41:56.837] getGlobalsAndPackagesXApply() ... DONE [18:41:56.838] Number of futures (= number of chunks): 2 [18:41:56.838] Launching 2 futures (chunks) ... [18:41:56.838] Chunk #1 of 2 ... [18:41:56.838] - Finding globals in 'X' for chunk #1 ... [18:41:56.838] getGlobalsAndPackages() ... [18:41:56.839] Searching for globals... [18:41:56.839] [18:41:56.839] Searching for globals ... DONE [18:41:56.839] - globals: [0] [18:41:56.839] getGlobalsAndPackages() ... DONE [18:41:56.840] + additional globals found: [n=0] [18:41:56.840] + additional namespaces needed: [n=0] [18:41:56.840] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.840] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.840] - seeds: [18:41:56.840] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.841] getGlobalsAndPackages() ... [18:41:56.841] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.841] Resolving globals: FALSE [18:41:56.841] Tweak future expression to call with '...' arguments ... [18:41:56.841] { [18:41:56.841] do.call(function(...) { [18:41:56.841] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.841] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.841] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.841] on.exit(options(oopts), add = TRUE) [18:41:56.841] } [18:41:56.841] { [18:41:56.841] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.841] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.841] ...future.FUN(...future.X_jj, ...) [18:41:56.841] }) [18:41:56.841] } [18:41:56.841] }, args = future.call.arguments) [18:41:56.841] } [18:41:56.842] Tweak future expression to call with '...' arguments ... DONE [18:41:56.842] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.842] [18:41:56.842] getGlobalsAndPackages() ... DONE [18:41:56.843] run() for 'Future' ... [18:41:56.843] - state: 'created' [18:41:56.843] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.859] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.859] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.859] - Field: 'node' [18:41:56.860] - Field: 'label' [18:41:56.860] - Field: 'local' [18:41:56.860] - Field: 'owner' [18:41:56.860] - Field: 'envir' [18:41:56.860] - Field: 'workers' [18:41:56.860] - Field: 'packages' [18:41:56.861] - Field: 'gc' [18:41:56.861] - Field: 'conditions' [18:41:56.861] - Field: 'persistent' [18:41:56.861] - Field: 'expr' [18:41:56.861] - Field: 'uuid' [18:41:56.862] - Field: 'seed' [18:41:56.862] - Field: 'version' [18:41:56.862] - Field: 'result' [18:41:56.862] - Field: 'asynchronous' [18:41:56.862] - Field: 'calls' [18:41:56.862] - Field: 'globals' [18:41:56.863] - Field: 'stdout' [18:41:56.863] - Field: 'earlySignal' [18:41:56.863] - Field: 'lazy' [18:41:56.863] - Field: 'state' [18:41:56.863] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.863] - Launch lazy future ... [18:41:56.864] Packages needed by the future expression (n = 0): [18:41:56.864] Packages needed by future strategies (n = 0): [18:41:56.865] { [18:41:56.865] { [18:41:56.865] { [18:41:56.865] ...future.startTime <- base::Sys.time() [18:41:56.865] { [18:41:56.865] { [18:41:56.865] { [18:41:56.865] { [18:41:56.865] base::local({ [18:41:56.865] has_future <- base::requireNamespace("future", [18:41:56.865] quietly = TRUE) [18:41:56.865] if (has_future) { [18:41:56.865] ns <- base::getNamespace("future") [18:41:56.865] version <- ns[[".package"]][["version"]] [18:41:56.865] if (is.null(version)) [18:41:56.865] version <- utils::packageVersion("future") [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] version <- NULL [18:41:56.865] } [18:41:56.865] if (!has_future || version < "1.8.0") { [18:41:56.865] info <- base::c(r_version = base::gsub("R version ", [18:41:56.865] "", base::R.version$version.string), [18:41:56.865] platform = base::sprintf("%s (%s-bit)", [18:41:56.865] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.865] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.865] "release", "version")], collapse = " "), [18:41:56.865] hostname = base::Sys.info()[["nodename"]]) [18:41:56.865] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.865] info) [18:41:56.865] info <- base::paste(info, collapse = "; ") [18:41:56.865] if (!has_future) { [18:41:56.865] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.865] info) [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.865] info, version) [18:41:56.865] } [18:41:56.865] base::stop(msg) [18:41:56.865] } [18:41:56.865] }) [18:41:56.865] } [18:41:56.865] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.865] base::options(mc.cores = 1L) [18:41:56.865] } [18:41:56.865] ...future.strategy.old <- future::plan("list") [18:41:56.865] options(future.plan = NULL) [18:41:56.865] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.865] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.865] } [18:41:56.865] ...future.workdir <- getwd() [18:41:56.865] } [18:41:56.865] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.865] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.865] } [18:41:56.865] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.865] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.865] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.865] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.865] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.865] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.865] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.865] base::names(...future.oldOptions)) [18:41:56.865] } [18:41:56.865] if (FALSE) { [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] if (TRUE) { [18:41:56.865] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.865] open = "w") [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.865] windows = "NUL", "/dev/null"), open = "w") [18:41:56.865] } [18:41:56.865] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.865] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.865] base::sink(type = "output", split = FALSE) [18:41:56.865] base::close(...future.stdout) [18:41:56.865] }, add = TRUE) [18:41:56.865] } [18:41:56.865] ...future.frame <- base::sys.nframe() [18:41:56.865] ...future.conditions <- base::list() [18:41:56.865] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.865] if (FALSE) { [18:41:56.865] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.865] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.865] } [18:41:56.865] ...future.result <- base::tryCatch({ [18:41:56.865] base::withCallingHandlers({ [18:41:56.865] ...future.value <- base::withVisible(base::local({ [18:41:56.865] ...future.makeSendCondition <- base::local({ [18:41:56.865] sendCondition <- NULL [18:41:56.865] function(frame = 1L) { [18:41:56.865] if (is.function(sendCondition)) [18:41:56.865] return(sendCondition) [18:41:56.865] ns <- getNamespace("parallel") [18:41:56.865] if (exists("sendData", mode = "function", [18:41:56.865] envir = ns)) { [18:41:56.865] parallel_sendData <- get("sendData", mode = "function", [18:41:56.865] envir = ns) [18:41:56.865] envir <- sys.frame(frame) [18:41:56.865] master <- NULL [18:41:56.865] while (!identical(envir, .GlobalEnv) && [18:41:56.865] !identical(envir, emptyenv())) { [18:41:56.865] if (exists("master", mode = "list", envir = envir, [18:41:56.865] inherits = FALSE)) { [18:41:56.865] master <- get("master", mode = "list", [18:41:56.865] envir = envir, inherits = FALSE) [18:41:56.865] if (inherits(master, c("SOCKnode", [18:41:56.865] "SOCK0node"))) { [18:41:56.865] sendCondition <<- function(cond) { [18:41:56.865] data <- list(type = "VALUE", value = cond, [18:41:56.865] success = TRUE) [18:41:56.865] parallel_sendData(master, data) [18:41:56.865] } [18:41:56.865] return(sendCondition) [18:41:56.865] } [18:41:56.865] } [18:41:56.865] frame <- frame + 1L [18:41:56.865] envir <- sys.frame(frame) [18:41:56.865] } [18:41:56.865] } [18:41:56.865] sendCondition <<- function(cond) NULL [18:41:56.865] } [18:41:56.865] }) [18:41:56.865] withCallingHandlers({ [18:41:56.865] { [18:41:56.865] do.call(function(...) { [18:41:56.865] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.865] if (!identical(...future.globals.maxSize.org, [18:41:56.865] ...future.globals.maxSize)) { [18:41:56.865] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.865] on.exit(options(oopts), add = TRUE) [18:41:56.865] } [18:41:56.865] { [18:41:56.865] lapply(seq_along(...future.elements_ii), [18:41:56.865] FUN = function(jj) { [18:41:56.865] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.865] ...future.FUN(...future.X_jj, ...) [18:41:56.865] }) [18:41:56.865] } [18:41:56.865] }, args = future.call.arguments) [18:41:56.865] } [18:41:56.865] }, immediateCondition = function(cond) { [18:41:56.865] sendCondition <- ...future.makeSendCondition() [18:41:56.865] sendCondition(cond) [18:41:56.865] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.865] { [18:41:56.865] inherits <- base::inherits [18:41:56.865] invokeRestart <- base::invokeRestart [18:41:56.865] is.null <- base::is.null [18:41:56.865] muffled <- FALSE [18:41:56.865] if (inherits(cond, "message")) { [18:41:56.865] muffled <- grepl(pattern, "muffleMessage") [18:41:56.865] if (muffled) [18:41:56.865] invokeRestart("muffleMessage") [18:41:56.865] } [18:41:56.865] else if (inherits(cond, "warning")) { [18:41:56.865] muffled <- grepl(pattern, "muffleWarning") [18:41:56.865] if (muffled) [18:41:56.865] invokeRestart("muffleWarning") [18:41:56.865] } [18:41:56.865] else if (inherits(cond, "condition")) { [18:41:56.865] if (!is.null(pattern)) { [18:41:56.865] computeRestarts <- base::computeRestarts [18:41:56.865] grepl <- base::grepl [18:41:56.865] restarts <- computeRestarts(cond) [18:41:56.865] for (restart in restarts) { [18:41:56.865] name <- restart$name [18:41:56.865] if (is.null(name)) [18:41:56.865] next [18:41:56.865] if (!grepl(pattern, name)) [18:41:56.865] next [18:41:56.865] invokeRestart(restart) [18:41:56.865] muffled <- TRUE [18:41:56.865] break [18:41:56.865] } [18:41:56.865] } [18:41:56.865] } [18:41:56.865] invisible(muffled) [18:41:56.865] } [18:41:56.865] muffleCondition(cond) [18:41:56.865] }) [18:41:56.865] })) [18:41:56.865] future::FutureResult(value = ...future.value$value, [18:41:56.865] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.865] ...future.rng), globalenv = if (FALSE) [18:41:56.865] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.865] ...future.globalenv.names)) [18:41:56.865] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.865] }, condition = base::local({ [18:41:56.865] c <- base::c [18:41:56.865] inherits <- base::inherits [18:41:56.865] invokeRestart <- base::invokeRestart [18:41:56.865] length <- base::length [18:41:56.865] list <- base::list [18:41:56.865] seq.int <- base::seq.int [18:41:56.865] signalCondition <- base::signalCondition [18:41:56.865] sys.calls <- base::sys.calls [18:41:56.865] `[[` <- base::`[[` [18:41:56.865] `+` <- base::`+` [18:41:56.865] `<<-` <- base::`<<-` [18:41:56.865] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.865] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.865] 3L)] [18:41:56.865] } [18:41:56.865] function(cond) { [18:41:56.865] is_error <- inherits(cond, "error") [18:41:56.865] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.865] NULL) [18:41:56.865] if (is_error) { [18:41:56.865] sessionInformation <- function() { [18:41:56.865] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.865] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.865] search = base::search(), system = base::Sys.info()) [18:41:56.865] } [18:41:56.865] ...future.conditions[[length(...future.conditions) + [18:41:56.865] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.865] cond$call), session = sessionInformation(), [18:41:56.865] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.865] signalCondition(cond) [18:41:56.865] } [18:41:56.865] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.865] "immediateCondition"))) { [18:41:56.865] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.865] ...future.conditions[[length(...future.conditions) + [18:41:56.865] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.865] if (TRUE && !signal) { [18:41:56.865] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.865] { [18:41:56.865] inherits <- base::inherits [18:41:56.865] invokeRestart <- base::invokeRestart [18:41:56.865] is.null <- base::is.null [18:41:56.865] muffled <- FALSE [18:41:56.865] if (inherits(cond, "message")) { [18:41:56.865] muffled <- grepl(pattern, "muffleMessage") [18:41:56.865] if (muffled) [18:41:56.865] invokeRestart("muffleMessage") [18:41:56.865] } [18:41:56.865] else if (inherits(cond, "warning")) { [18:41:56.865] muffled <- grepl(pattern, "muffleWarning") [18:41:56.865] if (muffled) [18:41:56.865] invokeRestart("muffleWarning") [18:41:56.865] } [18:41:56.865] else if (inherits(cond, "condition")) { [18:41:56.865] if (!is.null(pattern)) { [18:41:56.865] computeRestarts <- base::computeRestarts [18:41:56.865] grepl <- base::grepl [18:41:56.865] restarts <- computeRestarts(cond) [18:41:56.865] for (restart in restarts) { [18:41:56.865] name <- restart$name [18:41:56.865] if (is.null(name)) [18:41:56.865] next [18:41:56.865] if (!grepl(pattern, name)) [18:41:56.865] next [18:41:56.865] invokeRestart(restart) [18:41:56.865] muffled <- TRUE [18:41:56.865] break [18:41:56.865] } [18:41:56.865] } [18:41:56.865] } [18:41:56.865] invisible(muffled) [18:41:56.865] } [18:41:56.865] muffleCondition(cond, pattern = "^muffle") [18:41:56.865] } [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] if (TRUE) { [18:41:56.865] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.865] { [18:41:56.865] inherits <- base::inherits [18:41:56.865] invokeRestart <- base::invokeRestart [18:41:56.865] is.null <- base::is.null [18:41:56.865] muffled <- FALSE [18:41:56.865] if (inherits(cond, "message")) { [18:41:56.865] muffled <- grepl(pattern, "muffleMessage") [18:41:56.865] if (muffled) [18:41:56.865] invokeRestart("muffleMessage") [18:41:56.865] } [18:41:56.865] else if (inherits(cond, "warning")) { [18:41:56.865] muffled <- grepl(pattern, "muffleWarning") [18:41:56.865] if (muffled) [18:41:56.865] invokeRestart("muffleWarning") [18:41:56.865] } [18:41:56.865] else if (inherits(cond, "condition")) { [18:41:56.865] if (!is.null(pattern)) { [18:41:56.865] computeRestarts <- base::computeRestarts [18:41:56.865] grepl <- base::grepl [18:41:56.865] restarts <- computeRestarts(cond) [18:41:56.865] for (restart in restarts) { [18:41:56.865] name <- restart$name [18:41:56.865] if (is.null(name)) [18:41:56.865] next [18:41:56.865] if (!grepl(pattern, name)) [18:41:56.865] next [18:41:56.865] invokeRestart(restart) [18:41:56.865] muffled <- TRUE [18:41:56.865] break [18:41:56.865] } [18:41:56.865] } [18:41:56.865] } [18:41:56.865] invisible(muffled) [18:41:56.865] } [18:41:56.865] muffleCondition(cond, pattern = "^muffle") [18:41:56.865] } [18:41:56.865] } [18:41:56.865] } [18:41:56.865] })) [18:41:56.865] }, error = function(ex) { [18:41:56.865] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.865] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.865] ...future.rng), started = ...future.startTime, [18:41:56.865] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.865] version = "1.8"), class = "FutureResult") [18:41:56.865] }, finally = { [18:41:56.865] if (!identical(...future.workdir, getwd())) [18:41:56.865] setwd(...future.workdir) [18:41:56.865] { [18:41:56.865] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.865] ...future.oldOptions$nwarnings <- NULL [18:41:56.865] } [18:41:56.865] base::options(...future.oldOptions) [18:41:56.865] if (.Platform$OS.type == "windows") { [18:41:56.865] old_names <- names(...future.oldEnvVars) [18:41:56.865] envs <- base::Sys.getenv() [18:41:56.865] names <- names(envs) [18:41:56.865] common <- intersect(names, old_names) [18:41:56.865] added <- setdiff(names, old_names) [18:41:56.865] removed <- setdiff(old_names, names) [18:41:56.865] changed <- common[...future.oldEnvVars[common] != [18:41:56.865] envs[common]] [18:41:56.865] NAMES <- toupper(changed) [18:41:56.865] args <- list() [18:41:56.865] for (kk in seq_along(NAMES)) { [18:41:56.865] name <- changed[[kk]] [18:41:56.865] NAME <- NAMES[[kk]] [18:41:56.865] if (name != NAME && is.element(NAME, old_names)) [18:41:56.865] next [18:41:56.865] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.865] } [18:41:56.865] NAMES <- toupper(added) [18:41:56.865] for (kk in seq_along(NAMES)) { [18:41:56.865] name <- added[[kk]] [18:41:56.865] NAME <- NAMES[[kk]] [18:41:56.865] if (name != NAME && is.element(NAME, old_names)) [18:41:56.865] next [18:41:56.865] args[[name]] <- "" [18:41:56.865] } [18:41:56.865] NAMES <- toupper(removed) [18:41:56.865] for (kk in seq_along(NAMES)) { [18:41:56.865] name <- removed[[kk]] [18:41:56.865] NAME <- NAMES[[kk]] [18:41:56.865] if (name != NAME && is.element(NAME, old_names)) [18:41:56.865] next [18:41:56.865] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.865] } [18:41:56.865] if (length(args) > 0) [18:41:56.865] base::do.call(base::Sys.setenv, args = args) [18:41:56.865] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.865] } [18:41:56.865] { [18:41:56.865] if (base::length(...future.futureOptionsAdded) > [18:41:56.865] 0L) { [18:41:56.865] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.865] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.865] base::options(opts) [18:41:56.865] } [18:41:56.865] { [18:41:56.865] { [18:41:56.865] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.865] NULL [18:41:56.865] } [18:41:56.865] options(future.plan = NULL) [18:41:56.865] if (is.na(NA_character_)) [18:41:56.865] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.865] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.865] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.865] .init = FALSE) [18:41:56.865] } [18:41:56.865] } [18:41:56.865] } [18:41:56.865] }) [18:41:56.865] if (TRUE) { [18:41:56.865] base::sink(type = "output", split = FALSE) [18:41:56.865] if (TRUE) { [18:41:56.865] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.865] } [18:41:56.865] else { [18:41:56.865] ...future.result["stdout"] <- base::list(NULL) [18:41:56.865] } [18:41:56.865] base::close(...future.stdout) [18:41:56.865] ...future.stdout <- NULL [18:41:56.865] } [18:41:56.865] ...future.result$conditions <- ...future.conditions [18:41:56.865] ...future.result$finished <- base::Sys.time() [18:41:56.865] ...future.result [18:41:56.865] } [18:41:56.870] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:56.870] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:56.870] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:56.871] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.871] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.871] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.872] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.872] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.872] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.872] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.873] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.873] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:56.874] MultisessionFuture started [18:41:56.874] - Launch lazy future ... done [18:41:56.874] run() for 'MultisessionFuture' ... done [18:41:56.874] Created future: [18:41:56.890] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.890] - Validating connection of MultisessionFuture [18:41:56.890] - received message: FutureResult [18:41:56.891] - Received FutureResult [18:41:56.891] - Erased future from FutureRegistry [18:41:56.891] result() for ClusterFuture ... [18:41:56.891] - result already collected: FutureResult [18:41:56.891] result() for ClusterFuture ... done [18:41:56.891] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.874] MultisessionFuture: [18:41:56.874] Label: 'future_sapply-1' [18:41:56.874] Expression: [18:41:56.874] { [18:41:56.874] do.call(function(...) { [18:41:56.874] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.874] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.874] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.874] on.exit(options(oopts), add = TRUE) [18:41:56.874] } [18:41:56.874] { [18:41:56.874] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.874] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.874] ...future.FUN(...future.X_jj, ...) [18:41:56.874] }) [18:41:56.874] } [18:41:56.874] }, args = future.call.arguments) [18:41:56.874] } [18:41:56.874] Lazy evaluation: FALSE [18:41:56.874] Asynchronous evaluation: TRUE [18:41:56.874] Local evaluation: TRUE [18:41:56.874] Environment: R_GlobalEnv [18:41:56.874] Capture standard output: TRUE [18:41:56.874] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.874] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.874] Packages: [18:41:56.874] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.874] Resolved: TRUE [18:41:56.874] Value: [18:41:56.874] Conditions captured: [18:41:56.874] Early signaling: FALSE [18:41:56.874] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.874] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.892] Chunk #1 of 2 ... DONE [18:41:56.892] Chunk #2 of 2 ... [18:41:56.892] - Finding globals in 'X' for chunk #2 ... [18:41:56.892] getGlobalsAndPackages() ... [18:41:56.892] Searching for globals... [18:41:56.893] [18:41:56.893] Searching for globals ... DONE [18:41:56.893] - globals: [0] [18:41:56.893] getGlobalsAndPackages() ... DONE [18:41:56.893] + additional globals found: [n=0] [18:41:56.894] + additional namespaces needed: [n=0] [18:41:56.894] - Finding globals in 'X' for chunk #2 ... DONE [18:41:56.894] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.894] - seeds: [18:41:56.894] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.894] getGlobalsAndPackages() ... [18:41:56.895] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.895] Resolving globals: FALSE [18:41:56.895] Tweak future expression to call with '...' arguments ... [18:41:56.895] { [18:41:56.895] do.call(function(...) { [18:41:56.895] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.895] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.895] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.895] on.exit(options(oopts), add = TRUE) [18:41:56.895] } [18:41:56.895] { [18:41:56.895] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.895] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.895] ...future.FUN(...future.X_jj, ...) [18:41:56.895] }) [18:41:56.895] } [18:41:56.895] }, args = future.call.arguments) [18:41:56.895] } [18:41:56.896] Tweak future expression to call with '...' arguments ... DONE [18:41:56.896] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.896] [18:41:56.897] getGlobalsAndPackages() ... DONE [18:41:56.897] run() for 'Future' ... [18:41:56.897] - state: 'created' [18:41:56.897] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:56.913] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.913] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:56.914] - Field: 'node' [18:41:56.914] - Field: 'label' [18:41:56.914] - Field: 'local' [18:41:56.914] - Field: 'owner' [18:41:56.914] - Field: 'envir' [18:41:56.914] - Field: 'workers' [18:41:56.915] - Field: 'packages' [18:41:56.915] - Field: 'gc' [18:41:56.915] - Field: 'conditions' [18:41:56.915] - Field: 'persistent' [18:41:56.915] - Field: 'expr' [18:41:56.915] - Field: 'uuid' [18:41:56.916] - Field: 'seed' [18:41:56.916] - Field: 'version' [18:41:56.916] - Field: 'result' [18:41:56.916] - Field: 'asynchronous' [18:41:56.916] - Field: 'calls' [18:41:56.917] - Field: 'globals' [18:41:56.917] - Field: 'stdout' [18:41:56.917] - Field: 'earlySignal' [18:41:56.917] - Field: 'lazy' [18:41:56.917] - Field: 'state' [18:41:56.917] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:56.918] - Launch lazy future ... [18:41:56.918] Packages needed by the future expression (n = 0): [18:41:56.918] Packages needed by future strategies (n = 0): [18:41:56.919] { [18:41:56.919] { [18:41:56.919] { [18:41:56.919] ...future.startTime <- base::Sys.time() [18:41:56.919] { [18:41:56.919] { [18:41:56.919] { [18:41:56.919] { [18:41:56.919] base::local({ [18:41:56.919] has_future <- base::requireNamespace("future", [18:41:56.919] quietly = TRUE) [18:41:56.919] if (has_future) { [18:41:56.919] ns <- base::getNamespace("future") [18:41:56.919] version <- ns[[".package"]][["version"]] [18:41:56.919] if (is.null(version)) [18:41:56.919] version <- utils::packageVersion("future") [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] version <- NULL [18:41:56.919] } [18:41:56.919] if (!has_future || version < "1.8.0") { [18:41:56.919] info <- base::c(r_version = base::gsub("R version ", [18:41:56.919] "", base::R.version$version.string), [18:41:56.919] platform = base::sprintf("%s (%s-bit)", [18:41:56.919] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:56.919] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:56.919] "release", "version")], collapse = " "), [18:41:56.919] hostname = base::Sys.info()[["nodename"]]) [18:41:56.919] info <- base::sprintf("%s: %s", base::names(info), [18:41:56.919] info) [18:41:56.919] info <- base::paste(info, collapse = "; ") [18:41:56.919] if (!has_future) { [18:41:56.919] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:56.919] info) [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:56.919] info, version) [18:41:56.919] } [18:41:56.919] base::stop(msg) [18:41:56.919] } [18:41:56.919] }) [18:41:56.919] } [18:41:56.919] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:56.919] base::options(mc.cores = 1L) [18:41:56.919] } [18:41:56.919] ...future.strategy.old <- future::plan("list") [18:41:56.919] options(future.plan = NULL) [18:41:56.919] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.919] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:56.919] } [18:41:56.919] ...future.workdir <- getwd() [18:41:56.919] } [18:41:56.919] ...future.oldOptions <- base::as.list(base::.Options) [18:41:56.919] ...future.oldEnvVars <- base::Sys.getenv() [18:41:56.919] } [18:41:56.919] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:56.919] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:56.919] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:56.919] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:56.919] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:56.919] future.stdout.windows.reencode = NULL, width = 80L) [18:41:56.919] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:56.919] base::names(...future.oldOptions)) [18:41:56.919] } [18:41:56.919] if (FALSE) { [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] if (TRUE) { [18:41:56.919] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:56.919] open = "w") [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:56.919] windows = "NUL", "/dev/null"), open = "w") [18:41:56.919] } [18:41:56.919] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:56.919] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:56.919] base::sink(type = "output", split = FALSE) [18:41:56.919] base::close(...future.stdout) [18:41:56.919] }, add = TRUE) [18:41:56.919] } [18:41:56.919] ...future.frame <- base::sys.nframe() [18:41:56.919] ...future.conditions <- base::list() [18:41:56.919] ...future.rng <- base::globalenv()$.Random.seed [18:41:56.919] if (FALSE) { [18:41:56.919] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:56.919] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:56.919] } [18:41:56.919] ...future.result <- base::tryCatch({ [18:41:56.919] base::withCallingHandlers({ [18:41:56.919] ...future.value <- base::withVisible(base::local({ [18:41:56.919] ...future.makeSendCondition <- base::local({ [18:41:56.919] sendCondition <- NULL [18:41:56.919] function(frame = 1L) { [18:41:56.919] if (is.function(sendCondition)) [18:41:56.919] return(sendCondition) [18:41:56.919] ns <- getNamespace("parallel") [18:41:56.919] if (exists("sendData", mode = "function", [18:41:56.919] envir = ns)) { [18:41:56.919] parallel_sendData <- get("sendData", mode = "function", [18:41:56.919] envir = ns) [18:41:56.919] envir <- sys.frame(frame) [18:41:56.919] master <- NULL [18:41:56.919] while (!identical(envir, .GlobalEnv) && [18:41:56.919] !identical(envir, emptyenv())) { [18:41:56.919] if (exists("master", mode = "list", envir = envir, [18:41:56.919] inherits = FALSE)) { [18:41:56.919] master <- get("master", mode = "list", [18:41:56.919] envir = envir, inherits = FALSE) [18:41:56.919] if (inherits(master, c("SOCKnode", [18:41:56.919] "SOCK0node"))) { [18:41:56.919] sendCondition <<- function(cond) { [18:41:56.919] data <- list(type = "VALUE", value = cond, [18:41:56.919] success = TRUE) [18:41:56.919] parallel_sendData(master, data) [18:41:56.919] } [18:41:56.919] return(sendCondition) [18:41:56.919] } [18:41:56.919] } [18:41:56.919] frame <- frame + 1L [18:41:56.919] envir <- sys.frame(frame) [18:41:56.919] } [18:41:56.919] } [18:41:56.919] sendCondition <<- function(cond) NULL [18:41:56.919] } [18:41:56.919] }) [18:41:56.919] withCallingHandlers({ [18:41:56.919] { [18:41:56.919] do.call(function(...) { [18:41:56.919] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.919] if (!identical(...future.globals.maxSize.org, [18:41:56.919] ...future.globals.maxSize)) { [18:41:56.919] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.919] on.exit(options(oopts), add = TRUE) [18:41:56.919] } [18:41:56.919] { [18:41:56.919] lapply(seq_along(...future.elements_ii), [18:41:56.919] FUN = function(jj) { [18:41:56.919] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.919] ...future.FUN(...future.X_jj, ...) [18:41:56.919] }) [18:41:56.919] } [18:41:56.919] }, args = future.call.arguments) [18:41:56.919] } [18:41:56.919] }, immediateCondition = function(cond) { [18:41:56.919] sendCondition <- ...future.makeSendCondition() [18:41:56.919] sendCondition(cond) [18:41:56.919] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.919] { [18:41:56.919] inherits <- base::inherits [18:41:56.919] invokeRestart <- base::invokeRestart [18:41:56.919] is.null <- base::is.null [18:41:56.919] muffled <- FALSE [18:41:56.919] if (inherits(cond, "message")) { [18:41:56.919] muffled <- grepl(pattern, "muffleMessage") [18:41:56.919] if (muffled) [18:41:56.919] invokeRestart("muffleMessage") [18:41:56.919] } [18:41:56.919] else if (inherits(cond, "warning")) { [18:41:56.919] muffled <- grepl(pattern, "muffleWarning") [18:41:56.919] if (muffled) [18:41:56.919] invokeRestart("muffleWarning") [18:41:56.919] } [18:41:56.919] else if (inherits(cond, "condition")) { [18:41:56.919] if (!is.null(pattern)) { [18:41:56.919] computeRestarts <- base::computeRestarts [18:41:56.919] grepl <- base::grepl [18:41:56.919] restarts <- computeRestarts(cond) [18:41:56.919] for (restart in restarts) { [18:41:56.919] name <- restart$name [18:41:56.919] if (is.null(name)) [18:41:56.919] next [18:41:56.919] if (!grepl(pattern, name)) [18:41:56.919] next [18:41:56.919] invokeRestart(restart) [18:41:56.919] muffled <- TRUE [18:41:56.919] break [18:41:56.919] } [18:41:56.919] } [18:41:56.919] } [18:41:56.919] invisible(muffled) [18:41:56.919] } [18:41:56.919] muffleCondition(cond) [18:41:56.919] }) [18:41:56.919] })) [18:41:56.919] future::FutureResult(value = ...future.value$value, [18:41:56.919] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.919] ...future.rng), globalenv = if (FALSE) [18:41:56.919] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:56.919] ...future.globalenv.names)) [18:41:56.919] else NULL, started = ...future.startTime, version = "1.8") [18:41:56.919] }, condition = base::local({ [18:41:56.919] c <- base::c [18:41:56.919] inherits <- base::inherits [18:41:56.919] invokeRestart <- base::invokeRestart [18:41:56.919] length <- base::length [18:41:56.919] list <- base::list [18:41:56.919] seq.int <- base::seq.int [18:41:56.919] signalCondition <- base::signalCondition [18:41:56.919] sys.calls <- base::sys.calls [18:41:56.919] `[[` <- base::`[[` [18:41:56.919] `+` <- base::`+` [18:41:56.919] `<<-` <- base::`<<-` [18:41:56.919] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:56.919] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:56.919] 3L)] [18:41:56.919] } [18:41:56.919] function(cond) { [18:41:56.919] is_error <- inherits(cond, "error") [18:41:56.919] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:56.919] NULL) [18:41:56.919] if (is_error) { [18:41:56.919] sessionInformation <- function() { [18:41:56.919] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:56.919] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:56.919] search = base::search(), system = base::Sys.info()) [18:41:56.919] } [18:41:56.919] ...future.conditions[[length(...future.conditions) + [18:41:56.919] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:56.919] cond$call), session = sessionInformation(), [18:41:56.919] timestamp = base::Sys.time(), signaled = 0L) [18:41:56.919] signalCondition(cond) [18:41:56.919] } [18:41:56.919] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:56.919] "immediateCondition"))) { [18:41:56.919] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:56.919] ...future.conditions[[length(...future.conditions) + [18:41:56.919] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:56.919] if (TRUE && !signal) { [18:41:56.919] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.919] { [18:41:56.919] inherits <- base::inherits [18:41:56.919] invokeRestart <- base::invokeRestart [18:41:56.919] is.null <- base::is.null [18:41:56.919] muffled <- FALSE [18:41:56.919] if (inherits(cond, "message")) { [18:41:56.919] muffled <- grepl(pattern, "muffleMessage") [18:41:56.919] if (muffled) [18:41:56.919] invokeRestart("muffleMessage") [18:41:56.919] } [18:41:56.919] else if (inherits(cond, "warning")) { [18:41:56.919] muffled <- grepl(pattern, "muffleWarning") [18:41:56.919] if (muffled) [18:41:56.919] invokeRestart("muffleWarning") [18:41:56.919] } [18:41:56.919] else if (inherits(cond, "condition")) { [18:41:56.919] if (!is.null(pattern)) { [18:41:56.919] computeRestarts <- base::computeRestarts [18:41:56.919] grepl <- base::grepl [18:41:56.919] restarts <- computeRestarts(cond) [18:41:56.919] for (restart in restarts) { [18:41:56.919] name <- restart$name [18:41:56.919] if (is.null(name)) [18:41:56.919] next [18:41:56.919] if (!grepl(pattern, name)) [18:41:56.919] next [18:41:56.919] invokeRestart(restart) [18:41:56.919] muffled <- TRUE [18:41:56.919] break [18:41:56.919] } [18:41:56.919] } [18:41:56.919] } [18:41:56.919] invisible(muffled) [18:41:56.919] } [18:41:56.919] muffleCondition(cond, pattern = "^muffle") [18:41:56.919] } [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] if (TRUE) { [18:41:56.919] muffleCondition <- function (cond, pattern = "^muffle") [18:41:56.919] { [18:41:56.919] inherits <- base::inherits [18:41:56.919] invokeRestart <- base::invokeRestart [18:41:56.919] is.null <- base::is.null [18:41:56.919] muffled <- FALSE [18:41:56.919] if (inherits(cond, "message")) { [18:41:56.919] muffled <- grepl(pattern, "muffleMessage") [18:41:56.919] if (muffled) [18:41:56.919] invokeRestart("muffleMessage") [18:41:56.919] } [18:41:56.919] else if (inherits(cond, "warning")) { [18:41:56.919] muffled <- grepl(pattern, "muffleWarning") [18:41:56.919] if (muffled) [18:41:56.919] invokeRestart("muffleWarning") [18:41:56.919] } [18:41:56.919] else if (inherits(cond, "condition")) { [18:41:56.919] if (!is.null(pattern)) { [18:41:56.919] computeRestarts <- base::computeRestarts [18:41:56.919] grepl <- base::grepl [18:41:56.919] restarts <- computeRestarts(cond) [18:41:56.919] for (restart in restarts) { [18:41:56.919] name <- restart$name [18:41:56.919] if (is.null(name)) [18:41:56.919] next [18:41:56.919] if (!grepl(pattern, name)) [18:41:56.919] next [18:41:56.919] invokeRestart(restart) [18:41:56.919] muffled <- TRUE [18:41:56.919] break [18:41:56.919] } [18:41:56.919] } [18:41:56.919] } [18:41:56.919] invisible(muffled) [18:41:56.919] } [18:41:56.919] muffleCondition(cond, pattern = "^muffle") [18:41:56.919] } [18:41:56.919] } [18:41:56.919] } [18:41:56.919] })) [18:41:56.919] }, error = function(ex) { [18:41:56.919] base::structure(base::list(value = NULL, visible = NULL, [18:41:56.919] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:56.919] ...future.rng), started = ...future.startTime, [18:41:56.919] finished = Sys.time(), session_uuid = NA_character_, [18:41:56.919] version = "1.8"), class = "FutureResult") [18:41:56.919] }, finally = { [18:41:56.919] if (!identical(...future.workdir, getwd())) [18:41:56.919] setwd(...future.workdir) [18:41:56.919] { [18:41:56.919] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:56.919] ...future.oldOptions$nwarnings <- NULL [18:41:56.919] } [18:41:56.919] base::options(...future.oldOptions) [18:41:56.919] if (.Platform$OS.type == "windows") { [18:41:56.919] old_names <- names(...future.oldEnvVars) [18:41:56.919] envs <- base::Sys.getenv() [18:41:56.919] names <- names(envs) [18:41:56.919] common <- intersect(names, old_names) [18:41:56.919] added <- setdiff(names, old_names) [18:41:56.919] removed <- setdiff(old_names, names) [18:41:56.919] changed <- common[...future.oldEnvVars[common] != [18:41:56.919] envs[common]] [18:41:56.919] NAMES <- toupper(changed) [18:41:56.919] args <- list() [18:41:56.919] for (kk in seq_along(NAMES)) { [18:41:56.919] name <- changed[[kk]] [18:41:56.919] NAME <- NAMES[[kk]] [18:41:56.919] if (name != NAME && is.element(NAME, old_names)) [18:41:56.919] next [18:41:56.919] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.919] } [18:41:56.919] NAMES <- toupper(added) [18:41:56.919] for (kk in seq_along(NAMES)) { [18:41:56.919] name <- added[[kk]] [18:41:56.919] NAME <- NAMES[[kk]] [18:41:56.919] if (name != NAME && is.element(NAME, old_names)) [18:41:56.919] next [18:41:56.919] args[[name]] <- "" [18:41:56.919] } [18:41:56.919] NAMES <- toupper(removed) [18:41:56.919] for (kk in seq_along(NAMES)) { [18:41:56.919] name <- removed[[kk]] [18:41:56.919] NAME <- NAMES[[kk]] [18:41:56.919] if (name != NAME && is.element(NAME, old_names)) [18:41:56.919] next [18:41:56.919] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:56.919] } [18:41:56.919] if (length(args) > 0) [18:41:56.919] base::do.call(base::Sys.setenv, args = args) [18:41:56.919] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:56.919] } [18:41:56.919] { [18:41:56.919] if (base::length(...future.futureOptionsAdded) > [18:41:56.919] 0L) { [18:41:56.919] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:56.919] base::names(opts) <- ...future.futureOptionsAdded [18:41:56.919] base::options(opts) [18:41:56.919] } [18:41:56.919] { [18:41:56.919] { [18:41:56.919] base::options(mc.cores = ...future.mc.cores.old) [18:41:56.919] NULL [18:41:56.919] } [18:41:56.919] options(future.plan = NULL) [18:41:56.919] if (is.na(NA_character_)) [18:41:56.919] Sys.unsetenv("R_FUTURE_PLAN") [18:41:56.919] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:56.919] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:56.919] .init = FALSE) [18:41:56.919] } [18:41:56.919] } [18:41:56.919] } [18:41:56.919] }) [18:41:56.919] if (TRUE) { [18:41:56.919] base::sink(type = "output", split = FALSE) [18:41:56.919] if (TRUE) { [18:41:56.919] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:56.919] } [18:41:56.919] else { [18:41:56.919] ...future.result["stdout"] <- base::list(NULL) [18:41:56.919] } [18:41:56.919] base::close(...future.stdout) [18:41:56.919] ...future.stdout <- NULL [18:41:56.919] } [18:41:56.919] ...future.result$conditions <- ...future.conditions [18:41:56.919] ...future.result$finished <- base::Sys.time() [18:41:56.919] ...future.result [18:41:56.919] } [18:41:56.924] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:56.924] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:56.925] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:56.925] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:56.925] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:56.925] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:56.926] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:56.926] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:56.926] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:56.927] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:56.927] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:56.927] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:56.928] MultisessionFuture started [18:41:56.928] - Launch lazy future ... done [18:41:56.928] run() for 'MultisessionFuture' ... done [18:41:56.928] Created future: [18:41:56.944] receiveMessageFromWorker() for ClusterFuture ... [18:41:56.945] - Validating connection of MultisessionFuture [18:41:56.945] - received message: FutureResult [18:41:56.945] - Received FutureResult [18:41:56.945] - Erased future from FutureRegistry [18:41:56.945] result() for ClusterFuture ... [18:41:56.946] - result already collected: FutureResult [18:41:56.946] result() for ClusterFuture ... done [18:41:56.946] receiveMessageFromWorker() for ClusterFuture ... done [18:41:56.929] MultisessionFuture: [18:41:56.929] Label: 'future_sapply-2' [18:41:56.929] Expression: [18:41:56.929] { [18:41:56.929] do.call(function(...) { [18:41:56.929] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.929] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.929] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.929] on.exit(options(oopts), add = TRUE) [18:41:56.929] } [18:41:56.929] { [18:41:56.929] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.929] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.929] ...future.FUN(...future.X_jj, ...) [18:41:56.929] }) [18:41:56.929] } [18:41:56.929] }, args = future.call.arguments) [18:41:56.929] } [18:41:56.929] Lazy evaluation: FALSE [18:41:56.929] Asynchronous evaluation: TRUE [18:41:56.929] Local evaluation: TRUE [18:41:56.929] Environment: R_GlobalEnv [18:41:56.929] Capture standard output: TRUE [18:41:56.929] Capture condition classes: 'condition' (excluding 'nothing') [18:41:56.929] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:56.929] Packages: [18:41:56.929] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:56.929] Resolved: TRUE [18:41:56.929] Value: [18:41:56.929] Conditions captured: [18:41:56.929] Early signaling: FALSE [18:41:56.929] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:56.929] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:56.946] Chunk #2 of 2 ... DONE [18:41:56.947] Launching 2 futures (chunks) ... DONE [18:41:56.947] Resolving 2 futures (chunks) ... [18:41:56.947] resolve() on list ... [18:41:56.947] recursive: 0 [18:41:56.947] length: 2 [18:41:56.947] [18:41:56.948] Future #1 [18:41:56.948] result() for ClusterFuture ... [18:41:56.948] - result already collected: FutureResult [18:41:56.948] result() for ClusterFuture ... done [18:41:56.948] result() for ClusterFuture ... [18:41:56.948] - result already collected: FutureResult [18:41:56.948] result() for ClusterFuture ... done [18:41:56.949] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:56.949] - nx: 2 [18:41:56.949] - relay: TRUE [18:41:56.949] - stdout: TRUE [18:41:56.949] - signal: TRUE [18:41:56.949] - resignal: FALSE [18:41:56.950] - force: TRUE [18:41:56.950] - relayed: [n=2] FALSE, FALSE [18:41:56.950] - queued futures: [n=2] FALSE, FALSE [18:41:56.950] - until=1 [18:41:56.950] - relaying element #1 [18:41:56.950] result() for ClusterFuture ... [18:41:56.951] - result already collected: FutureResult [18:41:56.951] result() for ClusterFuture ... done [18:41:56.951] result() for ClusterFuture ... [18:41:56.951] - result already collected: FutureResult [18:41:56.951] result() for ClusterFuture ... done [18:41:56.951] result() for ClusterFuture ... [18:41:56.952] - result already collected: FutureResult [18:41:56.952] result() for ClusterFuture ... done [18:41:56.952] result() for ClusterFuture ... [18:41:56.952] - result already collected: FutureResult [18:41:56.952] result() for ClusterFuture ... done [18:41:56.952] - relayed: [n=2] TRUE, FALSE [18:41:56.952] - queued futures: [n=2] TRUE, FALSE [18:41:56.953] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:56.953] length: 1 (resolved future 1) [18:41:56.953] Future #2 [18:41:56.953] result() for ClusterFuture ... [18:41:56.953] - result already collected: FutureResult [18:41:56.953] result() for ClusterFuture ... done [18:41:56.954] result() for ClusterFuture ... [18:41:56.954] - result already collected: FutureResult [18:41:56.954] result() for ClusterFuture ... done [18:41:56.954] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:56.954] - nx: 2 [18:41:56.954] - relay: TRUE [18:41:56.955] - stdout: TRUE [18:41:56.955] - signal: TRUE [18:41:56.955] - resignal: FALSE [18:41:56.955] - force: TRUE [18:41:56.955] - relayed: [n=2] TRUE, FALSE [18:41:56.955] - queued futures: [n=2] TRUE, FALSE [18:41:56.956] - until=2 [18:41:56.956] - relaying element #2 [18:41:56.956] result() for ClusterFuture ... [18:41:56.956] - result already collected: FutureResult [18:41:56.956] result() for ClusterFuture ... done [18:41:56.956] result() for ClusterFuture ... [18:41:56.956] - result already collected: FutureResult [18:41:56.957] result() for ClusterFuture ... done [18:41:56.957] result() for ClusterFuture ... [18:41:56.957] - result already collected: FutureResult [18:41:56.957] result() for ClusterFuture ... done [18:41:56.957] result() for ClusterFuture ... [18:41:56.957] - result already collected: FutureResult [18:41:56.958] result() for ClusterFuture ... done [18:41:56.958] - relayed: [n=2] TRUE, TRUE [18:41:56.958] - queued futures: [n=2] TRUE, TRUE [18:41:56.958] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:56.958] length: 0 (resolved future 2) [18:41:56.958] Relaying remaining futures [18:41:56.959] signalConditionsASAP(NULL, pos=0) ... [18:41:56.959] - nx: 2 [18:41:56.959] - relay: TRUE [18:41:56.959] - stdout: TRUE [18:41:56.959] - signal: TRUE [18:41:56.959] - resignal: FALSE [18:41:56.960] - force: TRUE [18:41:56.960] - relayed: [n=2] TRUE, TRUE [18:41:56.960] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:56.960] - relayed: [n=2] TRUE, TRUE [18:41:56.960] - queued futures: [n=2] TRUE, TRUE [18:41:56.960] signalConditionsASAP(NULL, pos=0) ... done [18:41:56.961] resolve() on list ... DONE [18:41:56.961] result() for ClusterFuture ... [18:41:56.961] - result already collected: FutureResult [18:41:56.961] result() for ClusterFuture ... done [18:41:56.961] result() for ClusterFuture ... [18:41:56.961] - result already collected: FutureResult [18:41:56.962] result() for ClusterFuture ... done [18:41:56.962] result() for ClusterFuture ... [18:41:56.962] - result already collected: FutureResult [18:41:56.962] result() for ClusterFuture ... done [18:41:56.962] result() for ClusterFuture ... [18:41:56.962] - result already collected: FutureResult [18:41:56.962] result() for ClusterFuture ... done [18:41:56.963] - Number of value chunks collected: 2 [18:41:56.963] Resolving 2 futures (chunks) ... DONE [18:41:56.963] Reducing values from 2 chunks ... [18:41:56.963] - Number of values collected after concatenation: 4 [18:41:56.963] - Number of values expected: 4 [18:41:56.963] Reducing values from 2 chunks ... DONE [18:41:56.964] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:56.966] future_lapply() ... [18:41:56.969] Number of chunks: 2 [18:41:56.969] getGlobalsAndPackagesXApply() ... [18:41:56.969] - future.globals: TRUE [18:41:56.969] getGlobalsAndPackages() ... [18:41:56.970] Searching for globals... [18:41:56.971] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:56.972] Searching for globals ... DONE [18:41:56.972] Resolving globals: FALSE [18:41:56.972] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:56.973] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:56.973] - globals: [1] 'FUN' [18:41:56.973] [18:41:56.973] getGlobalsAndPackages() ... DONE [18:41:56.974] - globals found/used: [n=1] 'FUN' [18:41:56.974] - needed namespaces: [n=0] [18:41:56.974] Finding globals ... DONE [18:41:56.974] - use_args: TRUE [18:41:56.974] - Getting '...' globals ... [18:41:56.975] resolve() on list ... [18:41:56.975] recursive: 0 [18:41:56.975] length: 1 [18:41:56.975] elements: '...' [18:41:56.975] length: 0 (resolved future 1) [18:41:56.976] resolve() on list ... DONE [18:41:56.976] - '...' content: [n=0] [18:41:56.976] List of 1 [18:41:56.976] $ ...: list() [18:41:56.976] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.976] - attr(*, "where")=List of 1 [18:41:56.976] ..$ ...: [18:41:56.976] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.976] - attr(*, "resolved")= logi TRUE [18:41:56.976] - attr(*, "total_size")= num NA [18:41:56.979] - Getting '...' globals ... DONE [18:41:56.979] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:56.979] List of 2 [18:41:56.979] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:56.979] $ ... : list() [18:41:56.979] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:56.979] - attr(*, "where")=List of 2 [18:41:56.979] ..$ ...future.FUN: [18:41:56.979] ..$ ... : [18:41:56.979] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:56.979] - attr(*, "resolved")= logi FALSE [18:41:56.979] - attr(*, "total_size")= int 6632 [18:41:56.983] Packages to be attached in all futures: [n=0] [18:41:56.983] getGlobalsAndPackagesXApply() ... DONE [18:41:56.983] Number of futures (= number of chunks): 2 [18:41:56.983] Launching 2 futures (chunks) ... [18:41:56.983] Chunk #1 of 2 ... [18:41:56.984] - Finding globals in 'X' for chunk #1 ... [18:41:56.984] getGlobalsAndPackages() ... [18:41:56.984] Searching for globals... [18:41:56.984] [18:41:56.988] Searching for globals ... DONE [18:41:56.988] - globals: [0] [18:41:56.988] getGlobalsAndPackages() ... DONE [18:41:56.988] + additional globals found: [n=0] [18:41:56.988] + additional namespaces needed: [n=0] [18:41:56.989] - Finding globals in 'X' for chunk #1 ... DONE [18:41:56.989] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:56.989] - seeds: [18:41:56.989] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.989] getGlobalsAndPackages() ... [18:41:56.990] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.990] Resolving globals: FALSE [18:41:56.990] Tweak future expression to call with '...' arguments ... [18:41:56.990] { [18:41:56.990] do.call(function(...) { [18:41:56.990] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:56.990] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:56.990] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:56.990] on.exit(options(oopts), add = TRUE) [18:41:56.990] } [18:41:56.990] { [18:41:56.990] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:56.990] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:56.990] ...future.FUN(...future.X_jj, ...) [18:41:56.990] }) [18:41:56.990] } [18:41:56.990] }, args = future.call.arguments) [18:41:56.990] } [18:41:56.991] Tweak future expression to call with '...' arguments ... DONE [18:41:56.991] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:56.992] [18:41:56.992] getGlobalsAndPackages() ... DONE [18:41:56.992] run() for 'Future' ... [18:41:56.992] - state: 'created' [18:41:56.993] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.009] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.010] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.010] - Field: 'node' [18:41:57.010] - Field: 'label' [18:41:57.010] - Field: 'local' [18:41:57.010] - Field: 'owner' [18:41:57.011] - Field: 'envir' [18:41:57.011] - Field: 'workers' [18:41:57.011] - Field: 'packages' [18:41:57.011] - Field: 'gc' [18:41:57.011] - Field: 'conditions' [18:41:57.011] - Field: 'persistent' [18:41:57.012] - Field: 'expr' [18:41:57.012] - Field: 'uuid' [18:41:57.012] - Field: 'seed' [18:41:57.012] - Field: 'version' [18:41:57.012] - Field: 'result' [18:41:57.012] - Field: 'asynchronous' [18:41:57.013] - Field: 'calls' [18:41:57.013] - Field: 'globals' [18:41:57.013] - Field: 'stdout' [18:41:57.013] - Field: 'earlySignal' [18:41:57.013] - Field: 'lazy' [18:41:57.013] - Field: 'state' [18:41:57.014] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.014] - Launch lazy future ... [18:41:57.014] Packages needed by the future expression (n = 0): [18:41:57.014] Packages needed by future strategies (n = 0): [18:41:57.015] { [18:41:57.015] { [18:41:57.015] { [18:41:57.015] ...future.startTime <- base::Sys.time() [18:41:57.015] { [18:41:57.015] { [18:41:57.015] { [18:41:57.015] { [18:41:57.015] base::local({ [18:41:57.015] has_future <- base::requireNamespace("future", [18:41:57.015] quietly = TRUE) [18:41:57.015] if (has_future) { [18:41:57.015] ns <- base::getNamespace("future") [18:41:57.015] version <- ns[[".package"]][["version"]] [18:41:57.015] if (is.null(version)) [18:41:57.015] version <- utils::packageVersion("future") [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] version <- NULL [18:41:57.015] } [18:41:57.015] if (!has_future || version < "1.8.0") { [18:41:57.015] info <- base::c(r_version = base::gsub("R version ", [18:41:57.015] "", base::R.version$version.string), [18:41:57.015] platform = base::sprintf("%s (%s-bit)", [18:41:57.015] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.015] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.015] "release", "version")], collapse = " "), [18:41:57.015] hostname = base::Sys.info()[["nodename"]]) [18:41:57.015] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.015] info) [18:41:57.015] info <- base::paste(info, collapse = "; ") [18:41:57.015] if (!has_future) { [18:41:57.015] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.015] info) [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.015] info, version) [18:41:57.015] } [18:41:57.015] base::stop(msg) [18:41:57.015] } [18:41:57.015] }) [18:41:57.015] } [18:41:57.015] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.015] base::options(mc.cores = 1L) [18:41:57.015] } [18:41:57.015] ...future.strategy.old <- future::plan("list") [18:41:57.015] options(future.plan = NULL) [18:41:57.015] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.015] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.015] } [18:41:57.015] ...future.workdir <- getwd() [18:41:57.015] } [18:41:57.015] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.015] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.015] } [18:41:57.015] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.015] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.015] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.015] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.015] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.015] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.015] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.015] base::names(...future.oldOptions)) [18:41:57.015] } [18:41:57.015] if (FALSE) { [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] if (TRUE) { [18:41:57.015] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.015] open = "w") [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.015] windows = "NUL", "/dev/null"), open = "w") [18:41:57.015] } [18:41:57.015] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.015] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.015] base::sink(type = "output", split = FALSE) [18:41:57.015] base::close(...future.stdout) [18:41:57.015] }, add = TRUE) [18:41:57.015] } [18:41:57.015] ...future.frame <- base::sys.nframe() [18:41:57.015] ...future.conditions <- base::list() [18:41:57.015] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.015] if (FALSE) { [18:41:57.015] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.015] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.015] } [18:41:57.015] ...future.result <- base::tryCatch({ [18:41:57.015] base::withCallingHandlers({ [18:41:57.015] ...future.value <- base::withVisible(base::local({ [18:41:57.015] ...future.makeSendCondition <- base::local({ [18:41:57.015] sendCondition <- NULL [18:41:57.015] function(frame = 1L) { [18:41:57.015] if (is.function(sendCondition)) [18:41:57.015] return(sendCondition) [18:41:57.015] ns <- getNamespace("parallel") [18:41:57.015] if (exists("sendData", mode = "function", [18:41:57.015] envir = ns)) { [18:41:57.015] parallel_sendData <- get("sendData", mode = "function", [18:41:57.015] envir = ns) [18:41:57.015] envir <- sys.frame(frame) [18:41:57.015] master <- NULL [18:41:57.015] while (!identical(envir, .GlobalEnv) && [18:41:57.015] !identical(envir, emptyenv())) { [18:41:57.015] if (exists("master", mode = "list", envir = envir, [18:41:57.015] inherits = FALSE)) { [18:41:57.015] master <- get("master", mode = "list", [18:41:57.015] envir = envir, inherits = FALSE) [18:41:57.015] if (inherits(master, c("SOCKnode", [18:41:57.015] "SOCK0node"))) { [18:41:57.015] sendCondition <<- function(cond) { [18:41:57.015] data <- list(type = "VALUE", value = cond, [18:41:57.015] success = TRUE) [18:41:57.015] parallel_sendData(master, data) [18:41:57.015] } [18:41:57.015] return(sendCondition) [18:41:57.015] } [18:41:57.015] } [18:41:57.015] frame <- frame + 1L [18:41:57.015] envir <- sys.frame(frame) [18:41:57.015] } [18:41:57.015] } [18:41:57.015] sendCondition <<- function(cond) NULL [18:41:57.015] } [18:41:57.015] }) [18:41:57.015] withCallingHandlers({ [18:41:57.015] { [18:41:57.015] do.call(function(...) { [18:41:57.015] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.015] if (!identical(...future.globals.maxSize.org, [18:41:57.015] ...future.globals.maxSize)) { [18:41:57.015] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.015] on.exit(options(oopts), add = TRUE) [18:41:57.015] } [18:41:57.015] { [18:41:57.015] lapply(seq_along(...future.elements_ii), [18:41:57.015] FUN = function(jj) { [18:41:57.015] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.015] ...future.FUN(...future.X_jj, ...) [18:41:57.015] }) [18:41:57.015] } [18:41:57.015] }, args = future.call.arguments) [18:41:57.015] } [18:41:57.015] }, immediateCondition = function(cond) { [18:41:57.015] sendCondition <- ...future.makeSendCondition() [18:41:57.015] sendCondition(cond) [18:41:57.015] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.015] { [18:41:57.015] inherits <- base::inherits [18:41:57.015] invokeRestart <- base::invokeRestart [18:41:57.015] is.null <- base::is.null [18:41:57.015] muffled <- FALSE [18:41:57.015] if (inherits(cond, "message")) { [18:41:57.015] muffled <- grepl(pattern, "muffleMessage") [18:41:57.015] if (muffled) [18:41:57.015] invokeRestart("muffleMessage") [18:41:57.015] } [18:41:57.015] else if (inherits(cond, "warning")) { [18:41:57.015] muffled <- grepl(pattern, "muffleWarning") [18:41:57.015] if (muffled) [18:41:57.015] invokeRestart("muffleWarning") [18:41:57.015] } [18:41:57.015] else if (inherits(cond, "condition")) { [18:41:57.015] if (!is.null(pattern)) { [18:41:57.015] computeRestarts <- base::computeRestarts [18:41:57.015] grepl <- base::grepl [18:41:57.015] restarts <- computeRestarts(cond) [18:41:57.015] for (restart in restarts) { [18:41:57.015] name <- restart$name [18:41:57.015] if (is.null(name)) [18:41:57.015] next [18:41:57.015] if (!grepl(pattern, name)) [18:41:57.015] next [18:41:57.015] invokeRestart(restart) [18:41:57.015] muffled <- TRUE [18:41:57.015] break [18:41:57.015] } [18:41:57.015] } [18:41:57.015] } [18:41:57.015] invisible(muffled) [18:41:57.015] } [18:41:57.015] muffleCondition(cond) [18:41:57.015] }) [18:41:57.015] })) [18:41:57.015] future::FutureResult(value = ...future.value$value, [18:41:57.015] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.015] ...future.rng), globalenv = if (FALSE) [18:41:57.015] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.015] ...future.globalenv.names)) [18:41:57.015] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.015] }, condition = base::local({ [18:41:57.015] c <- base::c [18:41:57.015] inherits <- base::inherits [18:41:57.015] invokeRestart <- base::invokeRestart [18:41:57.015] length <- base::length [18:41:57.015] list <- base::list [18:41:57.015] seq.int <- base::seq.int [18:41:57.015] signalCondition <- base::signalCondition [18:41:57.015] sys.calls <- base::sys.calls [18:41:57.015] `[[` <- base::`[[` [18:41:57.015] `+` <- base::`+` [18:41:57.015] `<<-` <- base::`<<-` [18:41:57.015] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.015] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.015] 3L)] [18:41:57.015] } [18:41:57.015] function(cond) { [18:41:57.015] is_error <- inherits(cond, "error") [18:41:57.015] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.015] NULL) [18:41:57.015] if (is_error) { [18:41:57.015] sessionInformation <- function() { [18:41:57.015] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.015] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.015] search = base::search(), system = base::Sys.info()) [18:41:57.015] } [18:41:57.015] ...future.conditions[[length(...future.conditions) + [18:41:57.015] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.015] cond$call), session = sessionInformation(), [18:41:57.015] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.015] signalCondition(cond) [18:41:57.015] } [18:41:57.015] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.015] "immediateCondition"))) { [18:41:57.015] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.015] ...future.conditions[[length(...future.conditions) + [18:41:57.015] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.015] if (TRUE && !signal) { [18:41:57.015] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.015] { [18:41:57.015] inherits <- base::inherits [18:41:57.015] invokeRestart <- base::invokeRestart [18:41:57.015] is.null <- base::is.null [18:41:57.015] muffled <- FALSE [18:41:57.015] if (inherits(cond, "message")) { [18:41:57.015] muffled <- grepl(pattern, "muffleMessage") [18:41:57.015] if (muffled) [18:41:57.015] invokeRestart("muffleMessage") [18:41:57.015] } [18:41:57.015] else if (inherits(cond, "warning")) { [18:41:57.015] muffled <- grepl(pattern, "muffleWarning") [18:41:57.015] if (muffled) [18:41:57.015] invokeRestart("muffleWarning") [18:41:57.015] } [18:41:57.015] else if (inherits(cond, "condition")) { [18:41:57.015] if (!is.null(pattern)) { [18:41:57.015] computeRestarts <- base::computeRestarts [18:41:57.015] grepl <- base::grepl [18:41:57.015] restarts <- computeRestarts(cond) [18:41:57.015] for (restart in restarts) { [18:41:57.015] name <- restart$name [18:41:57.015] if (is.null(name)) [18:41:57.015] next [18:41:57.015] if (!grepl(pattern, name)) [18:41:57.015] next [18:41:57.015] invokeRestart(restart) [18:41:57.015] muffled <- TRUE [18:41:57.015] break [18:41:57.015] } [18:41:57.015] } [18:41:57.015] } [18:41:57.015] invisible(muffled) [18:41:57.015] } [18:41:57.015] muffleCondition(cond, pattern = "^muffle") [18:41:57.015] } [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] if (TRUE) { [18:41:57.015] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.015] { [18:41:57.015] inherits <- base::inherits [18:41:57.015] invokeRestart <- base::invokeRestart [18:41:57.015] is.null <- base::is.null [18:41:57.015] muffled <- FALSE [18:41:57.015] if (inherits(cond, "message")) { [18:41:57.015] muffled <- grepl(pattern, "muffleMessage") [18:41:57.015] if (muffled) [18:41:57.015] invokeRestart("muffleMessage") [18:41:57.015] } [18:41:57.015] else if (inherits(cond, "warning")) { [18:41:57.015] muffled <- grepl(pattern, "muffleWarning") [18:41:57.015] if (muffled) [18:41:57.015] invokeRestart("muffleWarning") [18:41:57.015] } [18:41:57.015] else if (inherits(cond, "condition")) { [18:41:57.015] if (!is.null(pattern)) { [18:41:57.015] computeRestarts <- base::computeRestarts [18:41:57.015] grepl <- base::grepl [18:41:57.015] restarts <- computeRestarts(cond) [18:41:57.015] for (restart in restarts) { [18:41:57.015] name <- restart$name [18:41:57.015] if (is.null(name)) [18:41:57.015] next [18:41:57.015] if (!grepl(pattern, name)) [18:41:57.015] next [18:41:57.015] invokeRestart(restart) [18:41:57.015] muffled <- TRUE [18:41:57.015] break [18:41:57.015] } [18:41:57.015] } [18:41:57.015] } [18:41:57.015] invisible(muffled) [18:41:57.015] } [18:41:57.015] muffleCondition(cond, pattern = "^muffle") [18:41:57.015] } [18:41:57.015] } [18:41:57.015] } [18:41:57.015] })) [18:41:57.015] }, error = function(ex) { [18:41:57.015] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.015] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.015] ...future.rng), started = ...future.startTime, [18:41:57.015] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.015] version = "1.8"), class = "FutureResult") [18:41:57.015] }, finally = { [18:41:57.015] if (!identical(...future.workdir, getwd())) [18:41:57.015] setwd(...future.workdir) [18:41:57.015] { [18:41:57.015] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.015] ...future.oldOptions$nwarnings <- NULL [18:41:57.015] } [18:41:57.015] base::options(...future.oldOptions) [18:41:57.015] if (.Platform$OS.type == "windows") { [18:41:57.015] old_names <- names(...future.oldEnvVars) [18:41:57.015] envs <- base::Sys.getenv() [18:41:57.015] names <- names(envs) [18:41:57.015] common <- intersect(names, old_names) [18:41:57.015] added <- setdiff(names, old_names) [18:41:57.015] removed <- setdiff(old_names, names) [18:41:57.015] changed <- common[...future.oldEnvVars[common] != [18:41:57.015] envs[common]] [18:41:57.015] NAMES <- toupper(changed) [18:41:57.015] args <- list() [18:41:57.015] for (kk in seq_along(NAMES)) { [18:41:57.015] name <- changed[[kk]] [18:41:57.015] NAME <- NAMES[[kk]] [18:41:57.015] if (name != NAME && is.element(NAME, old_names)) [18:41:57.015] next [18:41:57.015] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.015] } [18:41:57.015] NAMES <- toupper(added) [18:41:57.015] for (kk in seq_along(NAMES)) { [18:41:57.015] name <- added[[kk]] [18:41:57.015] NAME <- NAMES[[kk]] [18:41:57.015] if (name != NAME && is.element(NAME, old_names)) [18:41:57.015] next [18:41:57.015] args[[name]] <- "" [18:41:57.015] } [18:41:57.015] NAMES <- toupper(removed) [18:41:57.015] for (kk in seq_along(NAMES)) { [18:41:57.015] name <- removed[[kk]] [18:41:57.015] NAME <- NAMES[[kk]] [18:41:57.015] if (name != NAME && is.element(NAME, old_names)) [18:41:57.015] next [18:41:57.015] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.015] } [18:41:57.015] if (length(args) > 0) [18:41:57.015] base::do.call(base::Sys.setenv, args = args) [18:41:57.015] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.015] } [18:41:57.015] { [18:41:57.015] if (base::length(...future.futureOptionsAdded) > [18:41:57.015] 0L) { [18:41:57.015] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.015] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.015] base::options(opts) [18:41:57.015] } [18:41:57.015] { [18:41:57.015] { [18:41:57.015] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.015] NULL [18:41:57.015] } [18:41:57.015] options(future.plan = NULL) [18:41:57.015] if (is.na(NA_character_)) [18:41:57.015] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.015] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.015] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.015] .init = FALSE) [18:41:57.015] } [18:41:57.015] } [18:41:57.015] } [18:41:57.015] }) [18:41:57.015] if (TRUE) { [18:41:57.015] base::sink(type = "output", split = FALSE) [18:41:57.015] if (TRUE) { [18:41:57.015] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.015] } [18:41:57.015] else { [18:41:57.015] ...future.result["stdout"] <- base::list(NULL) [18:41:57.015] } [18:41:57.015] base::close(...future.stdout) [18:41:57.015] ...future.stdout <- NULL [18:41:57.015] } [18:41:57.015] ...future.result$conditions <- ...future.conditions [18:41:57.015] ...future.result$finished <- base::Sys.time() [18:41:57.015] ...future.result [18:41:57.015] } [18:41:57.020] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:57.020] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:57.021] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:57.021] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.022] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.022] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.022] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.022] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.023] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.023] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.024] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.024] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:57.024] MultisessionFuture started [18:41:57.025] - Launch lazy future ... done [18:41:57.025] run() for 'MultisessionFuture' ... done [18:41:57.025] Created future: [18:41:57.040] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.040] - Validating connection of MultisessionFuture [18:41:57.040] - received message: FutureResult [18:41:57.041] - Received FutureResult [18:41:57.041] - Erased future from FutureRegistry [18:41:57.041] result() for ClusterFuture ... [18:41:57.041] - result already collected: FutureResult [18:41:57.041] result() for ClusterFuture ... done [18:41:57.042] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.025] MultisessionFuture: [18:41:57.025] Label: 'future_sapply-1' [18:41:57.025] Expression: [18:41:57.025] { [18:41:57.025] do.call(function(...) { [18:41:57.025] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.025] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.025] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.025] on.exit(options(oopts), add = TRUE) [18:41:57.025] } [18:41:57.025] { [18:41:57.025] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.025] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.025] ...future.FUN(...future.X_jj, ...) [18:41:57.025] }) [18:41:57.025] } [18:41:57.025] }, args = future.call.arguments) [18:41:57.025] } [18:41:57.025] Lazy evaluation: FALSE [18:41:57.025] Asynchronous evaluation: TRUE [18:41:57.025] Local evaluation: TRUE [18:41:57.025] Environment: R_GlobalEnv [18:41:57.025] Capture standard output: TRUE [18:41:57.025] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.025] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.025] Packages: [18:41:57.025] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.025] Resolved: TRUE [18:41:57.025] Value: [18:41:57.025] Conditions captured: [18:41:57.025] Early signaling: FALSE [18:41:57.025] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.025] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.042] Chunk #1 of 2 ... DONE [18:41:57.042] Chunk #2 of 2 ... [18:41:57.042] - Finding globals in 'X' for chunk #2 ... [18:41:57.042] getGlobalsAndPackages() ... [18:41:57.043] Searching for globals... [18:41:57.043] [18:41:57.043] Searching for globals ... DONE [18:41:57.043] - globals: [0] [18:41:57.043] getGlobalsAndPackages() ... DONE [18:41:57.044] + additional globals found: [n=0] [18:41:57.044] + additional namespaces needed: [n=0] [18:41:57.044] - Finding globals in 'X' for chunk #2 ... DONE [18:41:57.044] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.044] - seeds: [18:41:57.044] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.045] getGlobalsAndPackages() ... [18:41:57.045] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.045] Resolving globals: FALSE [18:41:57.045] Tweak future expression to call with '...' arguments ... [18:41:57.045] { [18:41:57.045] do.call(function(...) { [18:41:57.045] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.045] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.045] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.045] on.exit(options(oopts), add = TRUE) [18:41:57.045] } [18:41:57.045] { [18:41:57.045] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.045] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.045] ...future.FUN(...future.X_jj, ...) [18:41:57.045] }) [18:41:57.045] } [18:41:57.045] }, args = future.call.arguments) [18:41:57.045] } [18:41:57.046] Tweak future expression to call with '...' arguments ... DONE [18:41:57.046] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.046] [18:41:57.047] getGlobalsAndPackages() ... DONE [18:41:57.047] run() for 'Future' ... [18:41:57.047] - state: 'created' [18:41:57.047] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.064] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.064] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.064] - Field: 'node' [18:41:57.064] - Field: 'label' [18:41:57.064] - Field: 'local' [18:41:57.065] - Field: 'owner' [18:41:57.065] - Field: 'envir' [18:41:57.065] - Field: 'workers' [18:41:57.065] - Field: 'packages' [18:41:57.065] - Field: 'gc' [18:41:57.065] - Field: 'conditions' [18:41:57.066] - Field: 'persistent' [18:41:57.066] - Field: 'expr' [18:41:57.066] - Field: 'uuid' [18:41:57.066] - Field: 'seed' [18:41:57.066] - Field: 'version' [18:41:57.067] - Field: 'result' [18:41:57.067] - Field: 'asynchronous' [18:41:57.067] - Field: 'calls' [18:41:57.067] - Field: 'globals' [18:41:57.067] - Field: 'stdout' [18:41:57.067] - Field: 'earlySignal' [18:41:57.068] - Field: 'lazy' [18:41:57.068] - Field: 'state' [18:41:57.068] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.068] - Launch lazy future ... [18:41:57.068] Packages needed by the future expression (n = 0): [18:41:57.069] Packages needed by future strategies (n = 0): [18:41:57.069] { [18:41:57.069] { [18:41:57.069] { [18:41:57.069] ...future.startTime <- base::Sys.time() [18:41:57.069] { [18:41:57.069] { [18:41:57.069] { [18:41:57.069] { [18:41:57.069] base::local({ [18:41:57.069] has_future <- base::requireNamespace("future", [18:41:57.069] quietly = TRUE) [18:41:57.069] if (has_future) { [18:41:57.069] ns <- base::getNamespace("future") [18:41:57.069] version <- ns[[".package"]][["version"]] [18:41:57.069] if (is.null(version)) [18:41:57.069] version <- utils::packageVersion("future") [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] version <- NULL [18:41:57.069] } [18:41:57.069] if (!has_future || version < "1.8.0") { [18:41:57.069] info <- base::c(r_version = base::gsub("R version ", [18:41:57.069] "", base::R.version$version.string), [18:41:57.069] platform = base::sprintf("%s (%s-bit)", [18:41:57.069] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.069] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.069] "release", "version")], collapse = " "), [18:41:57.069] hostname = base::Sys.info()[["nodename"]]) [18:41:57.069] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.069] info) [18:41:57.069] info <- base::paste(info, collapse = "; ") [18:41:57.069] if (!has_future) { [18:41:57.069] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.069] info) [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.069] info, version) [18:41:57.069] } [18:41:57.069] base::stop(msg) [18:41:57.069] } [18:41:57.069] }) [18:41:57.069] } [18:41:57.069] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.069] base::options(mc.cores = 1L) [18:41:57.069] } [18:41:57.069] ...future.strategy.old <- future::plan("list") [18:41:57.069] options(future.plan = NULL) [18:41:57.069] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.069] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.069] } [18:41:57.069] ...future.workdir <- getwd() [18:41:57.069] } [18:41:57.069] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.069] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.069] } [18:41:57.069] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.069] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.069] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.069] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.069] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.069] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.069] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.069] base::names(...future.oldOptions)) [18:41:57.069] } [18:41:57.069] if (FALSE) { [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] if (TRUE) { [18:41:57.069] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.069] open = "w") [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.069] windows = "NUL", "/dev/null"), open = "w") [18:41:57.069] } [18:41:57.069] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.069] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.069] base::sink(type = "output", split = FALSE) [18:41:57.069] base::close(...future.stdout) [18:41:57.069] }, add = TRUE) [18:41:57.069] } [18:41:57.069] ...future.frame <- base::sys.nframe() [18:41:57.069] ...future.conditions <- base::list() [18:41:57.069] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.069] if (FALSE) { [18:41:57.069] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.069] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.069] } [18:41:57.069] ...future.result <- base::tryCatch({ [18:41:57.069] base::withCallingHandlers({ [18:41:57.069] ...future.value <- base::withVisible(base::local({ [18:41:57.069] ...future.makeSendCondition <- base::local({ [18:41:57.069] sendCondition <- NULL [18:41:57.069] function(frame = 1L) { [18:41:57.069] if (is.function(sendCondition)) [18:41:57.069] return(sendCondition) [18:41:57.069] ns <- getNamespace("parallel") [18:41:57.069] if (exists("sendData", mode = "function", [18:41:57.069] envir = ns)) { [18:41:57.069] parallel_sendData <- get("sendData", mode = "function", [18:41:57.069] envir = ns) [18:41:57.069] envir <- sys.frame(frame) [18:41:57.069] master <- NULL [18:41:57.069] while (!identical(envir, .GlobalEnv) && [18:41:57.069] !identical(envir, emptyenv())) { [18:41:57.069] if (exists("master", mode = "list", envir = envir, [18:41:57.069] inherits = FALSE)) { [18:41:57.069] master <- get("master", mode = "list", [18:41:57.069] envir = envir, inherits = FALSE) [18:41:57.069] if (inherits(master, c("SOCKnode", [18:41:57.069] "SOCK0node"))) { [18:41:57.069] sendCondition <<- function(cond) { [18:41:57.069] data <- list(type = "VALUE", value = cond, [18:41:57.069] success = TRUE) [18:41:57.069] parallel_sendData(master, data) [18:41:57.069] } [18:41:57.069] return(sendCondition) [18:41:57.069] } [18:41:57.069] } [18:41:57.069] frame <- frame + 1L [18:41:57.069] envir <- sys.frame(frame) [18:41:57.069] } [18:41:57.069] } [18:41:57.069] sendCondition <<- function(cond) NULL [18:41:57.069] } [18:41:57.069] }) [18:41:57.069] withCallingHandlers({ [18:41:57.069] { [18:41:57.069] do.call(function(...) { [18:41:57.069] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.069] if (!identical(...future.globals.maxSize.org, [18:41:57.069] ...future.globals.maxSize)) { [18:41:57.069] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.069] on.exit(options(oopts), add = TRUE) [18:41:57.069] } [18:41:57.069] { [18:41:57.069] lapply(seq_along(...future.elements_ii), [18:41:57.069] FUN = function(jj) { [18:41:57.069] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.069] ...future.FUN(...future.X_jj, ...) [18:41:57.069] }) [18:41:57.069] } [18:41:57.069] }, args = future.call.arguments) [18:41:57.069] } [18:41:57.069] }, immediateCondition = function(cond) { [18:41:57.069] sendCondition <- ...future.makeSendCondition() [18:41:57.069] sendCondition(cond) [18:41:57.069] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.069] { [18:41:57.069] inherits <- base::inherits [18:41:57.069] invokeRestart <- base::invokeRestart [18:41:57.069] is.null <- base::is.null [18:41:57.069] muffled <- FALSE [18:41:57.069] if (inherits(cond, "message")) { [18:41:57.069] muffled <- grepl(pattern, "muffleMessage") [18:41:57.069] if (muffled) [18:41:57.069] invokeRestart("muffleMessage") [18:41:57.069] } [18:41:57.069] else if (inherits(cond, "warning")) { [18:41:57.069] muffled <- grepl(pattern, "muffleWarning") [18:41:57.069] if (muffled) [18:41:57.069] invokeRestart("muffleWarning") [18:41:57.069] } [18:41:57.069] else if (inherits(cond, "condition")) { [18:41:57.069] if (!is.null(pattern)) { [18:41:57.069] computeRestarts <- base::computeRestarts [18:41:57.069] grepl <- base::grepl [18:41:57.069] restarts <- computeRestarts(cond) [18:41:57.069] for (restart in restarts) { [18:41:57.069] name <- restart$name [18:41:57.069] if (is.null(name)) [18:41:57.069] next [18:41:57.069] if (!grepl(pattern, name)) [18:41:57.069] next [18:41:57.069] invokeRestart(restart) [18:41:57.069] muffled <- TRUE [18:41:57.069] break [18:41:57.069] } [18:41:57.069] } [18:41:57.069] } [18:41:57.069] invisible(muffled) [18:41:57.069] } [18:41:57.069] muffleCondition(cond) [18:41:57.069] }) [18:41:57.069] })) [18:41:57.069] future::FutureResult(value = ...future.value$value, [18:41:57.069] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.069] ...future.rng), globalenv = if (FALSE) [18:41:57.069] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.069] ...future.globalenv.names)) [18:41:57.069] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.069] }, condition = base::local({ [18:41:57.069] c <- base::c [18:41:57.069] inherits <- base::inherits [18:41:57.069] invokeRestart <- base::invokeRestart [18:41:57.069] length <- base::length [18:41:57.069] list <- base::list [18:41:57.069] seq.int <- base::seq.int [18:41:57.069] signalCondition <- base::signalCondition [18:41:57.069] sys.calls <- base::sys.calls [18:41:57.069] `[[` <- base::`[[` [18:41:57.069] `+` <- base::`+` [18:41:57.069] `<<-` <- base::`<<-` [18:41:57.069] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.069] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.069] 3L)] [18:41:57.069] } [18:41:57.069] function(cond) { [18:41:57.069] is_error <- inherits(cond, "error") [18:41:57.069] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.069] NULL) [18:41:57.069] if (is_error) { [18:41:57.069] sessionInformation <- function() { [18:41:57.069] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.069] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.069] search = base::search(), system = base::Sys.info()) [18:41:57.069] } [18:41:57.069] ...future.conditions[[length(...future.conditions) + [18:41:57.069] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.069] cond$call), session = sessionInformation(), [18:41:57.069] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.069] signalCondition(cond) [18:41:57.069] } [18:41:57.069] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.069] "immediateCondition"))) { [18:41:57.069] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.069] ...future.conditions[[length(...future.conditions) + [18:41:57.069] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.069] if (TRUE && !signal) { [18:41:57.069] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.069] { [18:41:57.069] inherits <- base::inherits [18:41:57.069] invokeRestart <- base::invokeRestart [18:41:57.069] is.null <- base::is.null [18:41:57.069] muffled <- FALSE [18:41:57.069] if (inherits(cond, "message")) { [18:41:57.069] muffled <- grepl(pattern, "muffleMessage") [18:41:57.069] if (muffled) [18:41:57.069] invokeRestart("muffleMessage") [18:41:57.069] } [18:41:57.069] else if (inherits(cond, "warning")) { [18:41:57.069] muffled <- grepl(pattern, "muffleWarning") [18:41:57.069] if (muffled) [18:41:57.069] invokeRestart("muffleWarning") [18:41:57.069] } [18:41:57.069] else if (inherits(cond, "condition")) { [18:41:57.069] if (!is.null(pattern)) { [18:41:57.069] computeRestarts <- base::computeRestarts [18:41:57.069] grepl <- base::grepl [18:41:57.069] restarts <- computeRestarts(cond) [18:41:57.069] for (restart in restarts) { [18:41:57.069] name <- restart$name [18:41:57.069] if (is.null(name)) [18:41:57.069] next [18:41:57.069] if (!grepl(pattern, name)) [18:41:57.069] next [18:41:57.069] invokeRestart(restart) [18:41:57.069] muffled <- TRUE [18:41:57.069] break [18:41:57.069] } [18:41:57.069] } [18:41:57.069] } [18:41:57.069] invisible(muffled) [18:41:57.069] } [18:41:57.069] muffleCondition(cond, pattern = "^muffle") [18:41:57.069] } [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] if (TRUE) { [18:41:57.069] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.069] { [18:41:57.069] inherits <- base::inherits [18:41:57.069] invokeRestart <- base::invokeRestart [18:41:57.069] is.null <- base::is.null [18:41:57.069] muffled <- FALSE [18:41:57.069] if (inherits(cond, "message")) { [18:41:57.069] muffled <- grepl(pattern, "muffleMessage") [18:41:57.069] if (muffled) [18:41:57.069] invokeRestart("muffleMessage") [18:41:57.069] } [18:41:57.069] else if (inherits(cond, "warning")) { [18:41:57.069] muffled <- grepl(pattern, "muffleWarning") [18:41:57.069] if (muffled) [18:41:57.069] invokeRestart("muffleWarning") [18:41:57.069] } [18:41:57.069] else if (inherits(cond, "condition")) { [18:41:57.069] if (!is.null(pattern)) { [18:41:57.069] computeRestarts <- base::computeRestarts [18:41:57.069] grepl <- base::grepl [18:41:57.069] restarts <- computeRestarts(cond) [18:41:57.069] for (restart in restarts) { [18:41:57.069] name <- restart$name [18:41:57.069] if (is.null(name)) [18:41:57.069] next [18:41:57.069] if (!grepl(pattern, name)) [18:41:57.069] next [18:41:57.069] invokeRestart(restart) [18:41:57.069] muffled <- TRUE [18:41:57.069] break [18:41:57.069] } [18:41:57.069] } [18:41:57.069] } [18:41:57.069] invisible(muffled) [18:41:57.069] } [18:41:57.069] muffleCondition(cond, pattern = "^muffle") [18:41:57.069] } [18:41:57.069] } [18:41:57.069] } [18:41:57.069] })) [18:41:57.069] }, error = function(ex) { [18:41:57.069] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.069] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.069] ...future.rng), started = ...future.startTime, [18:41:57.069] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.069] version = "1.8"), class = "FutureResult") [18:41:57.069] }, finally = { [18:41:57.069] if (!identical(...future.workdir, getwd())) [18:41:57.069] setwd(...future.workdir) [18:41:57.069] { [18:41:57.069] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.069] ...future.oldOptions$nwarnings <- NULL [18:41:57.069] } [18:41:57.069] base::options(...future.oldOptions) [18:41:57.069] if (.Platform$OS.type == "windows") { [18:41:57.069] old_names <- names(...future.oldEnvVars) [18:41:57.069] envs <- base::Sys.getenv() [18:41:57.069] names <- names(envs) [18:41:57.069] common <- intersect(names, old_names) [18:41:57.069] added <- setdiff(names, old_names) [18:41:57.069] removed <- setdiff(old_names, names) [18:41:57.069] changed <- common[...future.oldEnvVars[common] != [18:41:57.069] envs[common]] [18:41:57.069] NAMES <- toupper(changed) [18:41:57.069] args <- list() [18:41:57.069] for (kk in seq_along(NAMES)) { [18:41:57.069] name <- changed[[kk]] [18:41:57.069] NAME <- NAMES[[kk]] [18:41:57.069] if (name != NAME && is.element(NAME, old_names)) [18:41:57.069] next [18:41:57.069] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.069] } [18:41:57.069] NAMES <- toupper(added) [18:41:57.069] for (kk in seq_along(NAMES)) { [18:41:57.069] name <- added[[kk]] [18:41:57.069] NAME <- NAMES[[kk]] [18:41:57.069] if (name != NAME && is.element(NAME, old_names)) [18:41:57.069] next [18:41:57.069] args[[name]] <- "" [18:41:57.069] } [18:41:57.069] NAMES <- toupper(removed) [18:41:57.069] for (kk in seq_along(NAMES)) { [18:41:57.069] name <- removed[[kk]] [18:41:57.069] NAME <- NAMES[[kk]] [18:41:57.069] if (name != NAME && is.element(NAME, old_names)) [18:41:57.069] next [18:41:57.069] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.069] } [18:41:57.069] if (length(args) > 0) [18:41:57.069] base::do.call(base::Sys.setenv, args = args) [18:41:57.069] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.069] } [18:41:57.069] { [18:41:57.069] if (base::length(...future.futureOptionsAdded) > [18:41:57.069] 0L) { [18:41:57.069] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.069] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.069] base::options(opts) [18:41:57.069] } [18:41:57.069] { [18:41:57.069] { [18:41:57.069] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.069] NULL [18:41:57.069] } [18:41:57.069] options(future.plan = NULL) [18:41:57.069] if (is.na(NA_character_)) [18:41:57.069] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.069] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.069] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.069] .init = FALSE) [18:41:57.069] } [18:41:57.069] } [18:41:57.069] } [18:41:57.069] }) [18:41:57.069] if (TRUE) { [18:41:57.069] base::sink(type = "output", split = FALSE) [18:41:57.069] if (TRUE) { [18:41:57.069] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.069] } [18:41:57.069] else { [18:41:57.069] ...future.result["stdout"] <- base::list(NULL) [18:41:57.069] } [18:41:57.069] base::close(...future.stdout) [18:41:57.069] ...future.stdout <- NULL [18:41:57.069] } [18:41:57.069] ...future.result$conditions <- ...future.conditions [18:41:57.069] ...future.result$finished <- base::Sys.time() [18:41:57.069] ...future.result [18:41:57.069] } [18:41:57.074] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:57.075] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:57.075] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:57.075] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.076] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.076] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.077] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.077] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.077] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.077] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.078] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.078] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:57.079] MultisessionFuture started [18:41:57.079] - Launch lazy future ... done [18:41:57.079] run() for 'MultisessionFuture' ... done [18:41:57.079] Created future: [18:41:57.093] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.093] - Validating connection of MultisessionFuture [18:41:57.093] - received message: FutureResult [18:41:57.093] - Received FutureResult [18:41:57.094] - Erased future from FutureRegistry [18:41:57.094] result() for ClusterFuture ... [18:41:57.094] - result already collected: FutureResult [18:41:57.094] result() for ClusterFuture ... done [18:41:57.094] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.079] MultisessionFuture: [18:41:57.079] Label: 'future_sapply-2' [18:41:57.079] Expression: [18:41:57.079] { [18:41:57.079] do.call(function(...) { [18:41:57.079] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.079] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.079] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.079] on.exit(options(oopts), add = TRUE) [18:41:57.079] } [18:41:57.079] { [18:41:57.079] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.079] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.079] ...future.FUN(...future.X_jj, ...) [18:41:57.079] }) [18:41:57.079] } [18:41:57.079] }, args = future.call.arguments) [18:41:57.079] } [18:41:57.079] Lazy evaluation: FALSE [18:41:57.079] Asynchronous evaluation: TRUE [18:41:57.079] Local evaluation: TRUE [18:41:57.079] Environment: R_GlobalEnv [18:41:57.079] Capture standard output: TRUE [18:41:57.079] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.079] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.079] Packages: [18:41:57.079] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.079] Resolved: TRUE [18:41:57.079] Value: [18:41:57.079] Conditions captured: [18:41:57.079] Early signaling: FALSE [18:41:57.079] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.079] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.095] Chunk #2 of 2 ... DONE [18:41:57.095] Launching 2 futures (chunks) ... DONE [18:41:57.095] Resolving 2 futures (chunks) ... [18:41:57.095] resolve() on list ... [18:41:57.095] recursive: 0 [18:41:57.096] length: 2 [18:41:57.096] [18:41:57.096] Future #1 [18:41:57.096] result() for ClusterFuture ... [18:41:57.096] - result already collected: FutureResult [18:41:57.096] result() for ClusterFuture ... done [18:41:57.097] result() for ClusterFuture ... [18:41:57.097] - result already collected: FutureResult [18:41:57.097] result() for ClusterFuture ... done [18:41:57.097] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:57.097] - nx: 2 [18:41:57.097] - relay: TRUE [18:41:57.097] - stdout: TRUE [18:41:57.098] - signal: TRUE [18:41:57.098] - resignal: FALSE [18:41:57.098] - force: TRUE [18:41:57.098] - relayed: [n=2] FALSE, FALSE [18:41:57.098] - queued futures: [n=2] FALSE, FALSE [18:41:57.099] - until=1 [18:41:57.099] - relaying element #1 [18:41:57.099] result() for ClusterFuture ... [18:41:57.099] - result already collected: FutureResult [18:41:57.099] result() for ClusterFuture ... done [18:41:57.099] result() for ClusterFuture ... [18:41:57.099] - result already collected: FutureResult [18:41:57.100] result() for ClusterFuture ... done [18:41:57.100] result() for ClusterFuture ... [18:41:57.100] - result already collected: FutureResult [18:41:57.100] result() for ClusterFuture ... done [18:41:57.100] result() for ClusterFuture ... [18:41:57.100] - result already collected: FutureResult [18:41:57.101] result() for ClusterFuture ... done [18:41:57.101] - relayed: [n=2] TRUE, FALSE [18:41:57.101] - queued futures: [n=2] TRUE, FALSE [18:41:57.101] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:57.101] length: 1 (resolved future 1) [18:41:57.101] Future #2 [18:41:57.102] result() for ClusterFuture ... [18:41:57.102] - result already collected: FutureResult [18:41:57.102] result() for ClusterFuture ... done [18:41:57.102] result() for ClusterFuture ... [18:41:57.102] - result already collected: FutureResult [18:41:57.102] result() for ClusterFuture ... done [18:41:57.103] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:57.103] - nx: 2 [18:41:57.103] - relay: TRUE [18:41:57.103] - stdout: TRUE [18:41:57.103] - signal: TRUE [18:41:57.103] - resignal: FALSE [18:41:57.103] - force: TRUE [18:41:57.104] - relayed: [n=2] TRUE, FALSE [18:41:57.104] - queued futures: [n=2] TRUE, FALSE [18:41:57.104] - until=2 [18:41:57.104] - relaying element #2 [18:41:57.104] result() for ClusterFuture ... [18:41:57.104] - result already collected: FutureResult [18:41:57.105] result() for ClusterFuture ... done [18:41:57.105] result() for ClusterFuture ... [18:41:57.105] - result already collected: FutureResult [18:41:57.105] result() for ClusterFuture ... done [18:41:57.105] result() for ClusterFuture ... [18:41:57.105] - result already collected: FutureResult [18:41:57.106] result() for ClusterFuture ... done [18:41:57.106] result() for ClusterFuture ... [18:41:57.106] - result already collected: FutureResult [18:41:57.106] result() for ClusterFuture ... done [18:41:57.106] - relayed: [n=2] TRUE, TRUE [18:41:57.106] - queued futures: [n=2] TRUE, TRUE [18:41:57.106] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:57.107] length: 0 (resolved future 2) [18:41:57.107] Relaying remaining futures [18:41:57.107] signalConditionsASAP(NULL, pos=0) ... [18:41:57.107] - nx: 2 [18:41:57.107] - relay: TRUE [18:41:57.107] - stdout: TRUE [18:41:57.108] - signal: TRUE [18:41:57.108] - resignal: FALSE [18:41:57.108] - force: TRUE [18:41:57.108] - relayed: [n=2] TRUE, TRUE [18:41:57.108] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:57.108] - relayed: [n=2] TRUE, TRUE [18:41:57.109] - queued futures: [n=2] TRUE, TRUE [18:41:57.109] signalConditionsASAP(NULL, pos=0) ... done [18:41:57.109] resolve() on list ... DONE [18:41:57.109] result() for ClusterFuture ... [18:41:57.109] - result already collected: FutureResult [18:41:57.109] result() for ClusterFuture ... done [18:41:57.110] result() for ClusterFuture ... [18:41:57.110] - result already collected: FutureResult [18:41:57.110] result() for ClusterFuture ... done [18:41:57.110] result() for ClusterFuture ... [18:41:57.110] - result already collected: FutureResult [18:41:57.110] result() for ClusterFuture ... done [18:41:57.110] result() for ClusterFuture ... [18:41:57.111] - result already collected: FutureResult [18:41:57.111] result() for ClusterFuture ... done [18:41:57.111] - Number of value chunks collected: 2 [18:41:57.111] Resolving 2 futures (chunks) ... DONE [18:41:57.111] Reducing values from 2 chunks ... [18:41:57.111] - Number of values collected after concatenation: 4 [18:41:57.112] - Number of values expected: 4 [18:41:57.112] Reducing values from 2 chunks ... DONE [18:41:57.112] future_lapply() ... DONE List of 2 $ y0: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:15, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 2 .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:57.115] future_lapply() ... [18:41:57.118] Number of chunks: 2 [18:41:57.118] getGlobalsAndPackagesXApply() ... [18:41:57.118] - future.globals: TRUE [18:41:57.119] getGlobalsAndPackages() ... [18:41:57.119] Searching for globals... [18:41:57.120] - globals found: [1] 'FUN' [18:41:57.120] Searching for globals ... DONE [18:41:57.120] Resolving globals: FALSE [18:41:57.121] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:57.121] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:57.121] - globals: [1] 'FUN' [18:41:57.122] [18:41:57.122] getGlobalsAndPackages() ... DONE [18:41:57.122] - globals found/used: [n=1] 'FUN' [18:41:57.122] - needed namespaces: [n=0] [18:41:57.122] Finding globals ... DONE [18:41:57.122] - use_args: TRUE [18:41:57.123] - Getting '...' globals ... [18:41:57.123] resolve() on list ... [18:41:57.123] recursive: 0 [18:41:57.123] length: 1 [18:41:57.123] elements: '...' [18:41:57.124] length: 0 (resolved future 1) [18:41:57.124] resolve() on list ... DONE [18:41:57.124] - '...' content: [n=0] [18:41:57.124] List of 1 [18:41:57.124] $ ...: list() [18:41:57.124] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.124] - attr(*, "where")=List of 1 [18:41:57.124] ..$ ...: [18:41:57.124] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.124] - attr(*, "resolved")= logi TRUE [18:41:57.124] - attr(*, "total_size")= num NA [18:41:57.127] - Getting '...' globals ... DONE [18:41:57.127] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:57.127] List of 2 [18:41:57.127] $ ...future.FUN:function (x) [18:41:57.127] $ ... : list() [18:41:57.127] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.127] - attr(*, "where")=List of 2 [18:41:57.127] ..$ ...future.FUN: [18:41:57.127] ..$ ... : [18:41:57.127] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.127] - attr(*, "resolved")= logi FALSE [18:41:57.127] - attr(*, "total_size")= int 4910 [18:41:57.131] Packages to be attached in all futures: [n=0] [18:41:57.131] getGlobalsAndPackagesXApply() ... DONE [18:41:57.131] Number of futures (= number of chunks): 2 [18:41:57.131] Launching 2 futures (chunks) ... [18:41:57.132] Chunk #1 of 2 ... [18:41:57.132] - Finding globals in 'X' for chunk #1 ... [18:41:57.132] getGlobalsAndPackages() ... [18:41:57.132] Searching for globals... [18:41:57.132] [18:41:57.133] Searching for globals ... DONE [18:41:57.133] - globals: [0] [18:41:57.133] getGlobalsAndPackages() ... DONE [18:41:57.133] + additional globals found: [n=0] [18:41:57.133] + additional namespaces needed: [n=0] [18:41:57.133] - Finding globals in 'X' for chunk #1 ... DONE [18:41:57.134] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.134] - seeds: [18:41:57.134] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.134] getGlobalsAndPackages() ... [18:41:57.134] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.134] Resolving globals: FALSE [18:41:57.135] Tweak future expression to call with '...' arguments ... [18:41:57.135] { [18:41:57.135] do.call(function(...) { [18:41:57.135] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.135] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.135] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.135] on.exit(options(oopts), add = TRUE) [18:41:57.135] } [18:41:57.135] { [18:41:57.135] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.135] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.135] ...future.FUN(...future.X_jj, ...) [18:41:57.135] }) [18:41:57.135] } [18:41:57.135] }, args = future.call.arguments) [18:41:57.135] } [18:41:57.135] Tweak future expression to call with '...' arguments ... DONE [18:41:57.136] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.136] [18:41:57.136] getGlobalsAndPackages() ... DONE [18:41:57.136] run() for 'Future' ... [18:41:57.137] - state: 'created' [18:41:57.137] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.152] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.153] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.153] - Field: 'node' [18:41:57.153] - Field: 'label' [18:41:57.153] - Field: 'local' [18:41:57.153] - Field: 'owner' [18:41:57.153] - Field: 'envir' [18:41:57.154] - Field: 'workers' [18:41:57.154] - Field: 'packages' [18:41:57.154] - Field: 'gc' [18:41:57.154] - Field: 'conditions' [18:41:57.154] - Field: 'persistent' [18:41:57.154] - Field: 'expr' [18:41:57.155] - Field: 'uuid' [18:41:57.155] - Field: 'seed' [18:41:57.155] - Field: 'version' [18:41:57.155] - Field: 'result' [18:41:57.155] - Field: 'asynchronous' [18:41:57.156] - Field: 'calls' [18:41:57.156] - Field: 'globals' [18:41:57.156] - Field: 'stdout' [18:41:57.156] - Field: 'earlySignal' [18:41:57.156] - Field: 'lazy' [18:41:57.156] - Field: 'state' [18:41:57.157] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.157] - Launch lazy future ... [18:41:57.157] Packages needed by the future expression (n = 0): [18:41:57.157] Packages needed by future strategies (n = 0): [18:41:57.158] { [18:41:57.158] { [18:41:57.158] { [18:41:57.158] ...future.startTime <- base::Sys.time() [18:41:57.158] { [18:41:57.158] { [18:41:57.158] { [18:41:57.158] { [18:41:57.158] base::local({ [18:41:57.158] has_future <- base::requireNamespace("future", [18:41:57.158] quietly = TRUE) [18:41:57.158] if (has_future) { [18:41:57.158] ns <- base::getNamespace("future") [18:41:57.158] version <- ns[[".package"]][["version"]] [18:41:57.158] if (is.null(version)) [18:41:57.158] version <- utils::packageVersion("future") [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] version <- NULL [18:41:57.158] } [18:41:57.158] if (!has_future || version < "1.8.0") { [18:41:57.158] info <- base::c(r_version = base::gsub("R version ", [18:41:57.158] "", base::R.version$version.string), [18:41:57.158] platform = base::sprintf("%s (%s-bit)", [18:41:57.158] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.158] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.158] "release", "version")], collapse = " "), [18:41:57.158] hostname = base::Sys.info()[["nodename"]]) [18:41:57.158] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.158] info) [18:41:57.158] info <- base::paste(info, collapse = "; ") [18:41:57.158] if (!has_future) { [18:41:57.158] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.158] info) [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.158] info, version) [18:41:57.158] } [18:41:57.158] base::stop(msg) [18:41:57.158] } [18:41:57.158] }) [18:41:57.158] } [18:41:57.158] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.158] base::options(mc.cores = 1L) [18:41:57.158] } [18:41:57.158] ...future.strategy.old <- future::plan("list") [18:41:57.158] options(future.plan = NULL) [18:41:57.158] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.158] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.158] } [18:41:57.158] ...future.workdir <- getwd() [18:41:57.158] } [18:41:57.158] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.158] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.158] } [18:41:57.158] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.158] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.158] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.158] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.158] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.158] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.158] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.158] base::names(...future.oldOptions)) [18:41:57.158] } [18:41:57.158] if (FALSE) { [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] if (TRUE) { [18:41:57.158] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.158] open = "w") [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.158] windows = "NUL", "/dev/null"), open = "w") [18:41:57.158] } [18:41:57.158] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.158] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.158] base::sink(type = "output", split = FALSE) [18:41:57.158] base::close(...future.stdout) [18:41:57.158] }, add = TRUE) [18:41:57.158] } [18:41:57.158] ...future.frame <- base::sys.nframe() [18:41:57.158] ...future.conditions <- base::list() [18:41:57.158] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.158] if (FALSE) { [18:41:57.158] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.158] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.158] } [18:41:57.158] ...future.result <- base::tryCatch({ [18:41:57.158] base::withCallingHandlers({ [18:41:57.158] ...future.value <- base::withVisible(base::local({ [18:41:57.158] ...future.makeSendCondition <- base::local({ [18:41:57.158] sendCondition <- NULL [18:41:57.158] function(frame = 1L) { [18:41:57.158] if (is.function(sendCondition)) [18:41:57.158] return(sendCondition) [18:41:57.158] ns <- getNamespace("parallel") [18:41:57.158] if (exists("sendData", mode = "function", [18:41:57.158] envir = ns)) { [18:41:57.158] parallel_sendData <- get("sendData", mode = "function", [18:41:57.158] envir = ns) [18:41:57.158] envir <- sys.frame(frame) [18:41:57.158] master <- NULL [18:41:57.158] while (!identical(envir, .GlobalEnv) && [18:41:57.158] !identical(envir, emptyenv())) { [18:41:57.158] if (exists("master", mode = "list", envir = envir, [18:41:57.158] inherits = FALSE)) { [18:41:57.158] master <- get("master", mode = "list", [18:41:57.158] envir = envir, inherits = FALSE) [18:41:57.158] if (inherits(master, c("SOCKnode", [18:41:57.158] "SOCK0node"))) { [18:41:57.158] sendCondition <<- function(cond) { [18:41:57.158] data <- list(type = "VALUE", value = cond, [18:41:57.158] success = TRUE) [18:41:57.158] parallel_sendData(master, data) [18:41:57.158] } [18:41:57.158] return(sendCondition) [18:41:57.158] } [18:41:57.158] } [18:41:57.158] frame <- frame + 1L [18:41:57.158] envir <- sys.frame(frame) [18:41:57.158] } [18:41:57.158] } [18:41:57.158] sendCondition <<- function(cond) NULL [18:41:57.158] } [18:41:57.158] }) [18:41:57.158] withCallingHandlers({ [18:41:57.158] { [18:41:57.158] do.call(function(...) { [18:41:57.158] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.158] if (!identical(...future.globals.maxSize.org, [18:41:57.158] ...future.globals.maxSize)) { [18:41:57.158] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.158] on.exit(options(oopts), add = TRUE) [18:41:57.158] } [18:41:57.158] { [18:41:57.158] lapply(seq_along(...future.elements_ii), [18:41:57.158] FUN = function(jj) { [18:41:57.158] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.158] ...future.FUN(...future.X_jj, ...) [18:41:57.158] }) [18:41:57.158] } [18:41:57.158] }, args = future.call.arguments) [18:41:57.158] } [18:41:57.158] }, immediateCondition = function(cond) { [18:41:57.158] sendCondition <- ...future.makeSendCondition() [18:41:57.158] sendCondition(cond) [18:41:57.158] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.158] { [18:41:57.158] inherits <- base::inherits [18:41:57.158] invokeRestart <- base::invokeRestart [18:41:57.158] is.null <- base::is.null [18:41:57.158] muffled <- FALSE [18:41:57.158] if (inherits(cond, "message")) { [18:41:57.158] muffled <- grepl(pattern, "muffleMessage") [18:41:57.158] if (muffled) [18:41:57.158] invokeRestart("muffleMessage") [18:41:57.158] } [18:41:57.158] else if (inherits(cond, "warning")) { [18:41:57.158] muffled <- grepl(pattern, "muffleWarning") [18:41:57.158] if (muffled) [18:41:57.158] invokeRestart("muffleWarning") [18:41:57.158] } [18:41:57.158] else if (inherits(cond, "condition")) { [18:41:57.158] if (!is.null(pattern)) { [18:41:57.158] computeRestarts <- base::computeRestarts [18:41:57.158] grepl <- base::grepl [18:41:57.158] restarts <- computeRestarts(cond) [18:41:57.158] for (restart in restarts) { [18:41:57.158] name <- restart$name [18:41:57.158] if (is.null(name)) [18:41:57.158] next [18:41:57.158] if (!grepl(pattern, name)) [18:41:57.158] next [18:41:57.158] invokeRestart(restart) [18:41:57.158] muffled <- TRUE [18:41:57.158] break [18:41:57.158] } [18:41:57.158] } [18:41:57.158] } [18:41:57.158] invisible(muffled) [18:41:57.158] } [18:41:57.158] muffleCondition(cond) [18:41:57.158] }) [18:41:57.158] })) [18:41:57.158] future::FutureResult(value = ...future.value$value, [18:41:57.158] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.158] ...future.rng), globalenv = if (FALSE) [18:41:57.158] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.158] ...future.globalenv.names)) [18:41:57.158] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.158] }, condition = base::local({ [18:41:57.158] c <- base::c [18:41:57.158] inherits <- base::inherits [18:41:57.158] invokeRestart <- base::invokeRestart [18:41:57.158] length <- base::length [18:41:57.158] list <- base::list [18:41:57.158] seq.int <- base::seq.int [18:41:57.158] signalCondition <- base::signalCondition [18:41:57.158] sys.calls <- base::sys.calls [18:41:57.158] `[[` <- base::`[[` [18:41:57.158] `+` <- base::`+` [18:41:57.158] `<<-` <- base::`<<-` [18:41:57.158] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.158] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.158] 3L)] [18:41:57.158] } [18:41:57.158] function(cond) { [18:41:57.158] is_error <- inherits(cond, "error") [18:41:57.158] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.158] NULL) [18:41:57.158] if (is_error) { [18:41:57.158] sessionInformation <- function() { [18:41:57.158] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.158] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.158] search = base::search(), system = base::Sys.info()) [18:41:57.158] } [18:41:57.158] ...future.conditions[[length(...future.conditions) + [18:41:57.158] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.158] cond$call), session = sessionInformation(), [18:41:57.158] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.158] signalCondition(cond) [18:41:57.158] } [18:41:57.158] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.158] "immediateCondition"))) { [18:41:57.158] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.158] ...future.conditions[[length(...future.conditions) + [18:41:57.158] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.158] if (TRUE && !signal) { [18:41:57.158] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.158] { [18:41:57.158] inherits <- base::inherits [18:41:57.158] invokeRestart <- base::invokeRestart [18:41:57.158] is.null <- base::is.null [18:41:57.158] muffled <- FALSE [18:41:57.158] if (inherits(cond, "message")) { [18:41:57.158] muffled <- grepl(pattern, "muffleMessage") [18:41:57.158] if (muffled) [18:41:57.158] invokeRestart("muffleMessage") [18:41:57.158] } [18:41:57.158] else if (inherits(cond, "warning")) { [18:41:57.158] muffled <- grepl(pattern, "muffleWarning") [18:41:57.158] if (muffled) [18:41:57.158] invokeRestart("muffleWarning") [18:41:57.158] } [18:41:57.158] else if (inherits(cond, "condition")) { [18:41:57.158] if (!is.null(pattern)) { [18:41:57.158] computeRestarts <- base::computeRestarts [18:41:57.158] grepl <- base::grepl [18:41:57.158] restarts <- computeRestarts(cond) [18:41:57.158] for (restart in restarts) { [18:41:57.158] name <- restart$name [18:41:57.158] if (is.null(name)) [18:41:57.158] next [18:41:57.158] if (!grepl(pattern, name)) [18:41:57.158] next [18:41:57.158] invokeRestart(restart) [18:41:57.158] muffled <- TRUE [18:41:57.158] break [18:41:57.158] } [18:41:57.158] } [18:41:57.158] } [18:41:57.158] invisible(muffled) [18:41:57.158] } [18:41:57.158] muffleCondition(cond, pattern = "^muffle") [18:41:57.158] } [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] if (TRUE) { [18:41:57.158] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.158] { [18:41:57.158] inherits <- base::inherits [18:41:57.158] invokeRestart <- base::invokeRestart [18:41:57.158] is.null <- base::is.null [18:41:57.158] muffled <- FALSE [18:41:57.158] if (inherits(cond, "message")) { [18:41:57.158] muffled <- grepl(pattern, "muffleMessage") [18:41:57.158] if (muffled) [18:41:57.158] invokeRestart("muffleMessage") [18:41:57.158] } [18:41:57.158] else if (inherits(cond, "warning")) { [18:41:57.158] muffled <- grepl(pattern, "muffleWarning") [18:41:57.158] if (muffled) [18:41:57.158] invokeRestart("muffleWarning") [18:41:57.158] } [18:41:57.158] else if (inherits(cond, "condition")) { [18:41:57.158] if (!is.null(pattern)) { [18:41:57.158] computeRestarts <- base::computeRestarts [18:41:57.158] grepl <- base::grepl [18:41:57.158] restarts <- computeRestarts(cond) [18:41:57.158] for (restart in restarts) { [18:41:57.158] name <- restart$name [18:41:57.158] if (is.null(name)) [18:41:57.158] next [18:41:57.158] if (!grepl(pattern, name)) [18:41:57.158] next [18:41:57.158] invokeRestart(restart) [18:41:57.158] muffled <- TRUE [18:41:57.158] break [18:41:57.158] } [18:41:57.158] } [18:41:57.158] } [18:41:57.158] invisible(muffled) [18:41:57.158] } [18:41:57.158] muffleCondition(cond, pattern = "^muffle") [18:41:57.158] } [18:41:57.158] } [18:41:57.158] } [18:41:57.158] })) [18:41:57.158] }, error = function(ex) { [18:41:57.158] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.158] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.158] ...future.rng), started = ...future.startTime, [18:41:57.158] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.158] version = "1.8"), class = "FutureResult") [18:41:57.158] }, finally = { [18:41:57.158] if (!identical(...future.workdir, getwd())) [18:41:57.158] setwd(...future.workdir) [18:41:57.158] { [18:41:57.158] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.158] ...future.oldOptions$nwarnings <- NULL [18:41:57.158] } [18:41:57.158] base::options(...future.oldOptions) [18:41:57.158] if (.Platform$OS.type == "windows") { [18:41:57.158] old_names <- names(...future.oldEnvVars) [18:41:57.158] envs <- base::Sys.getenv() [18:41:57.158] names <- names(envs) [18:41:57.158] common <- intersect(names, old_names) [18:41:57.158] added <- setdiff(names, old_names) [18:41:57.158] removed <- setdiff(old_names, names) [18:41:57.158] changed <- common[...future.oldEnvVars[common] != [18:41:57.158] envs[common]] [18:41:57.158] NAMES <- toupper(changed) [18:41:57.158] args <- list() [18:41:57.158] for (kk in seq_along(NAMES)) { [18:41:57.158] name <- changed[[kk]] [18:41:57.158] NAME <- NAMES[[kk]] [18:41:57.158] if (name != NAME && is.element(NAME, old_names)) [18:41:57.158] next [18:41:57.158] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.158] } [18:41:57.158] NAMES <- toupper(added) [18:41:57.158] for (kk in seq_along(NAMES)) { [18:41:57.158] name <- added[[kk]] [18:41:57.158] NAME <- NAMES[[kk]] [18:41:57.158] if (name != NAME && is.element(NAME, old_names)) [18:41:57.158] next [18:41:57.158] args[[name]] <- "" [18:41:57.158] } [18:41:57.158] NAMES <- toupper(removed) [18:41:57.158] for (kk in seq_along(NAMES)) { [18:41:57.158] name <- removed[[kk]] [18:41:57.158] NAME <- NAMES[[kk]] [18:41:57.158] if (name != NAME && is.element(NAME, old_names)) [18:41:57.158] next [18:41:57.158] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.158] } [18:41:57.158] if (length(args) > 0) [18:41:57.158] base::do.call(base::Sys.setenv, args = args) [18:41:57.158] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.158] } [18:41:57.158] { [18:41:57.158] if (base::length(...future.futureOptionsAdded) > [18:41:57.158] 0L) { [18:41:57.158] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.158] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.158] base::options(opts) [18:41:57.158] } [18:41:57.158] { [18:41:57.158] { [18:41:57.158] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.158] NULL [18:41:57.158] } [18:41:57.158] options(future.plan = NULL) [18:41:57.158] if (is.na(NA_character_)) [18:41:57.158] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.158] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.158] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.158] .init = FALSE) [18:41:57.158] } [18:41:57.158] } [18:41:57.158] } [18:41:57.158] }) [18:41:57.158] if (TRUE) { [18:41:57.158] base::sink(type = "output", split = FALSE) [18:41:57.158] if (TRUE) { [18:41:57.158] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.158] } [18:41:57.158] else { [18:41:57.158] ...future.result["stdout"] <- base::list(NULL) [18:41:57.158] } [18:41:57.158] base::close(...future.stdout) [18:41:57.158] ...future.stdout <- NULL [18:41:57.158] } [18:41:57.158] ...future.result$conditions <- ...future.conditions [18:41:57.158] ...future.result$finished <- base::Sys.time() [18:41:57.158] ...future.result [18:41:57.158] } [18:41:57.167] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:57.167] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:57.167] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:57.167] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.168] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.168] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.169] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.169] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.169] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.169] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.170] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.170] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:57.171] MultisessionFuture started [18:41:57.171] - Launch lazy future ... done [18:41:57.171] run() for 'MultisessionFuture' ... done [18:41:57.171] Created future: [18:41:57.185] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.185] - Validating connection of MultisessionFuture [18:41:57.185] - received message: FutureResult [18:41:57.185] - Received FutureResult [18:41:57.186] - Erased future from FutureRegistry [18:41:57.186] result() for ClusterFuture ... [18:41:57.186] - result already collected: FutureResult [18:41:57.186] result() for ClusterFuture ... done [18:41:57.186] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.171] MultisessionFuture: [18:41:57.171] Label: 'future_sapply-1' [18:41:57.171] Expression: [18:41:57.171] { [18:41:57.171] do.call(function(...) { [18:41:57.171] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.171] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.171] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.171] on.exit(options(oopts), add = TRUE) [18:41:57.171] } [18:41:57.171] { [18:41:57.171] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.171] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.171] ...future.FUN(...future.X_jj, ...) [18:41:57.171] }) [18:41:57.171] } [18:41:57.171] }, args = future.call.arguments) [18:41:57.171] } [18:41:57.171] Lazy evaluation: FALSE [18:41:57.171] Asynchronous evaluation: TRUE [18:41:57.171] Local evaluation: TRUE [18:41:57.171] Environment: R_GlobalEnv [18:41:57.171] Capture standard output: TRUE [18:41:57.171] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.171] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.171] Packages: [18:41:57.171] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.171] Resolved: TRUE [18:41:57.171] Value: [18:41:57.171] Conditions captured: [18:41:57.171] Early signaling: FALSE [18:41:57.171] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.171] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.187] Chunk #1 of 2 ... DONE [18:41:57.187] Chunk #2 of 2 ... [18:41:57.187] - Finding globals in 'X' for chunk #2 ... [18:41:57.187] getGlobalsAndPackages() ... [18:41:57.187] Searching for globals... [18:41:57.188] [18:41:57.188] Searching for globals ... DONE [18:41:57.188] - globals: [0] [18:41:57.188] getGlobalsAndPackages() ... DONE [18:41:57.188] + additional globals found: [n=0] [18:41:57.189] + additional namespaces needed: [n=0] [18:41:57.189] - Finding globals in 'X' for chunk #2 ... DONE [18:41:57.189] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.189] - seeds: [18:41:57.189] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.189] getGlobalsAndPackages() ... [18:41:57.190] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.190] Resolving globals: FALSE [18:41:57.190] Tweak future expression to call with '...' arguments ... [18:41:57.190] { [18:41:57.190] do.call(function(...) { [18:41:57.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.190] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.190] on.exit(options(oopts), add = TRUE) [18:41:57.190] } [18:41:57.190] { [18:41:57.190] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.190] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.190] ...future.FUN(...future.X_jj, ...) [18:41:57.190] }) [18:41:57.190] } [18:41:57.190] }, args = future.call.arguments) [18:41:57.190] } [18:41:57.191] Tweak future expression to call with '...' arguments ... DONE [18:41:57.191] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.191] [18:41:57.191] getGlobalsAndPackages() ... DONE [18:41:57.192] run() for 'Future' ... [18:41:57.192] - state: 'created' [18:41:57.192] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.208] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.208] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.208] - Field: 'node' [18:41:57.208] - Field: 'label' [18:41:57.209] - Field: 'local' [18:41:57.209] - Field: 'owner' [18:41:57.209] - Field: 'envir' [18:41:57.209] - Field: 'workers' [18:41:57.209] - Field: 'packages' [18:41:57.209] - Field: 'gc' [18:41:57.210] - Field: 'conditions' [18:41:57.210] - Field: 'persistent' [18:41:57.210] - Field: 'expr' [18:41:57.210] - Field: 'uuid' [18:41:57.210] - Field: 'seed' [18:41:57.210] - Field: 'version' [18:41:57.211] - Field: 'result' [18:41:57.211] - Field: 'asynchronous' [18:41:57.211] - Field: 'calls' [18:41:57.211] - Field: 'globals' [18:41:57.211] - Field: 'stdout' [18:41:57.211] - Field: 'earlySignal' [18:41:57.212] - Field: 'lazy' [18:41:57.212] - Field: 'state' [18:41:57.212] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.212] - Launch lazy future ... [18:41:57.213] Packages needed by the future expression (n = 0): [18:41:57.213] Packages needed by future strategies (n = 0): [18:41:57.213] { [18:41:57.213] { [18:41:57.213] { [18:41:57.213] ...future.startTime <- base::Sys.time() [18:41:57.213] { [18:41:57.213] { [18:41:57.213] { [18:41:57.213] { [18:41:57.213] base::local({ [18:41:57.213] has_future <- base::requireNamespace("future", [18:41:57.213] quietly = TRUE) [18:41:57.213] if (has_future) { [18:41:57.213] ns <- base::getNamespace("future") [18:41:57.213] version <- ns[[".package"]][["version"]] [18:41:57.213] if (is.null(version)) [18:41:57.213] version <- utils::packageVersion("future") [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] version <- NULL [18:41:57.213] } [18:41:57.213] if (!has_future || version < "1.8.0") { [18:41:57.213] info <- base::c(r_version = base::gsub("R version ", [18:41:57.213] "", base::R.version$version.string), [18:41:57.213] platform = base::sprintf("%s (%s-bit)", [18:41:57.213] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.213] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.213] "release", "version")], collapse = " "), [18:41:57.213] hostname = base::Sys.info()[["nodename"]]) [18:41:57.213] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.213] info) [18:41:57.213] info <- base::paste(info, collapse = "; ") [18:41:57.213] if (!has_future) { [18:41:57.213] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.213] info) [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.213] info, version) [18:41:57.213] } [18:41:57.213] base::stop(msg) [18:41:57.213] } [18:41:57.213] }) [18:41:57.213] } [18:41:57.213] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.213] base::options(mc.cores = 1L) [18:41:57.213] } [18:41:57.213] ...future.strategy.old <- future::plan("list") [18:41:57.213] options(future.plan = NULL) [18:41:57.213] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.213] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.213] } [18:41:57.213] ...future.workdir <- getwd() [18:41:57.213] } [18:41:57.213] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.213] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.213] } [18:41:57.213] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.213] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.213] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.213] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.213] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.213] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.213] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.213] base::names(...future.oldOptions)) [18:41:57.213] } [18:41:57.213] if (FALSE) { [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] if (TRUE) { [18:41:57.213] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.213] open = "w") [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.213] windows = "NUL", "/dev/null"), open = "w") [18:41:57.213] } [18:41:57.213] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.213] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.213] base::sink(type = "output", split = FALSE) [18:41:57.213] base::close(...future.stdout) [18:41:57.213] }, add = TRUE) [18:41:57.213] } [18:41:57.213] ...future.frame <- base::sys.nframe() [18:41:57.213] ...future.conditions <- base::list() [18:41:57.213] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.213] if (FALSE) { [18:41:57.213] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.213] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.213] } [18:41:57.213] ...future.result <- base::tryCatch({ [18:41:57.213] base::withCallingHandlers({ [18:41:57.213] ...future.value <- base::withVisible(base::local({ [18:41:57.213] ...future.makeSendCondition <- base::local({ [18:41:57.213] sendCondition <- NULL [18:41:57.213] function(frame = 1L) { [18:41:57.213] if (is.function(sendCondition)) [18:41:57.213] return(sendCondition) [18:41:57.213] ns <- getNamespace("parallel") [18:41:57.213] if (exists("sendData", mode = "function", [18:41:57.213] envir = ns)) { [18:41:57.213] parallel_sendData <- get("sendData", mode = "function", [18:41:57.213] envir = ns) [18:41:57.213] envir <- sys.frame(frame) [18:41:57.213] master <- NULL [18:41:57.213] while (!identical(envir, .GlobalEnv) && [18:41:57.213] !identical(envir, emptyenv())) { [18:41:57.213] if (exists("master", mode = "list", envir = envir, [18:41:57.213] inherits = FALSE)) { [18:41:57.213] master <- get("master", mode = "list", [18:41:57.213] envir = envir, inherits = FALSE) [18:41:57.213] if (inherits(master, c("SOCKnode", [18:41:57.213] "SOCK0node"))) { [18:41:57.213] sendCondition <<- function(cond) { [18:41:57.213] data <- list(type = "VALUE", value = cond, [18:41:57.213] success = TRUE) [18:41:57.213] parallel_sendData(master, data) [18:41:57.213] } [18:41:57.213] return(sendCondition) [18:41:57.213] } [18:41:57.213] } [18:41:57.213] frame <- frame + 1L [18:41:57.213] envir <- sys.frame(frame) [18:41:57.213] } [18:41:57.213] } [18:41:57.213] sendCondition <<- function(cond) NULL [18:41:57.213] } [18:41:57.213] }) [18:41:57.213] withCallingHandlers({ [18:41:57.213] { [18:41:57.213] do.call(function(...) { [18:41:57.213] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.213] if (!identical(...future.globals.maxSize.org, [18:41:57.213] ...future.globals.maxSize)) { [18:41:57.213] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.213] on.exit(options(oopts), add = TRUE) [18:41:57.213] } [18:41:57.213] { [18:41:57.213] lapply(seq_along(...future.elements_ii), [18:41:57.213] FUN = function(jj) { [18:41:57.213] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.213] ...future.FUN(...future.X_jj, ...) [18:41:57.213] }) [18:41:57.213] } [18:41:57.213] }, args = future.call.arguments) [18:41:57.213] } [18:41:57.213] }, immediateCondition = function(cond) { [18:41:57.213] sendCondition <- ...future.makeSendCondition() [18:41:57.213] sendCondition(cond) [18:41:57.213] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.213] { [18:41:57.213] inherits <- base::inherits [18:41:57.213] invokeRestart <- base::invokeRestart [18:41:57.213] is.null <- base::is.null [18:41:57.213] muffled <- FALSE [18:41:57.213] if (inherits(cond, "message")) { [18:41:57.213] muffled <- grepl(pattern, "muffleMessage") [18:41:57.213] if (muffled) [18:41:57.213] invokeRestart("muffleMessage") [18:41:57.213] } [18:41:57.213] else if (inherits(cond, "warning")) { [18:41:57.213] muffled <- grepl(pattern, "muffleWarning") [18:41:57.213] if (muffled) [18:41:57.213] invokeRestart("muffleWarning") [18:41:57.213] } [18:41:57.213] else if (inherits(cond, "condition")) { [18:41:57.213] if (!is.null(pattern)) { [18:41:57.213] computeRestarts <- base::computeRestarts [18:41:57.213] grepl <- base::grepl [18:41:57.213] restarts <- computeRestarts(cond) [18:41:57.213] for (restart in restarts) { [18:41:57.213] name <- restart$name [18:41:57.213] if (is.null(name)) [18:41:57.213] next [18:41:57.213] if (!grepl(pattern, name)) [18:41:57.213] next [18:41:57.213] invokeRestart(restart) [18:41:57.213] muffled <- TRUE [18:41:57.213] break [18:41:57.213] } [18:41:57.213] } [18:41:57.213] } [18:41:57.213] invisible(muffled) [18:41:57.213] } [18:41:57.213] muffleCondition(cond) [18:41:57.213] }) [18:41:57.213] })) [18:41:57.213] future::FutureResult(value = ...future.value$value, [18:41:57.213] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.213] ...future.rng), globalenv = if (FALSE) [18:41:57.213] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.213] ...future.globalenv.names)) [18:41:57.213] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.213] }, condition = base::local({ [18:41:57.213] c <- base::c [18:41:57.213] inherits <- base::inherits [18:41:57.213] invokeRestart <- base::invokeRestart [18:41:57.213] length <- base::length [18:41:57.213] list <- base::list [18:41:57.213] seq.int <- base::seq.int [18:41:57.213] signalCondition <- base::signalCondition [18:41:57.213] sys.calls <- base::sys.calls [18:41:57.213] `[[` <- base::`[[` [18:41:57.213] `+` <- base::`+` [18:41:57.213] `<<-` <- base::`<<-` [18:41:57.213] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.213] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.213] 3L)] [18:41:57.213] } [18:41:57.213] function(cond) { [18:41:57.213] is_error <- inherits(cond, "error") [18:41:57.213] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.213] NULL) [18:41:57.213] if (is_error) { [18:41:57.213] sessionInformation <- function() { [18:41:57.213] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.213] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.213] search = base::search(), system = base::Sys.info()) [18:41:57.213] } [18:41:57.213] ...future.conditions[[length(...future.conditions) + [18:41:57.213] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.213] cond$call), session = sessionInformation(), [18:41:57.213] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.213] signalCondition(cond) [18:41:57.213] } [18:41:57.213] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.213] "immediateCondition"))) { [18:41:57.213] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.213] ...future.conditions[[length(...future.conditions) + [18:41:57.213] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.213] if (TRUE && !signal) { [18:41:57.213] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.213] { [18:41:57.213] inherits <- base::inherits [18:41:57.213] invokeRestart <- base::invokeRestart [18:41:57.213] is.null <- base::is.null [18:41:57.213] muffled <- FALSE [18:41:57.213] if (inherits(cond, "message")) { [18:41:57.213] muffled <- grepl(pattern, "muffleMessage") [18:41:57.213] if (muffled) [18:41:57.213] invokeRestart("muffleMessage") [18:41:57.213] } [18:41:57.213] else if (inherits(cond, "warning")) { [18:41:57.213] muffled <- grepl(pattern, "muffleWarning") [18:41:57.213] if (muffled) [18:41:57.213] invokeRestart("muffleWarning") [18:41:57.213] } [18:41:57.213] else if (inherits(cond, "condition")) { [18:41:57.213] if (!is.null(pattern)) { [18:41:57.213] computeRestarts <- base::computeRestarts [18:41:57.213] grepl <- base::grepl [18:41:57.213] restarts <- computeRestarts(cond) [18:41:57.213] for (restart in restarts) { [18:41:57.213] name <- restart$name [18:41:57.213] if (is.null(name)) [18:41:57.213] next [18:41:57.213] if (!grepl(pattern, name)) [18:41:57.213] next [18:41:57.213] invokeRestart(restart) [18:41:57.213] muffled <- TRUE [18:41:57.213] break [18:41:57.213] } [18:41:57.213] } [18:41:57.213] } [18:41:57.213] invisible(muffled) [18:41:57.213] } [18:41:57.213] muffleCondition(cond, pattern = "^muffle") [18:41:57.213] } [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] if (TRUE) { [18:41:57.213] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.213] { [18:41:57.213] inherits <- base::inherits [18:41:57.213] invokeRestart <- base::invokeRestart [18:41:57.213] is.null <- base::is.null [18:41:57.213] muffled <- FALSE [18:41:57.213] if (inherits(cond, "message")) { [18:41:57.213] muffled <- grepl(pattern, "muffleMessage") [18:41:57.213] if (muffled) [18:41:57.213] invokeRestart("muffleMessage") [18:41:57.213] } [18:41:57.213] else if (inherits(cond, "warning")) { [18:41:57.213] muffled <- grepl(pattern, "muffleWarning") [18:41:57.213] if (muffled) [18:41:57.213] invokeRestart("muffleWarning") [18:41:57.213] } [18:41:57.213] else if (inherits(cond, "condition")) { [18:41:57.213] if (!is.null(pattern)) { [18:41:57.213] computeRestarts <- base::computeRestarts [18:41:57.213] grepl <- base::grepl [18:41:57.213] restarts <- computeRestarts(cond) [18:41:57.213] for (restart in restarts) { [18:41:57.213] name <- restart$name [18:41:57.213] if (is.null(name)) [18:41:57.213] next [18:41:57.213] if (!grepl(pattern, name)) [18:41:57.213] next [18:41:57.213] invokeRestart(restart) [18:41:57.213] muffled <- TRUE [18:41:57.213] break [18:41:57.213] } [18:41:57.213] } [18:41:57.213] } [18:41:57.213] invisible(muffled) [18:41:57.213] } [18:41:57.213] muffleCondition(cond, pattern = "^muffle") [18:41:57.213] } [18:41:57.213] } [18:41:57.213] } [18:41:57.213] })) [18:41:57.213] }, error = function(ex) { [18:41:57.213] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.213] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.213] ...future.rng), started = ...future.startTime, [18:41:57.213] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.213] version = "1.8"), class = "FutureResult") [18:41:57.213] }, finally = { [18:41:57.213] if (!identical(...future.workdir, getwd())) [18:41:57.213] setwd(...future.workdir) [18:41:57.213] { [18:41:57.213] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.213] ...future.oldOptions$nwarnings <- NULL [18:41:57.213] } [18:41:57.213] base::options(...future.oldOptions) [18:41:57.213] if (.Platform$OS.type == "windows") { [18:41:57.213] old_names <- names(...future.oldEnvVars) [18:41:57.213] envs <- base::Sys.getenv() [18:41:57.213] names <- names(envs) [18:41:57.213] common <- intersect(names, old_names) [18:41:57.213] added <- setdiff(names, old_names) [18:41:57.213] removed <- setdiff(old_names, names) [18:41:57.213] changed <- common[...future.oldEnvVars[common] != [18:41:57.213] envs[common]] [18:41:57.213] NAMES <- toupper(changed) [18:41:57.213] args <- list() [18:41:57.213] for (kk in seq_along(NAMES)) { [18:41:57.213] name <- changed[[kk]] [18:41:57.213] NAME <- NAMES[[kk]] [18:41:57.213] if (name != NAME && is.element(NAME, old_names)) [18:41:57.213] next [18:41:57.213] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.213] } [18:41:57.213] NAMES <- toupper(added) [18:41:57.213] for (kk in seq_along(NAMES)) { [18:41:57.213] name <- added[[kk]] [18:41:57.213] NAME <- NAMES[[kk]] [18:41:57.213] if (name != NAME && is.element(NAME, old_names)) [18:41:57.213] next [18:41:57.213] args[[name]] <- "" [18:41:57.213] } [18:41:57.213] NAMES <- toupper(removed) [18:41:57.213] for (kk in seq_along(NAMES)) { [18:41:57.213] name <- removed[[kk]] [18:41:57.213] NAME <- NAMES[[kk]] [18:41:57.213] if (name != NAME && is.element(NAME, old_names)) [18:41:57.213] next [18:41:57.213] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.213] } [18:41:57.213] if (length(args) > 0) [18:41:57.213] base::do.call(base::Sys.setenv, args = args) [18:41:57.213] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.213] } [18:41:57.213] { [18:41:57.213] if (base::length(...future.futureOptionsAdded) > [18:41:57.213] 0L) { [18:41:57.213] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.213] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.213] base::options(opts) [18:41:57.213] } [18:41:57.213] { [18:41:57.213] { [18:41:57.213] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.213] NULL [18:41:57.213] } [18:41:57.213] options(future.plan = NULL) [18:41:57.213] if (is.na(NA_character_)) [18:41:57.213] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.213] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.213] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.213] .init = FALSE) [18:41:57.213] } [18:41:57.213] } [18:41:57.213] } [18:41:57.213] }) [18:41:57.213] if (TRUE) { [18:41:57.213] base::sink(type = "output", split = FALSE) [18:41:57.213] if (TRUE) { [18:41:57.213] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.213] } [18:41:57.213] else { [18:41:57.213] ...future.result["stdout"] <- base::list(NULL) [18:41:57.213] } [18:41:57.213] base::close(...future.stdout) [18:41:57.213] ...future.stdout <- NULL [18:41:57.213] } [18:41:57.213] ...future.result$conditions <- ...future.conditions [18:41:57.213] ...future.result$finished <- base::Sys.time() [18:41:57.213] ...future.result [18:41:57.213] } [18:41:57.218] Exporting 5 global objects (900 bytes) to cluster node #1 ... [18:41:57.219] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:57.219] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:57.219] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.220] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.220] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.220] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.220] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.221] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.221] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.221] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.222] Exporting 5 global objects (900 bytes) to cluster node #1 ... DONE [18:41:57.222] MultisessionFuture started [18:41:57.222] - Launch lazy future ... done [18:41:57.223] run() for 'MultisessionFuture' ... done [18:41:57.223] Created future: [18:41:57.237] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.237] - Validating connection of MultisessionFuture [18:41:57.237] - received message: FutureResult [18:41:57.237] - Received FutureResult [18:41:57.238] - Erased future from FutureRegistry [18:41:57.238] result() for ClusterFuture ... [18:41:57.238] - result already collected: FutureResult [18:41:57.238] result() for ClusterFuture ... done [18:41:57.238] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.223] MultisessionFuture: [18:41:57.223] Label: 'future_sapply-2' [18:41:57.223] Expression: [18:41:57.223] { [18:41:57.223] do.call(function(...) { [18:41:57.223] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.223] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.223] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.223] on.exit(options(oopts), add = TRUE) [18:41:57.223] } [18:41:57.223] { [18:41:57.223] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.223] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.223] ...future.FUN(...future.X_jj, ...) [18:41:57.223] }) [18:41:57.223] } [18:41:57.223] }, args = future.call.arguments) [18:41:57.223] } [18:41:57.223] Lazy evaluation: FALSE [18:41:57.223] Asynchronous evaluation: TRUE [18:41:57.223] Local evaluation: TRUE [18:41:57.223] Environment: R_GlobalEnv [18:41:57.223] Capture standard output: TRUE [18:41:57.223] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.223] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.223] Packages: [18:41:57.223] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.223] Resolved: TRUE [18:41:57.223] Value: [18:41:57.223] Conditions captured: [18:41:57.223] Early signaling: FALSE [18:41:57.223] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.223] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.239] Chunk #2 of 2 ... DONE [18:41:57.239] Launching 2 futures (chunks) ... DONE [18:41:57.239] Resolving 2 futures (chunks) ... [18:41:57.239] resolve() on list ... [18:41:57.239] recursive: 0 [18:41:57.240] length: 2 [18:41:57.240] [18:41:57.240] Future #1 [18:41:57.240] result() for ClusterFuture ... [18:41:57.240] - result already collected: FutureResult [18:41:57.240] result() for ClusterFuture ... done [18:41:57.241] result() for ClusterFuture ... [18:41:57.241] - result already collected: FutureResult [18:41:57.241] result() for ClusterFuture ... done [18:41:57.241] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:57.241] - nx: 2 [18:41:57.241] - relay: TRUE [18:41:57.241] - stdout: TRUE [18:41:57.242] - signal: TRUE [18:41:57.242] - resignal: FALSE [18:41:57.242] - force: TRUE [18:41:57.242] - relayed: [n=2] FALSE, FALSE [18:41:57.242] - queued futures: [n=2] FALSE, FALSE [18:41:57.242] - until=1 [18:41:57.242] - relaying element #1 [18:41:57.243] result() for ClusterFuture ... [18:41:57.243] - result already collected: FutureResult [18:41:57.243] result() for ClusterFuture ... done [18:41:57.243] result() for ClusterFuture ... [18:41:57.243] - result already collected: FutureResult [18:41:57.243] result() for ClusterFuture ... done [18:41:57.244] result() for ClusterFuture ... [18:41:57.244] - result already collected: FutureResult [18:41:57.244] result() for ClusterFuture ... done [18:41:57.244] result() for ClusterFuture ... [18:41:57.244] - result already collected: FutureResult [18:41:57.244] result() for ClusterFuture ... done [18:41:57.245] - relayed: [n=2] TRUE, FALSE [18:41:57.245] - queued futures: [n=2] TRUE, FALSE [18:41:57.245] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:57.245] length: 1 (resolved future 1) [18:41:57.245] Future #2 [18:41:57.245] result() for ClusterFuture ... [18:41:57.246] - result already collected: FutureResult [18:41:57.246] result() for ClusterFuture ... done [18:41:57.246] result() for ClusterFuture ... [18:41:57.246] - result already collected: FutureResult [18:41:57.246] result() for ClusterFuture ... done [18:41:57.246] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:57.246] - nx: 2 [18:41:57.247] - relay: TRUE [18:41:57.247] - stdout: TRUE [18:41:57.247] - signal: TRUE [18:41:57.247] - resignal: FALSE [18:41:57.247] - force: TRUE [18:41:57.247] - relayed: [n=2] TRUE, FALSE [18:41:57.247] - queued futures: [n=2] TRUE, FALSE [18:41:57.248] - until=2 [18:41:57.248] - relaying element #2 [18:41:57.248] result() for ClusterFuture ... [18:41:57.248] - result already collected: FutureResult [18:41:57.248] result() for ClusterFuture ... done [18:41:57.248] result() for ClusterFuture ... [18:41:57.249] - result already collected: FutureResult [18:41:57.249] result() for ClusterFuture ... done [18:41:57.249] result() for ClusterFuture ... [18:41:57.249] - result already collected: FutureResult [18:41:57.249] result() for ClusterFuture ... done [18:41:57.249] result() for ClusterFuture ... [18:41:57.250] - result already collected: FutureResult [18:41:57.250] result() for ClusterFuture ... done [18:41:57.250] - relayed: [n=2] TRUE, TRUE [18:41:57.250] - queued futures: [n=2] TRUE, TRUE [18:41:57.250] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:57.250] length: 0 (resolved future 2) [18:41:57.251] Relaying remaining futures [18:41:57.251] signalConditionsASAP(NULL, pos=0) ... [18:41:57.251] - nx: 2 [18:41:57.251] - relay: TRUE [18:41:57.251] - stdout: TRUE [18:41:57.251] - signal: TRUE [18:41:57.251] - resignal: FALSE [18:41:57.252] - force: TRUE [18:41:57.252] - relayed: [n=2] TRUE, TRUE [18:41:57.252] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:57.252] - relayed: [n=2] TRUE, TRUE [18:41:57.252] - queued futures: [n=2] TRUE, TRUE [18:41:57.252] signalConditionsASAP(NULL, pos=0) ... done [18:41:57.253] resolve() on list ... DONE [18:41:57.253] result() for ClusterFuture ... [18:41:57.253] - result already collected: FutureResult [18:41:57.253] result() for ClusterFuture ... done [18:41:57.253] result() for ClusterFuture ... [18:41:57.253] - result already collected: FutureResult [18:41:57.253] result() for ClusterFuture ... done [18:41:57.254] result() for ClusterFuture ... [18:41:57.254] - result already collected: FutureResult [18:41:57.254] result() for ClusterFuture ... done [18:41:57.254] result() for ClusterFuture ... [18:41:57.254] - result already collected: FutureResult [18:41:57.254] result() for ClusterFuture ... done [18:41:57.255] - Number of value chunks collected: 2 [18:41:57.255] Resolving 2 futures (chunks) ... DONE [18:41:57.255] Reducing values from 2 chunks ... [18:41:57.255] - Number of values collected after concatenation: 4 [18:41:57.255] - Number of values expected: 4 [18:41:57.255] Reducing values from 2 chunks ... DONE [18:41:57.256] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:57.258] future_lapply() ... [18:41:57.260] Number of chunks: 2 [18:41:57.261] getGlobalsAndPackagesXApply() ... [18:41:57.261] - future.globals: TRUE [18:41:57.261] getGlobalsAndPackages() ... [18:41:57.261] Searching for globals... [18:41:57.262] - globals found: [2] 'FUN', 'UseMethod' [18:41:57.263] Searching for globals ... DONE [18:41:57.263] Resolving globals: FALSE [18:41:57.263] The total size of the 1 globals is 278 bytes (278 bytes) [18:41:57.264] The total size of the 1 globals exported for future expression ('FUN()') is 278 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (278 bytes of class 'function') [18:41:57.264] - globals: [1] 'FUN' [18:41:57.264] [18:41:57.264] getGlobalsAndPackages() ... DONE [18:41:57.264] - globals found/used: [n=1] 'FUN' [18:41:57.265] - needed namespaces: [n=0] [18:41:57.265] Finding globals ... DONE [18:41:57.265] - use_args: TRUE [18:41:57.265] - Getting '...' globals ... [18:41:57.265] resolve() on list ... [18:41:57.266] recursive: 0 [18:41:57.266] length: 1 [18:41:57.266] elements: '...' [18:41:57.266] length: 0 (resolved future 1) [18:41:57.266] resolve() on list ... DONE [18:41:57.266] - '...' content: [n=0] [18:41:57.267] List of 1 [18:41:57.267] $ ...: list() [18:41:57.267] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.267] - attr(*, "where")=List of 1 [18:41:57.267] ..$ ...: [18:41:57.267] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.267] - attr(*, "resolved")= logi TRUE [18:41:57.267] - attr(*, "total_size")= num NA [18:41:57.269] - Getting '...' globals ... DONE [18:41:57.270] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:57.270] List of 2 [18:41:57.270] $ ...future.FUN:function (x, ...) [18:41:57.270] $ ... : list() [18:41:57.270] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.270] - attr(*, "where")=List of 2 [18:41:57.270] ..$ ...future.FUN: [18:41:57.270] ..$ ... : [18:41:57.270] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.270] - attr(*, "resolved")= logi FALSE [18:41:57.270] - attr(*, "total_size")= int 5150 [18:41:57.273] Packages to be attached in all futures: [n=0] [18:41:57.273] getGlobalsAndPackagesXApply() ... DONE [18:41:57.274] Number of futures (= number of chunks): 2 [18:41:57.274] Launching 2 futures (chunks) ... [18:41:57.274] Chunk #1 of 2 ... [18:41:57.274] - Finding globals in 'X' for chunk #1 ... [18:41:57.274] getGlobalsAndPackages() ... [18:41:57.275] Searching for globals... [18:41:57.275] [18:41:57.275] Searching for globals ... DONE [18:41:57.275] - globals: [0] [18:41:57.275] getGlobalsAndPackages() ... DONE [18:41:57.276] + additional globals found: [n=0] [18:41:57.276] + additional namespaces needed: [n=0] [18:41:57.276] - Finding globals in 'X' for chunk #1 ... DONE [18:41:57.276] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.276] - seeds: [18:41:57.276] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.277] getGlobalsAndPackages() ... [18:41:57.277] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.277] Resolving globals: FALSE [18:41:57.277] Tweak future expression to call with '...' arguments ... [18:41:57.277] { [18:41:57.277] do.call(function(...) { [18:41:57.277] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.277] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.277] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.277] on.exit(options(oopts), add = TRUE) [18:41:57.277] } [18:41:57.277] { [18:41:57.277] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.277] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.277] ...future.FUN(...future.X_jj, ...) [18:41:57.277] }) [18:41:57.277] } [18:41:57.277] }, args = future.call.arguments) [18:41:57.277] } [18:41:57.278] Tweak future expression to call with '...' arguments ... DONE [18:41:57.278] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.278] [18:41:57.279] getGlobalsAndPackages() ... DONE [18:41:57.279] run() for 'Future' ... [18:41:57.279] - state: 'created' [18:41:57.279] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.295] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.295] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.295] - Field: 'node' [18:41:57.296] - Field: 'label' [18:41:57.296] - Field: 'local' [18:41:57.296] - Field: 'owner' [18:41:57.296] - Field: 'envir' [18:41:57.296] - Field: 'workers' [18:41:57.296] - Field: 'packages' [18:41:57.297] - Field: 'gc' [18:41:57.297] - Field: 'conditions' [18:41:57.297] - Field: 'persistent' [18:41:57.297] - Field: 'expr' [18:41:57.297] - Field: 'uuid' [18:41:57.297] - Field: 'seed' [18:41:57.298] - Field: 'version' [18:41:57.298] - Field: 'result' [18:41:57.298] - Field: 'asynchronous' [18:41:57.298] - Field: 'calls' [18:41:57.298] - Field: 'globals' [18:41:57.298] - Field: 'stdout' [18:41:57.299] - Field: 'earlySignal' [18:41:57.299] - Field: 'lazy' [18:41:57.299] - Field: 'state' [18:41:57.299] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.299] - Launch lazy future ... [18:41:57.300] Packages needed by the future expression (n = 0): [18:41:57.300] Packages needed by future strategies (n = 0): [18:41:57.300] { [18:41:57.300] { [18:41:57.300] { [18:41:57.300] ...future.startTime <- base::Sys.time() [18:41:57.300] { [18:41:57.300] { [18:41:57.300] { [18:41:57.300] { [18:41:57.300] base::local({ [18:41:57.300] has_future <- base::requireNamespace("future", [18:41:57.300] quietly = TRUE) [18:41:57.300] if (has_future) { [18:41:57.300] ns <- base::getNamespace("future") [18:41:57.300] version <- ns[[".package"]][["version"]] [18:41:57.300] if (is.null(version)) [18:41:57.300] version <- utils::packageVersion("future") [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] version <- NULL [18:41:57.300] } [18:41:57.300] if (!has_future || version < "1.8.0") { [18:41:57.300] info <- base::c(r_version = base::gsub("R version ", [18:41:57.300] "", base::R.version$version.string), [18:41:57.300] platform = base::sprintf("%s (%s-bit)", [18:41:57.300] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.300] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.300] "release", "version")], collapse = " "), [18:41:57.300] hostname = base::Sys.info()[["nodename"]]) [18:41:57.300] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.300] info) [18:41:57.300] info <- base::paste(info, collapse = "; ") [18:41:57.300] if (!has_future) { [18:41:57.300] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.300] info) [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.300] info, version) [18:41:57.300] } [18:41:57.300] base::stop(msg) [18:41:57.300] } [18:41:57.300] }) [18:41:57.300] } [18:41:57.300] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.300] base::options(mc.cores = 1L) [18:41:57.300] } [18:41:57.300] ...future.strategy.old <- future::plan("list") [18:41:57.300] options(future.plan = NULL) [18:41:57.300] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.300] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.300] } [18:41:57.300] ...future.workdir <- getwd() [18:41:57.300] } [18:41:57.300] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.300] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.300] } [18:41:57.300] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.300] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.300] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.300] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.300] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.300] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.300] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.300] base::names(...future.oldOptions)) [18:41:57.300] } [18:41:57.300] if (FALSE) { [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] if (TRUE) { [18:41:57.300] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.300] open = "w") [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.300] windows = "NUL", "/dev/null"), open = "w") [18:41:57.300] } [18:41:57.300] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.300] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.300] base::sink(type = "output", split = FALSE) [18:41:57.300] base::close(...future.stdout) [18:41:57.300] }, add = TRUE) [18:41:57.300] } [18:41:57.300] ...future.frame <- base::sys.nframe() [18:41:57.300] ...future.conditions <- base::list() [18:41:57.300] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.300] if (FALSE) { [18:41:57.300] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.300] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.300] } [18:41:57.300] ...future.result <- base::tryCatch({ [18:41:57.300] base::withCallingHandlers({ [18:41:57.300] ...future.value <- base::withVisible(base::local({ [18:41:57.300] ...future.makeSendCondition <- base::local({ [18:41:57.300] sendCondition <- NULL [18:41:57.300] function(frame = 1L) { [18:41:57.300] if (is.function(sendCondition)) [18:41:57.300] return(sendCondition) [18:41:57.300] ns <- getNamespace("parallel") [18:41:57.300] if (exists("sendData", mode = "function", [18:41:57.300] envir = ns)) { [18:41:57.300] parallel_sendData <- get("sendData", mode = "function", [18:41:57.300] envir = ns) [18:41:57.300] envir <- sys.frame(frame) [18:41:57.300] master <- NULL [18:41:57.300] while (!identical(envir, .GlobalEnv) && [18:41:57.300] !identical(envir, emptyenv())) { [18:41:57.300] if (exists("master", mode = "list", envir = envir, [18:41:57.300] inherits = FALSE)) { [18:41:57.300] master <- get("master", mode = "list", [18:41:57.300] envir = envir, inherits = FALSE) [18:41:57.300] if (inherits(master, c("SOCKnode", [18:41:57.300] "SOCK0node"))) { [18:41:57.300] sendCondition <<- function(cond) { [18:41:57.300] data <- list(type = "VALUE", value = cond, [18:41:57.300] success = TRUE) [18:41:57.300] parallel_sendData(master, data) [18:41:57.300] } [18:41:57.300] return(sendCondition) [18:41:57.300] } [18:41:57.300] } [18:41:57.300] frame <- frame + 1L [18:41:57.300] envir <- sys.frame(frame) [18:41:57.300] } [18:41:57.300] } [18:41:57.300] sendCondition <<- function(cond) NULL [18:41:57.300] } [18:41:57.300] }) [18:41:57.300] withCallingHandlers({ [18:41:57.300] { [18:41:57.300] do.call(function(...) { [18:41:57.300] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.300] if (!identical(...future.globals.maxSize.org, [18:41:57.300] ...future.globals.maxSize)) { [18:41:57.300] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.300] on.exit(options(oopts), add = TRUE) [18:41:57.300] } [18:41:57.300] { [18:41:57.300] lapply(seq_along(...future.elements_ii), [18:41:57.300] FUN = function(jj) { [18:41:57.300] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.300] ...future.FUN(...future.X_jj, ...) [18:41:57.300] }) [18:41:57.300] } [18:41:57.300] }, args = future.call.arguments) [18:41:57.300] } [18:41:57.300] }, immediateCondition = function(cond) { [18:41:57.300] sendCondition <- ...future.makeSendCondition() [18:41:57.300] sendCondition(cond) [18:41:57.300] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.300] { [18:41:57.300] inherits <- base::inherits [18:41:57.300] invokeRestart <- base::invokeRestart [18:41:57.300] is.null <- base::is.null [18:41:57.300] muffled <- FALSE [18:41:57.300] if (inherits(cond, "message")) { [18:41:57.300] muffled <- grepl(pattern, "muffleMessage") [18:41:57.300] if (muffled) [18:41:57.300] invokeRestart("muffleMessage") [18:41:57.300] } [18:41:57.300] else if (inherits(cond, "warning")) { [18:41:57.300] muffled <- grepl(pattern, "muffleWarning") [18:41:57.300] if (muffled) [18:41:57.300] invokeRestart("muffleWarning") [18:41:57.300] } [18:41:57.300] else if (inherits(cond, "condition")) { [18:41:57.300] if (!is.null(pattern)) { [18:41:57.300] computeRestarts <- base::computeRestarts [18:41:57.300] grepl <- base::grepl [18:41:57.300] restarts <- computeRestarts(cond) [18:41:57.300] for (restart in restarts) { [18:41:57.300] name <- restart$name [18:41:57.300] if (is.null(name)) [18:41:57.300] next [18:41:57.300] if (!grepl(pattern, name)) [18:41:57.300] next [18:41:57.300] invokeRestart(restart) [18:41:57.300] muffled <- TRUE [18:41:57.300] break [18:41:57.300] } [18:41:57.300] } [18:41:57.300] } [18:41:57.300] invisible(muffled) [18:41:57.300] } [18:41:57.300] muffleCondition(cond) [18:41:57.300] }) [18:41:57.300] })) [18:41:57.300] future::FutureResult(value = ...future.value$value, [18:41:57.300] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.300] ...future.rng), globalenv = if (FALSE) [18:41:57.300] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.300] ...future.globalenv.names)) [18:41:57.300] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.300] }, condition = base::local({ [18:41:57.300] c <- base::c [18:41:57.300] inherits <- base::inherits [18:41:57.300] invokeRestart <- base::invokeRestart [18:41:57.300] length <- base::length [18:41:57.300] list <- base::list [18:41:57.300] seq.int <- base::seq.int [18:41:57.300] signalCondition <- base::signalCondition [18:41:57.300] sys.calls <- base::sys.calls [18:41:57.300] `[[` <- base::`[[` [18:41:57.300] `+` <- base::`+` [18:41:57.300] `<<-` <- base::`<<-` [18:41:57.300] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.300] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.300] 3L)] [18:41:57.300] } [18:41:57.300] function(cond) { [18:41:57.300] is_error <- inherits(cond, "error") [18:41:57.300] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.300] NULL) [18:41:57.300] if (is_error) { [18:41:57.300] sessionInformation <- function() { [18:41:57.300] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.300] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.300] search = base::search(), system = base::Sys.info()) [18:41:57.300] } [18:41:57.300] ...future.conditions[[length(...future.conditions) + [18:41:57.300] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.300] cond$call), session = sessionInformation(), [18:41:57.300] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.300] signalCondition(cond) [18:41:57.300] } [18:41:57.300] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.300] "immediateCondition"))) { [18:41:57.300] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.300] ...future.conditions[[length(...future.conditions) + [18:41:57.300] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.300] if (TRUE && !signal) { [18:41:57.300] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.300] { [18:41:57.300] inherits <- base::inherits [18:41:57.300] invokeRestart <- base::invokeRestart [18:41:57.300] is.null <- base::is.null [18:41:57.300] muffled <- FALSE [18:41:57.300] if (inherits(cond, "message")) { [18:41:57.300] muffled <- grepl(pattern, "muffleMessage") [18:41:57.300] if (muffled) [18:41:57.300] invokeRestart("muffleMessage") [18:41:57.300] } [18:41:57.300] else if (inherits(cond, "warning")) { [18:41:57.300] muffled <- grepl(pattern, "muffleWarning") [18:41:57.300] if (muffled) [18:41:57.300] invokeRestart("muffleWarning") [18:41:57.300] } [18:41:57.300] else if (inherits(cond, "condition")) { [18:41:57.300] if (!is.null(pattern)) { [18:41:57.300] computeRestarts <- base::computeRestarts [18:41:57.300] grepl <- base::grepl [18:41:57.300] restarts <- computeRestarts(cond) [18:41:57.300] for (restart in restarts) { [18:41:57.300] name <- restart$name [18:41:57.300] if (is.null(name)) [18:41:57.300] next [18:41:57.300] if (!grepl(pattern, name)) [18:41:57.300] next [18:41:57.300] invokeRestart(restart) [18:41:57.300] muffled <- TRUE [18:41:57.300] break [18:41:57.300] } [18:41:57.300] } [18:41:57.300] } [18:41:57.300] invisible(muffled) [18:41:57.300] } [18:41:57.300] muffleCondition(cond, pattern = "^muffle") [18:41:57.300] } [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] if (TRUE) { [18:41:57.300] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.300] { [18:41:57.300] inherits <- base::inherits [18:41:57.300] invokeRestart <- base::invokeRestart [18:41:57.300] is.null <- base::is.null [18:41:57.300] muffled <- FALSE [18:41:57.300] if (inherits(cond, "message")) { [18:41:57.300] muffled <- grepl(pattern, "muffleMessage") [18:41:57.300] if (muffled) [18:41:57.300] invokeRestart("muffleMessage") [18:41:57.300] } [18:41:57.300] else if (inherits(cond, "warning")) { [18:41:57.300] muffled <- grepl(pattern, "muffleWarning") [18:41:57.300] if (muffled) [18:41:57.300] invokeRestart("muffleWarning") [18:41:57.300] } [18:41:57.300] else if (inherits(cond, "condition")) { [18:41:57.300] if (!is.null(pattern)) { [18:41:57.300] computeRestarts <- base::computeRestarts [18:41:57.300] grepl <- base::grepl [18:41:57.300] restarts <- computeRestarts(cond) [18:41:57.300] for (restart in restarts) { [18:41:57.300] name <- restart$name [18:41:57.300] if (is.null(name)) [18:41:57.300] next [18:41:57.300] if (!grepl(pattern, name)) [18:41:57.300] next [18:41:57.300] invokeRestart(restart) [18:41:57.300] muffled <- TRUE [18:41:57.300] break [18:41:57.300] } [18:41:57.300] } [18:41:57.300] } [18:41:57.300] invisible(muffled) [18:41:57.300] } [18:41:57.300] muffleCondition(cond, pattern = "^muffle") [18:41:57.300] } [18:41:57.300] } [18:41:57.300] } [18:41:57.300] })) [18:41:57.300] }, error = function(ex) { [18:41:57.300] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.300] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.300] ...future.rng), started = ...future.startTime, [18:41:57.300] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.300] version = "1.8"), class = "FutureResult") [18:41:57.300] }, finally = { [18:41:57.300] if (!identical(...future.workdir, getwd())) [18:41:57.300] setwd(...future.workdir) [18:41:57.300] { [18:41:57.300] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.300] ...future.oldOptions$nwarnings <- NULL [18:41:57.300] } [18:41:57.300] base::options(...future.oldOptions) [18:41:57.300] if (.Platform$OS.type == "windows") { [18:41:57.300] old_names <- names(...future.oldEnvVars) [18:41:57.300] envs <- base::Sys.getenv() [18:41:57.300] names <- names(envs) [18:41:57.300] common <- intersect(names, old_names) [18:41:57.300] added <- setdiff(names, old_names) [18:41:57.300] removed <- setdiff(old_names, names) [18:41:57.300] changed <- common[...future.oldEnvVars[common] != [18:41:57.300] envs[common]] [18:41:57.300] NAMES <- toupper(changed) [18:41:57.300] args <- list() [18:41:57.300] for (kk in seq_along(NAMES)) { [18:41:57.300] name <- changed[[kk]] [18:41:57.300] NAME <- NAMES[[kk]] [18:41:57.300] if (name != NAME && is.element(NAME, old_names)) [18:41:57.300] next [18:41:57.300] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.300] } [18:41:57.300] NAMES <- toupper(added) [18:41:57.300] for (kk in seq_along(NAMES)) { [18:41:57.300] name <- added[[kk]] [18:41:57.300] NAME <- NAMES[[kk]] [18:41:57.300] if (name != NAME && is.element(NAME, old_names)) [18:41:57.300] next [18:41:57.300] args[[name]] <- "" [18:41:57.300] } [18:41:57.300] NAMES <- toupper(removed) [18:41:57.300] for (kk in seq_along(NAMES)) { [18:41:57.300] name <- removed[[kk]] [18:41:57.300] NAME <- NAMES[[kk]] [18:41:57.300] if (name != NAME && is.element(NAME, old_names)) [18:41:57.300] next [18:41:57.300] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.300] } [18:41:57.300] if (length(args) > 0) [18:41:57.300] base::do.call(base::Sys.setenv, args = args) [18:41:57.300] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.300] } [18:41:57.300] { [18:41:57.300] if (base::length(...future.futureOptionsAdded) > [18:41:57.300] 0L) { [18:41:57.300] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.300] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.300] base::options(opts) [18:41:57.300] } [18:41:57.300] { [18:41:57.300] { [18:41:57.300] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.300] NULL [18:41:57.300] } [18:41:57.300] options(future.plan = NULL) [18:41:57.300] if (is.na(NA_character_)) [18:41:57.300] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.300] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.300] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.300] .init = FALSE) [18:41:57.300] } [18:41:57.300] } [18:41:57.300] } [18:41:57.300] }) [18:41:57.300] if (TRUE) { [18:41:57.300] base::sink(type = "output", split = FALSE) [18:41:57.300] if (TRUE) { [18:41:57.300] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.300] } [18:41:57.300] else { [18:41:57.300] ...future.result["stdout"] <- base::list(NULL) [18:41:57.300] } [18:41:57.300] base::close(...future.stdout) [18:41:57.300] ...future.stdout <- NULL [18:41:57.300] } [18:41:57.300] ...future.result$conditions <- ...future.conditions [18:41:57.300] ...future.result$finished <- base::Sys.time() [18:41:57.300] ...future.result [18:41:57.300] } [18:41:57.306] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:57.306] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:57.306] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:57.307] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.307] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.307] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.308] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.308] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.308] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.308] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.309] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.309] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:57.310] MultisessionFuture started [18:41:57.310] - Launch lazy future ... done [18:41:57.310] run() for 'MultisessionFuture' ... done [18:41:57.310] Created future: [18:41:57.324] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.324] - Validating connection of MultisessionFuture [18:41:57.325] - received message: FutureResult [18:41:57.325] - Received FutureResult [18:41:57.325] - Erased future from FutureRegistry [18:41:57.325] result() for ClusterFuture ... [18:41:57.325] - result already collected: FutureResult [18:41:57.325] result() for ClusterFuture ... done [18:41:57.326] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.310] MultisessionFuture: [18:41:57.310] Label: 'future_sapply-1' [18:41:57.310] Expression: [18:41:57.310] { [18:41:57.310] do.call(function(...) { [18:41:57.310] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.310] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.310] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.310] on.exit(options(oopts), add = TRUE) [18:41:57.310] } [18:41:57.310] { [18:41:57.310] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.310] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.310] ...future.FUN(...future.X_jj, ...) [18:41:57.310] }) [18:41:57.310] } [18:41:57.310] }, args = future.call.arguments) [18:41:57.310] } [18:41:57.310] Lazy evaluation: FALSE [18:41:57.310] Asynchronous evaluation: TRUE [18:41:57.310] Local evaluation: TRUE [18:41:57.310] Environment: R_GlobalEnv [18:41:57.310] Capture standard output: TRUE [18:41:57.310] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.310] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.310] Packages: [18:41:57.310] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.310] Resolved: TRUE [18:41:57.310] Value: [18:41:57.310] Conditions captured: [18:41:57.310] Early signaling: FALSE [18:41:57.310] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.310] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.326] Chunk #1 of 2 ... DONE [18:41:57.326] Chunk #2 of 2 ... [18:41:57.326] - Finding globals in 'X' for chunk #2 ... [18:41:57.327] getGlobalsAndPackages() ... [18:41:57.327] Searching for globals... [18:41:57.327] [18:41:57.327] Searching for globals ... DONE [18:41:57.327] - globals: [0] [18:41:57.328] getGlobalsAndPackages() ... DONE [18:41:57.328] + additional globals found: [n=0] [18:41:57.328] + additional namespaces needed: [n=0] [18:41:57.328] - Finding globals in 'X' for chunk #2 ... DONE [18:41:57.328] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.328] - seeds: [18:41:57.329] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.329] getGlobalsAndPackages() ... [18:41:57.329] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.329] Resolving globals: FALSE [18:41:57.329] Tweak future expression to call with '...' arguments ... [18:41:57.329] { [18:41:57.329] do.call(function(...) { [18:41:57.329] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.329] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.329] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.329] on.exit(options(oopts), add = TRUE) [18:41:57.329] } [18:41:57.329] { [18:41:57.329] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.329] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.329] ...future.FUN(...future.X_jj, ...) [18:41:57.329] }) [18:41:57.329] } [18:41:57.329] }, args = future.call.arguments) [18:41:57.329] } [18:41:57.330] Tweak future expression to call with '...' arguments ... DONE [18:41:57.330] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.331] [18:41:57.331] getGlobalsAndPackages() ... DONE [18:41:57.331] run() for 'Future' ... [18:41:57.331] - state: 'created' [18:41:57.331] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.356] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.356] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.356] - Field: 'node' [18:41:57.356] - Field: 'label' [18:41:57.357] - Field: 'local' [18:41:57.357] - Field: 'owner' [18:41:57.357] - Field: 'envir' [18:41:57.357] - Field: 'workers' [18:41:57.357] - Field: 'packages' [18:41:57.358] - Field: 'gc' [18:41:57.358] - Field: 'conditions' [18:41:57.358] - Field: 'persistent' [18:41:57.358] - Field: 'expr' [18:41:57.358] - Field: 'uuid' [18:41:57.358] - Field: 'seed' [18:41:57.359] - Field: 'version' [18:41:57.359] - Field: 'result' [18:41:57.359] - Field: 'asynchronous' [18:41:57.359] - Field: 'calls' [18:41:57.359] - Field: 'globals' [18:41:57.360] - Field: 'stdout' [18:41:57.360] - Field: 'earlySignal' [18:41:57.360] - Field: 'lazy' [18:41:57.360] - Field: 'state' [18:41:57.360] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.361] - Launch lazy future ... [18:41:57.361] Packages needed by the future expression (n = 0): [18:41:57.361] Packages needed by future strategies (n = 0): [18:41:57.362] { [18:41:57.362] { [18:41:57.362] { [18:41:57.362] ...future.startTime <- base::Sys.time() [18:41:57.362] { [18:41:57.362] { [18:41:57.362] { [18:41:57.362] { [18:41:57.362] base::local({ [18:41:57.362] has_future <- base::requireNamespace("future", [18:41:57.362] quietly = TRUE) [18:41:57.362] if (has_future) { [18:41:57.362] ns <- base::getNamespace("future") [18:41:57.362] version <- ns[[".package"]][["version"]] [18:41:57.362] if (is.null(version)) [18:41:57.362] version <- utils::packageVersion("future") [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] version <- NULL [18:41:57.362] } [18:41:57.362] if (!has_future || version < "1.8.0") { [18:41:57.362] info <- base::c(r_version = base::gsub("R version ", [18:41:57.362] "", base::R.version$version.string), [18:41:57.362] platform = base::sprintf("%s (%s-bit)", [18:41:57.362] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.362] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.362] "release", "version")], collapse = " "), [18:41:57.362] hostname = base::Sys.info()[["nodename"]]) [18:41:57.362] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.362] info) [18:41:57.362] info <- base::paste(info, collapse = "; ") [18:41:57.362] if (!has_future) { [18:41:57.362] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.362] info) [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.362] info, version) [18:41:57.362] } [18:41:57.362] base::stop(msg) [18:41:57.362] } [18:41:57.362] }) [18:41:57.362] } [18:41:57.362] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.362] base::options(mc.cores = 1L) [18:41:57.362] } [18:41:57.362] ...future.strategy.old <- future::plan("list") [18:41:57.362] options(future.plan = NULL) [18:41:57.362] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.362] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.362] } [18:41:57.362] ...future.workdir <- getwd() [18:41:57.362] } [18:41:57.362] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.362] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.362] } [18:41:57.362] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.362] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.362] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.362] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.362] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.362] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.362] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.362] base::names(...future.oldOptions)) [18:41:57.362] } [18:41:57.362] if (FALSE) { [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] if (TRUE) { [18:41:57.362] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.362] open = "w") [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.362] windows = "NUL", "/dev/null"), open = "w") [18:41:57.362] } [18:41:57.362] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.362] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.362] base::sink(type = "output", split = FALSE) [18:41:57.362] base::close(...future.stdout) [18:41:57.362] }, add = TRUE) [18:41:57.362] } [18:41:57.362] ...future.frame <- base::sys.nframe() [18:41:57.362] ...future.conditions <- base::list() [18:41:57.362] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.362] if (FALSE) { [18:41:57.362] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.362] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.362] } [18:41:57.362] ...future.result <- base::tryCatch({ [18:41:57.362] base::withCallingHandlers({ [18:41:57.362] ...future.value <- base::withVisible(base::local({ [18:41:57.362] ...future.makeSendCondition <- base::local({ [18:41:57.362] sendCondition <- NULL [18:41:57.362] function(frame = 1L) { [18:41:57.362] if (is.function(sendCondition)) [18:41:57.362] return(sendCondition) [18:41:57.362] ns <- getNamespace("parallel") [18:41:57.362] if (exists("sendData", mode = "function", [18:41:57.362] envir = ns)) { [18:41:57.362] parallel_sendData <- get("sendData", mode = "function", [18:41:57.362] envir = ns) [18:41:57.362] envir <- sys.frame(frame) [18:41:57.362] master <- NULL [18:41:57.362] while (!identical(envir, .GlobalEnv) && [18:41:57.362] !identical(envir, emptyenv())) { [18:41:57.362] if (exists("master", mode = "list", envir = envir, [18:41:57.362] inherits = FALSE)) { [18:41:57.362] master <- get("master", mode = "list", [18:41:57.362] envir = envir, inherits = FALSE) [18:41:57.362] if (inherits(master, c("SOCKnode", [18:41:57.362] "SOCK0node"))) { [18:41:57.362] sendCondition <<- function(cond) { [18:41:57.362] data <- list(type = "VALUE", value = cond, [18:41:57.362] success = TRUE) [18:41:57.362] parallel_sendData(master, data) [18:41:57.362] } [18:41:57.362] return(sendCondition) [18:41:57.362] } [18:41:57.362] } [18:41:57.362] frame <- frame + 1L [18:41:57.362] envir <- sys.frame(frame) [18:41:57.362] } [18:41:57.362] } [18:41:57.362] sendCondition <<- function(cond) NULL [18:41:57.362] } [18:41:57.362] }) [18:41:57.362] withCallingHandlers({ [18:41:57.362] { [18:41:57.362] do.call(function(...) { [18:41:57.362] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.362] if (!identical(...future.globals.maxSize.org, [18:41:57.362] ...future.globals.maxSize)) { [18:41:57.362] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.362] on.exit(options(oopts), add = TRUE) [18:41:57.362] } [18:41:57.362] { [18:41:57.362] lapply(seq_along(...future.elements_ii), [18:41:57.362] FUN = function(jj) { [18:41:57.362] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.362] ...future.FUN(...future.X_jj, ...) [18:41:57.362] }) [18:41:57.362] } [18:41:57.362] }, args = future.call.arguments) [18:41:57.362] } [18:41:57.362] }, immediateCondition = function(cond) { [18:41:57.362] sendCondition <- ...future.makeSendCondition() [18:41:57.362] sendCondition(cond) [18:41:57.362] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.362] { [18:41:57.362] inherits <- base::inherits [18:41:57.362] invokeRestart <- base::invokeRestart [18:41:57.362] is.null <- base::is.null [18:41:57.362] muffled <- FALSE [18:41:57.362] if (inherits(cond, "message")) { [18:41:57.362] muffled <- grepl(pattern, "muffleMessage") [18:41:57.362] if (muffled) [18:41:57.362] invokeRestart("muffleMessage") [18:41:57.362] } [18:41:57.362] else if (inherits(cond, "warning")) { [18:41:57.362] muffled <- grepl(pattern, "muffleWarning") [18:41:57.362] if (muffled) [18:41:57.362] invokeRestart("muffleWarning") [18:41:57.362] } [18:41:57.362] else if (inherits(cond, "condition")) { [18:41:57.362] if (!is.null(pattern)) { [18:41:57.362] computeRestarts <- base::computeRestarts [18:41:57.362] grepl <- base::grepl [18:41:57.362] restarts <- computeRestarts(cond) [18:41:57.362] for (restart in restarts) { [18:41:57.362] name <- restart$name [18:41:57.362] if (is.null(name)) [18:41:57.362] next [18:41:57.362] if (!grepl(pattern, name)) [18:41:57.362] next [18:41:57.362] invokeRestart(restart) [18:41:57.362] muffled <- TRUE [18:41:57.362] break [18:41:57.362] } [18:41:57.362] } [18:41:57.362] } [18:41:57.362] invisible(muffled) [18:41:57.362] } [18:41:57.362] muffleCondition(cond) [18:41:57.362] }) [18:41:57.362] })) [18:41:57.362] future::FutureResult(value = ...future.value$value, [18:41:57.362] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.362] ...future.rng), globalenv = if (FALSE) [18:41:57.362] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.362] ...future.globalenv.names)) [18:41:57.362] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.362] }, condition = base::local({ [18:41:57.362] c <- base::c [18:41:57.362] inherits <- base::inherits [18:41:57.362] invokeRestart <- base::invokeRestart [18:41:57.362] length <- base::length [18:41:57.362] list <- base::list [18:41:57.362] seq.int <- base::seq.int [18:41:57.362] signalCondition <- base::signalCondition [18:41:57.362] sys.calls <- base::sys.calls [18:41:57.362] `[[` <- base::`[[` [18:41:57.362] `+` <- base::`+` [18:41:57.362] `<<-` <- base::`<<-` [18:41:57.362] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.362] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.362] 3L)] [18:41:57.362] } [18:41:57.362] function(cond) { [18:41:57.362] is_error <- inherits(cond, "error") [18:41:57.362] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.362] NULL) [18:41:57.362] if (is_error) { [18:41:57.362] sessionInformation <- function() { [18:41:57.362] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.362] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.362] search = base::search(), system = base::Sys.info()) [18:41:57.362] } [18:41:57.362] ...future.conditions[[length(...future.conditions) + [18:41:57.362] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.362] cond$call), session = sessionInformation(), [18:41:57.362] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.362] signalCondition(cond) [18:41:57.362] } [18:41:57.362] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.362] "immediateCondition"))) { [18:41:57.362] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.362] ...future.conditions[[length(...future.conditions) + [18:41:57.362] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.362] if (TRUE && !signal) { [18:41:57.362] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.362] { [18:41:57.362] inherits <- base::inherits [18:41:57.362] invokeRestart <- base::invokeRestart [18:41:57.362] is.null <- base::is.null [18:41:57.362] muffled <- FALSE [18:41:57.362] if (inherits(cond, "message")) { [18:41:57.362] muffled <- grepl(pattern, "muffleMessage") [18:41:57.362] if (muffled) [18:41:57.362] invokeRestart("muffleMessage") [18:41:57.362] } [18:41:57.362] else if (inherits(cond, "warning")) { [18:41:57.362] muffled <- grepl(pattern, "muffleWarning") [18:41:57.362] if (muffled) [18:41:57.362] invokeRestart("muffleWarning") [18:41:57.362] } [18:41:57.362] else if (inherits(cond, "condition")) { [18:41:57.362] if (!is.null(pattern)) { [18:41:57.362] computeRestarts <- base::computeRestarts [18:41:57.362] grepl <- base::grepl [18:41:57.362] restarts <- computeRestarts(cond) [18:41:57.362] for (restart in restarts) { [18:41:57.362] name <- restart$name [18:41:57.362] if (is.null(name)) [18:41:57.362] next [18:41:57.362] if (!grepl(pattern, name)) [18:41:57.362] next [18:41:57.362] invokeRestart(restart) [18:41:57.362] muffled <- TRUE [18:41:57.362] break [18:41:57.362] } [18:41:57.362] } [18:41:57.362] } [18:41:57.362] invisible(muffled) [18:41:57.362] } [18:41:57.362] muffleCondition(cond, pattern = "^muffle") [18:41:57.362] } [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] if (TRUE) { [18:41:57.362] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.362] { [18:41:57.362] inherits <- base::inherits [18:41:57.362] invokeRestart <- base::invokeRestart [18:41:57.362] is.null <- base::is.null [18:41:57.362] muffled <- FALSE [18:41:57.362] if (inherits(cond, "message")) { [18:41:57.362] muffled <- grepl(pattern, "muffleMessage") [18:41:57.362] if (muffled) [18:41:57.362] invokeRestart("muffleMessage") [18:41:57.362] } [18:41:57.362] else if (inherits(cond, "warning")) { [18:41:57.362] muffled <- grepl(pattern, "muffleWarning") [18:41:57.362] if (muffled) [18:41:57.362] invokeRestart("muffleWarning") [18:41:57.362] } [18:41:57.362] else if (inherits(cond, "condition")) { [18:41:57.362] if (!is.null(pattern)) { [18:41:57.362] computeRestarts <- base::computeRestarts [18:41:57.362] grepl <- base::grepl [18:41:57.362] restarts <- computeRestarts(cond) [18:41:57.362] for (restart in restarts) { [18:41:57.362] name <- restart$name [18:41:57.362] if (is.null(name)) [18:41:57.362] next [18:41:57.362] if (!grepl(pattern, name)) [18:41:57.362] next [18:41:57.362] invokeRestart(restart) [18:41:57.362] muffled <- TRUE [18:41:57.362] break [18:41:57.362] } [18:41:57.362] } [18:41:57.362] } [18:41:57.362] invisible(muffled) [18:41:57.362] } [18:41:57.362] muffleCondition(cond, pattern = "^muffle") [18:41:57.362] } [18:41:57.362] } [18:41:57.362] } [18:41:57.362] })) [18:41:57.362] }, error = function(ex) { [18:41:57.362] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.362] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.362] ...future.rng), started = ...future.startTime, [18:41:57.362] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.362] version = "1.8"), class = "FutureResult") [18:41:57.362] }, finally = { [18:41:57.362] if (!identical(...future.workdir, getwd())) [18:41:57.362] setwd(...future.workdir) [18:41:57.362] { [18:41:57.362] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.362] ...future.oldOptions$nwarnings <- NULL [18:41:57.362] } [18:41:57.362] base::options(...future.oldOptions) [18:41:57.362] if (.Platform$OS.type == "windows") { [18:41:57.362] old_names <- names(...future.oldEnvVars) [18:41:57.362] envs <- base::Sys.getenv() [18:41:57.362] names <- names(envs) [18:41:57.362] common <- intersect(names, old_names) [18:41:57.362] added <- setdiff(names, old_names) [18:41:57.362] removed <- setdiff(old_names, names) [18:41:57.362] changed <- common[...future.oldEnvVars[common] != [18:41:57.362] envs[common]] [18:41:57.362] NAMES <- toupper(changed) [18:41:57.362] args <- list() [18:41:57.362] for (kk in seq_along(NAMES)) { [18:41:57.362] name <- changed[[kk]] [18:41:57.362] NAME <- NAMES[[kk]] [18:41:57.362] if (name != NAME && is.element(NAME, old_names)) [18:41:57.362] next [18:41:57.362] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.362] } [18:41:57.362] NAMES <- toupper(added) [18:41:57.362] for (kk in seq_along(NAMES)) { [18:41:57.362] name <- added[[kk]] [18:41:57.362] NAME <- NAMES[[kk]] [18:41:57.362] if (name != NAME && is.element(NAME, old_names)) [18:41:57.362] next [18:41:57.362] args[[name]] <- "" [18:41:57.362] } [18:41:57.362] NAMES <- toupper(removed) [18:41:57.362] for (kk in seq_along(NAMES)) { [18:41:57.362] name <- removed[[kk]] [18:41:57.362] NAME <- NAMES[[kk]] [18:41:57.362] if (name != NAME && is.element(NAME, old_names)) [18:41:57.362] next [18:41:57.362] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.362] } [18:41:57.362] if (length(args) > 0) [18:41:57.362] base::do.call(base::Sys.setenv, args = args) [18:41:57.362] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.362] } [18:41:57.362] { [18:41:57.362] if (base::length(...future.futureOptionsAdded) > [18:41:57.362] 0L) { [18:41:57.362] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.362] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.362] base::options(opts) [18:41:57.362] } [18:41:57.362] { [18:41:57.362] { [18:41:57.362] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.362] NULL [18:41:57.362] } [18:41:57.362] options(future.plan = NULL) [18:41:57.362] if (is.na(NA_character_)) [18:41:57.362] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.362] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.362] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.362] .init = FALSE) [18:41:57.362] } [18:41:57.362] } [18:41:57.362] } [18:41:57.362] }) [18:41:57.362] if (TRUE) { [18:41:57.362] base::sink(type = "output", split = FALSE) [18:41:57.362] if (TRUE) { [18:41:57.362] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.362] } [18:41:57.362] else { [18:41:57.362] ...future.result["stdout"] <- base::list(NULL) [18:41:57.362] } [18:41:57.362] base::close(...future.stdout) [18:41:57.362] ...future.stdout <- NULL [18:41:57.362] } [18:41:57.362] ...future.result$conditions <- ...future.conditions [18:41:57.362] ...future.result$finished <- base::Sys.time() [18:41:57.362] ...future.result [18:41:57.362] } [18:41:57.367] Exporting 5 global objects (993 bytes) to cluster node #1 ... [18:41:57.367] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... [18:41:57.368] Exporting '...future.FUN' (278 bytes) to cluster node #1 ... DONE [18:41:57.368] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.368] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.368] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.369] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.369] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.369] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.370] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.370] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.370] Exporting 5 global objects (993 bytes) to cluster node #1 ... DONE [18:41:57.371] MultisessionFuture started [18:41:57.371] - Launch lazy future ... done [18:41:57.371] run() for 'MultisessionFuture' ... done [18:41:57.371] Created future: [18:41:57.385] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.385] - Validating connection of MultisessionFuture [18:41:57.385] - received message: FutureResult [18:41:57.385] - Received FutureResult [18:41:57.385] - Erased future from FutureRegistry [18:41:57.386] result() for ClusterFuture ... [18:41:57.386] - result already collected: FutureResult [18:41:57.386] result() for ClusterFuture ... done [18:41:57.386] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.371] MultisessionFuture: [18:41:57.371] Label: 'future_sapply-2' [18:41:57.371] Expression: [18:41:57.371] { [18:41:57.371] do.call(function(...) { [18:41:57.371] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.371] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.371] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.371] on.exit(options(oopts), add = TRUE) [18:41:57.371] } [18:41:57.371] { [18:41:57.371] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.371] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.371] ...future.FUN(...future.X_jj, ...) [18:41:57.371] }) [18:41:57.371] } [18:41:57.371] }, args = future.call.arguments) [18:41:57.371] } [18:41:57.371] Lazy evaluation: FALSE [18:41:57.371] Asynchronous evaluation: TRUE [18:41:57.371] Local evaluation: TRUE [18:41:57.371] Environment: R_GlobalEnv [18:41:57.371] Capture standard output: TRUE [18:41:57.371] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.371] Globals: 5 objects totaling 543 bytes (function '...future.FUN' of 278 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.371] Packages: [18:41:57.371] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.371] Resolved: TRUE [18:41:57.371] Value: [18:41:57.371] Conditions captured: [18:41:57.371] Early signaling: FALSE [18:41:57.371] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.371] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.386] Chunk #2 of 2 ... DONE [18:41:57.387] Launching 2 futures (chunks) ... DONE [18:41:57.387] Resolving 2 futures (chunks) ... [18:41:57.387] resolve() on list ... [18:41:57.387] recursive: 0 [18:41:57.387] length: 2 [18:41:57.387] [18:41:57.388] Future #1 [18:41:57.388] result() for ClusterFuture ... [18:41:57.388] - result already collected: FutureResult [18:41:57.388] result() for ClusterFuture ... done [18:41:57.388] result() for ClusterFuture ... [18:41:57.388] - result already collected: FutureResult [18:41:57.389] result() for ClusterFuture ... done [18:41:57.389] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:57.389] - nx: 2 [18:41:57.389] - relay: TRUE [18:41:57.389] - stdout: TRUE [18:41:57.389] - signal: TRUE [18:41:57.389] - resignal: FALSE [18:41:57.390] - force: TRUE [18:41:57.390] - relayed: [n=2] FALSE, FALSE [18:41:57.390] - queued futures: [n=2] FALSE, FALSE [18:41:57.390] - until=1 [18:41:57.390] - relaying element #1 [18:41:57.390] result() for ClusterFuture ... [18:41:57.391] - result already collected: FutureResult [18:41:57.391] result() for ClusterFuture ... done [18:41:57.391] result() for ClusterFuture ... [18:41:57.391] - result already collected: FutureResult [18:41:57.391] result() for ClusterFuture ... done [18:41:57.391] result() for ClusterFuture ... [18:41:57.392] - result already collected: FutureResult [18:41:57.392] result() for ClusterFuture ... done [18:41:57.392] result() for ClusterFuture ... [18:41:57.392] - result already collected: FutureResult [18:41:57.392] result() for ClusterFuture ... done [18:41:57.392] - relayed: [n=2] TRUE, FALSE [18:41:57.392] - queued futures: [n=2] TRUE, FALSE [18:41:57.393] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:57.393] length: 1 (resolved future 1) [18:41:57.393] Future #2 [18:41:57.393] result() for ClusterFuture ... [18:41:57.393] - result already collected: FutureResult [18:41:57.393] result() for ClusterFuture ... done [18:41:57.394] result() for ClusterFuture ... [18:41:57.394] - result already collected: FutureResult [18:41:57.394] result() for ClusterFuture ... done [18:41:57.394] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:57.394] - nx: 2 [18:41:57.394] - relay: TRUE [18:41:57.394] - stdout: TRUE [18:41:57.395] - signal: TRUE [18:41:57.395] - resignal: FALSE [18:41:57.395] - force: TRUE [18:41:57.395] - relayed: [n=2] TRUE, FALSE [18:41:57.395] - queued futures: [n=2] TRUE, FALSE [18:41:57.396] - until=2 [18:41:57.396] - relaying element #2 [18:41:57.396] result() for ClusterFuture ... [18:41:57.396] - result already collected: FutureResult [18:41:57.396] result() for ClusterFuture ... done [18:41:57.396] result() for ClusterFuture ... [18:41:57.397] - result already collected: FutureResult [18:41:57.397] result() for ClusterFuture ... done [18:41:57.397] result() for ClusterFuture ... [18:41:57.397] - result already collected: FutureResult [18:41:57.397] result() for ClusterFuture ... done [18:41:57.397] result() for ClusterFuture ... [18:41:57.398] - result already collected: FutureResult [18:41:57.398] result() for ClusterFuture ... done [18:41:57.398] - relayed: [n=2] TRUE, TRUE [18:41:57.398] - queued futures: [n=2] TRUE, TRUE [18:41:57.398] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:57.398] length: 0 (resolved future 2) [18:41:57.398] Relaying remaining futures [18:41:57.399] signalConditionsASAP(NULL, pos=0) ... [18:41:57.399] - nx: 2 [18:41:57.399] - relay: TRUE [18:41:57.399] - stdout: TRUE [18:41:57.399] - signal: TRUE [18:41:57.399] - resignal: FALSE [18:41:57.399] - force: TRUE [18:41:57.400] - relayed: [n=2] TRUE, TRUE [18:41:57.400] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:57.400] - relayed: [n=2] TRUE, TRUE [18:41:57.400] - queued futures: [n=2] TRUE, TRUE [18:41:57.400] signalConditionsASAP(NULL, pos=0) ... done [18:41:57.401] resolve() on list ... DONE [18:41:57.401] result() for ClusterFuture ... [18:41:57.401] - result already collected: FutureResult [18:41:57.401] result() for ClusterFuture ... done [18:41:57.401] result() for ClusterFuture ... [18:41:57.401] - result already collected: FutureResult [18:41:57.401] result() for ClusterFuture ... done [18:41:57.402] result() for ClusterFuture ... [18:41:57.402] - result already collected: FutureResult [18:41:57.402] result() for ClusterFuture ... done [18:41:57.402] result() for ClusterFuture ... [18:41:57.402] - result already collected: FutureResult [18:41:57.402] result() for ClusterFuture ... done [18:41:57.403] - Number of value chunks collected: 2 [18:41:57.403] Resolving 2 futures (chunks) ... DONE [18:41:57.403] Reducing values from 2 chunks ... [18:41:57.403] - Number of values collected after concatenation: 4 [18:41:57.403] - Number of values expected: 4 [18:41:57.403] Reducing values from 2 chunks ... DONE [18:41:57.403] future_lapply() ... DONE List of 2 $ y0: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" $ y1: Named num [1:4] 50 60 70 80 ..- attr(*, "names")= chr [1:4] "A" "B" "C" "D" [18:41:57.406] future_lapply() ... [18:41:57.409] Number of chunks: 2 [18:41:57.409] getGlobalsAndPackagesXApply() ... [18:41:57.409] - future.globals: TRUE [18:41:57.409] getGlobalsAndPackages() ... [18:41:57.409] Searching for globals... [18:41:57.411] - globals found: [5] 'FUN', '*', ':', 'outer', 'rep' [18:41:57.411] Searching for globals ... DONE [18:41:57.412] Resolving globals: FALSE [18:41:57.412] The total size of the 1 globals is 782 bytes (782 bytes) [18:41:57.413] The total size of the 1 globals exported for future expression ('FUN()') is 782 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (782 bytes of class 'function') [18:41:57.413] - globals: [1] 'FUN' [18:41:57.413] [18:41:57.413] getGlobalsAndPackages() ... DONE [18:41:57.413] - globals found/used: [n=1] 'FUN' [18:41:57.414] - needed namespaces: [n=0] [18:41:57.414] Finding globals ... DONE [18:41:57.414] - use_args: TRUE [18:41:57.414] - Getting '...' globals ... [18:41:57.414] resolve() on list ... [18:41:57.415] recursive: 0 [18:41:57.415] length: 1 [18:41:57.415] elements: '...' [18:41:57.415] length: 0 (resolved future 1) [18:41:57.415] resolve() on list ... DONE [18:41:57.415] - '...' content: [n=0] [18:41:57.416] List of 1 [18:41:57.416] $ ...: list() [18:41:57.416] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.416] - attr(*, "where")=List of 1 [18:41:57.416] ..$ ...: [18:41:57.416] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.416] - attr(*, "resolved")= logi TRUE [18:41:57.416] - attr(*, "total_size")= num NA [18:41:57.418] - Getting '...' globals ... DONE [18:41:57.419] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:57.419] List of 2 [18:41:57.419] $ ...future.FUN:function (x, y = 2 * 1:5) [18:41:57.419] $ ... : list() [18:41:57.419] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.419] - attr(*, "where")=List of 2 [18:41:57.419] ..$ ...future.FUN: [18:41:57.419] ..$ ... : [18:41:57.419] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.419] - attr(*, "resolved")= logi FALSE [18:41:57.419] - attr(*, "total_size")= int 6632 [18:41:57.422] Packages to be attached in all futures: [n=0] [18:41:57.422] getGlobalsAndPackagesXApply() ... DONE [18:41:57.423] Number of futures (= number of chunks): 2 [18:41:57.423] Launching 2 futures (chunks) ... [18:41:57.423] Chunk #1 of 2 ... [18:41:57.423] - Finding globals in 'X' for chunk #1 ... [18:41:57.423] getGlobalsAndPackages() ... [18:41:57.424] Searching for globals... [18:41:57.424] [18:41:57.424] Searching for globals ... DONE [18:41:57.424] - globals: [0] [18:41:57.424] getGlobalsAndPackages() ... DONE [18:41:57.425] + additional globals found: [n=0] [18:41:57.425] + additional namespaces needed: [n=0] [18:41:57.425] - Finding globals in 'X' for chunk #1 ... DONE [18:41:57.425] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.425] - seeds: [18:41:57.425] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.425] getGlobalsAndPackages() ... [18:41:57.426] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.426] Resolving globals: FALSE [18:41:57.426] Tweak future expression to call with '...' arguments ... [18:41:57.426] { [18:41:57.426] do.call(function(...) { [18:41:57.426] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.426] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.426] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.426] on.exit(options(oopts), add = TRUE) [18:41:57.426] } [18:41:57.426] { [18:41:57.426] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.426] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.426] ...future.FUN(...future.X_jj, ...) [18:41:57.426] }) [18:41:57.426] } [18:41:57.426] }, args = future.call.arguments) [18:41:57.426] } [18:41:57.427] Tweak future expression to call with '...' arguments ... DONE [18:41:57.427] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.427] [18:41:57.428] getGlobalsAndPackages() ... DONE [18:41:57.428] run() for 'Future' ... [18:41:57.428] - state: 'created' [18:41:57.428] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.443] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.444] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.444] - Field: 'node' [18:41:57.444] - Field: 'label' [18:41:57.444] - Field: 'local' [18:41:57.444] - Field: 'owner' [18:41:57.445] - Field: 'envir' [18:41:57.445] - Field: 'workers' [18:41:57.445] - Field: 'packages' [18:41:57.445] - Field: 'gc' [18:41:57.445] - Field: 'conditions' [18:41:57.445] - Field: 'persistent' [18:41:57.446] - Field: 'expr' [18:41:57.446] - Field: 'uuid' [18:41:57.446] - Field: 'seed' [18:41:57.446] - Field: 'version' [18:41:57.446] - Field: 'result' [18:41:57.446] - Field: 'asynchronous' [18:41:57.447] - Field: 'calls' [18:41:57.447] - Field: 'globals' [18:41:57.447] - Field: 'stdout' [18:41:57.447] - Field: 'earlySignal' [18:41:57.447] - Field: 'lazy' [18:41:57.448] - Field: 'state' [18:41:57.448] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.448] - Launch lazy future ... [18:41:57.448] Packages needed by the future expression (n = 0): [18:41:57.448] Packages needed by future strategies (n = 0): [18:41:57.449] { [18:41:57.449] { [18:41:57.449] { [18:41:57.449] ...future.startTime <- base::Sys.time() [18:41:57.449] { [18:41:57.449] { [18:41:57.449] { [18:41:57.449] { [18:41:57.449] base::local({ [18:41:57.449] has_future <- base::requireNamespace("future", [18:41:57.449] quietly = TRUE) [18:41:57.449] if (has_future) { [18:41:57.449] ns <- base::getNamespace("future") [18:41:57.449] version <- ns[[".package"]][["version"]] [18:41:57.449] if (is.null(version)) [18:41:57.449] version <- utils::packageVersion("future") [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] version <- NULL [18:41:57.449] } [18:41:57.449] if (!has_future || version < "1.8.0") { [18:41:57.449] info <- base::c(r_version = base::gsub("R version ", [18:41:57.449] "", base::R.version$version.string), [18:41:57.449] platform = base::sprintf("%s (%s-bit)", [18:41:57.449] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.449] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.449] "release", "version")], collapse = " "), [18:41:57.449] hostname = base::Sys.info()[["nodename"]]) [18:41:57.449] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.449] info) [18:41:57.449] info <- base::paste(info, collapse = "; ") [18:41:57.449] if (!has_future) { [18:41:57.449] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.449] info) [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.449] info, version) [18:41:57.449] } [18:41:57.449] base::stop(msg) [18:41:57.449] } [18:41:57.449] }) [18:41:57.449] } [18:41:57.449] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.449] base::options(mc.cores = 1L) [18:41:57.449] } [18:41:57.449] ...future.strategy.old <- future::plan("list") [18:41:57.449] options(future.plan = NULL) [18:41:57.449] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.449] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.449] } [18:41:57.449] ...future.workdir <- getwd() [18:41:57.449] } [18:41:57.449] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.449] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.449] } [18:41:57.449] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.449] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.449] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.449] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.449] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.449] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.449] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.449] base::names(...future.oldOptions)) [18:41:57.449] } [18:41:57.449] if (FALSE) { [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] if (TRUE) { [18:41:57.449] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.449] open = "w") [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.449] windows = "NUL", "/dev/null"), open = "w") [18:41:57.449] } [18:41:57.449] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.449] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.449] base::sink(type = "output", split = FALSE) [18:41:57.449] base::close(...future.stdout) [18:41:57.449] }, add = TRUE) [18:41:57.449] } [18:41:57.449] ...future.frame <- base::sys.nframe() [18:41:57.449] ...future.conditions <- base::list() [18:41:57.449] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.449] if (FALSE) { [18:41:57.449] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.449] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.449] } [18:41:57.449] ...future.result <- base::tryCatch({ [18:41:57.449] base::withCallingHandlers({ [18:41:57.449] ...future.value <- base::withVisible(base::local({ [18:41:57.449] ...future.makeSendCondition <- base::local({ [18:41:57.449] sendCondition <- NULL [18:41:57.449] function(frame = 1L) { [18:41:57.449] if (is.function(sendCondition)) [18:41:57.449] return(sendCondition) [18:41:57.449] ns <- getNamespace("parallel") [18:41:57.449] if (exists("sendData", mode = "function", [18:41:57.449] envir = ns)) { [18:41:57.449] parallel_sendData <- get("sendData", mode = "function", [18:41:57.449] envir = ns) [18:41:57.449] envir <- sys.frame(frame) [18:41:57.449] master <- NULL [18:41:57.449] while (!identical(envir, .GlobalEnv) && [18:41:57.449] !identical(envir, emptyenv())) { [18:41:57.449] if (exists("master", mode = "list", envir = envir, [18:41:57.449] inherits = FALSE)) { [18:41:57.449] master <- get("master", mode = "list", [18:41:57.449] envir = envir, inherits = FALSE) [18:41:57.449] if (inherits(master, c("SOCKnode", [18:41:57.449] "SOCK0node"))) { [18:41:57.449] sendCondition <<- function(cond) { [18:41:57.449] data <- list(type = "VALUE", value = cond, [18:41:57.449] success = TRUE) [18:41:57.449] parallel_sendData(master, data) [18:41:57.449] } [18:41:57.449] return(sendCondition) [18:41:57.449] } [18:41:57.449] } [18:41:57.449] frame <- frame + 1L [18:41:57.449] envir <- sys.frame(frame) [18:41:57.449] } [18:41:57.449] } [18:41:57.449] sendCondition <<- function(cond) NULL [18:41:57.449] } [18:41:57.449] }) [18:41:57.449] withCallingHandlers({ [18:41:57.449] { [18:41:57.449] do.call(function(...) { [18:41:57.449] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.449] if (!identical(...future.globals.maxSize.org, [18:41:57.449] ...future.globals.maxSize)) { [18:41:57.449] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.449] on.exit(options(oopts), add = TRUE) [18:41:57.449] } [18:41:57.449] { [18:41:57.449] lapply(seq_along(...future.elements_ii), [18:41:57.449] FUN = function(jj) { [18:41:57.449] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.449] ...future.FUN(...future.X_jj, ...) [18:41:57.449] }) [18:41:57.449] } [18:41:57.449] }, args = future.call.arguments) [18:41:57.449] } [18:41:57.449] }, immediateCondition = function(cond) { [18:41:57.449] sendCondition <- ...future.makeSendCondition() [18:41:57.449] sendCondition(cond) [18:41:57.449] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.449] { [18:41:57.449] inherits <- base::inherits [18:41:57.449] invokeRestart <- base::invokeRestart [18:41:57.449] is.null <- base::is.null [18:41:57.449] muffled <- FALSE [18:41:57.449] if (inherits(cond, "message")) { [18:41:57.449] muffled <- grepl(pattern, "muffleMessage") [18:41:57.449] if (muffled) [18:41:57.449] invokeRestart("muffleMessage") [18:41:57.449] } [18:41:57.449] else if (inherits(cond, "warning")) { [18:41:57.449] muffled <- grepl(pattern, "muffleWarning") [18:41:57.449] if (muffled) [18:41:57.449] invokeRestart("muffleWarning") [18:41:57.449] } [18:41:57.449] else if (inherits(cond, "condition")) { [18:41:57.449] if (!is.null(pattern)) { [18:41:57.449] computeRestarts <- base::computeRestarts [18:41:57.449] grepl <- base::grepl [18:41:57.449] restarts <- computeRestarts(cond) [18:41:57.449] for (restart in restarts) { [18:41:57.449] name <- restart$name [18:41:57.449] if (is.null(name)) [18:41:57.449] next [18:41:57.449] if (!grepl(pattern, name)) [18:41:57.449] next [18:41:57.449] invokeRestart(restart) [18:41:57.449] muffled <- TRUE [18:41:57.449] break [18:41:57.449] } [18:41:57.449] } [18:41:57.449] } [18:41:57.449] invisible(muffled) [18:41:57.449] } [18:41:57.449] muffleCondition(cond) [18:41:57.449] }) [18:41:57.449] })) [18:41:57.449] future::FutureResult(value = ...future.value$value, [18:41:57.449] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.449] ...future.rng), globalenv = if (FALSE) [18:41:57.449] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.449] ...future.globalenv.names)) [18:41:57.449] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.449] }, condition = base::local({ [18:41:57.449] c <- base::c [18:41:57.449] inherits <- base::inherits [18:41:57.449] invokeRestart <- base::invokeRestart [18:41:57.449] length <- base::length [18:41:57.449] list <- base::list [18:41:57.449] seq.int <- base::seq.int [18:41:57.449] signalCondition <- base::signalCondition [18:41:57.449] sys.calls <- base::sys.calls [18:41:57.449] `[[` <- base::`[[` [18:41:57.449] `+` <- base::`+` [18:41:57.449] `<<-` <- base::`<<-` [18:41:57.449] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.449] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.449] 3L)] [18:41:57.449] } [18:41:57.449] function(cond) { [18:41:57.449] is_error <- inherits(cond, "error") [18:41:57.449] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.449] NULL) [18:41:57.449] if (is_error) { [18:41:57.449] sessionInformation <- function() { [18:41:57.449] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.449] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.449] search = base::search(), system = base::Sys.info()) [18:41:57.449] } [18:41:57.449] ...future.conditions[[length(...future.conditions) + [18:41:57.449] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.449] cond$call), session = sessionInformation(), [18:41:57.449] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.449] signalCondition(cond) [18:41:57.449] } [18:41:57.449] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.449] "immediateCondition"))) { [18:41:57.449] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.449] ...future.conditions[[length(...future.conditions) + [18:41:57.449] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.449] if (TRUE && !signal) { [18:41:57.449] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.449] { [18:41:57.449] inherits <- base::inherits [18:41:57.449] invokeRestart <- base::invokeRestart [18:41:57.449] is.null <- base::is.null [18:41:57.449] muffled <- FALSE [18:41:57.449] if (inherits(cond, "message")) { [18:41:57.449] muffled <- grepl(pattern, "muffleMessage") [18:41:57.449] if (muffled) [18:41:57.449] invokeRestart("muffleMessage") [18:41:57.449] } [18:41:57.449] else if (inherits(cond, "warning")) { [18:41:57.449] muffled <- grepl(pattern, "muffleWarning") [18:41:57.449] if (muffled) [18:41:57.449] invokeRestart("muffleWarning") [18:41:57.449] } [18:41:57.449] else if (inherits(cond, "condition")) { [18:41:57.449] if (!is.null(pattern)) { [18:41:57.449] computeRestarts <- base::computeRestarts [18:41:57.449] grepl <- base::grepl [18:41:57.449] restarts <- computeRestarts(cond) [18:41:57.449] for (restart in restarts) { [18:41:57.449] name <- restart$name [18:41:57.449] if (is.null(name)) [18:41:57.449] next [18:41:57.449] if (!grepl(pattern, name)) [18:41:57.449] next [18:41:57.449] invokeRestart(restart) [18:41:57.449] muffled <- TRUE [18:41:57.449] break [18:41:57.449] } [18:41:57.449] } [18:41:57.449] } [18:41:57.449] invisible(muffled) [18:41:57.449] } [18:41:57.449] muffleCondition(cond, pattern = "^muffle") [18:41:57.449] } [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] if (TRUE) { [18:41:57.449] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.449] { [18:41:57.449] inherits <- base::inherits [18:41:57.449] invokeRestart <- base::invokeRestart [18:41:57.449] is.null <- base::is.null [18:41:57.449] muffled <- FALSE [18:41:57.449] if (inherits(cond, "message")) { [18:41:57.449] muffled <- grepl(pattern, "muffleMessage") [18:41:57.449] if (muffled) [18:41:57.449] invokeRestart("muffleMessage") [18:41:57.449] } [18:41:57.449] else if (inherits(cond, "warning")) { [18:41:57.449] muffled <- grepl(pattern, "muffleWarning") [18:41:57.449] if (muffled) [18:41:57.449] invokeRestart("muffleWarning") [18:41:57.449] } [18:41:57.449] else if (inherits(cond, "condition")) { [18:41:57.449] if (!is.null(pattern)) { [18:41:57.449] computeRestarts <- base::computeRestarts [18:41:57.449] grepl <- base::grepl [18:41:57.449] restarts <- computeRestarts(cond) [18:41:57.449] for (restart in restarts) { [18:41:57.449] name <- restart$name [18:41:57.449] if (is.null(name)) [18:41:57.449] next [18:41:57.449] if (!grepl(pattern, name)) [18:41:57.449] next [18:41:57.449] invokeRestart(restart) [18:41:57.449] muffled <- TRUE [18:41:57.449] break [18:41:57.449] } [18:41:57.449] } [18:41:57.449] } [18:41:57.449] invisible(muffled) [18:41:57.449] } [18:41:57.449] muffleCondition(cond, pattern = "^muffle") [18:41:57.449] } [18:41:57.449] } [18:41:57.449] } [18:41:57.449] })) [18:41:57.449] }, error = function(ex) { [18:41:57.449] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.449] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.449] ...future.rng), started = ...future.startTime, [18:41:57.449] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.449] version = "1.8"), class = "FutureResult") [18:41:57.449] }, finally = { [18:41:57.449] if (!identical(...future.workdir, getwd())) [18:41:57.449] setwd(...future.workdir) [18:41:57.449] { [18:41:57.449] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.449] ...future.oldOptions$nwarnings <- NULL [18:41:57.449] } [18:41:57.449] base::options(...future.oldOptions) [18:41:57.449] if (.Platform$OS.type == "windows") { [18:41:57.449] old_names <- names(...future.oldEnvVars) [18:41:57.449] envs <- base::Sys.getenv() [18:41:57.449] names <- names(envs) [18:41:57.449] common <- intersect(names, old_names) [18:41:57.449] added <- setdiff(names, old_names) [18:41:57.449] removed <- setdiff(old_names, names) [18:41:57.449] changed <- common[...future.oldEnvVars[common] != [18:41:57.449] envs[common]] [18:41:57.449] NAMES <- toupper(changed) [18:41:57.449] args <- list() [18:41:57.449] for (kk in seq_along(NAMES)) { [18:41:57.449] name <- changed[[kk]] [18:41:57.449] NAME <- NAMES[[kk]] [18:41:57.449] if (name != NAME && is.element(NAME, old_names)) [18:41:57.449] next [18:41:57.449] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.449] } [18:41:57.449] NAMES <- toupper(added) [18:41:57.449] for (kk in seq_along(NAMES)) { [18:41:57.449] name <- added[[kk]] [18:41:57.449] NAME <- NAMES[[kk]] [18:41:57.449] if (name != NAME && is.element(NAME, old_names)) [18:41:57.449] next [18:41:57.449] args[[name]] <- "" [18:41:57.449] } [18:41:57.449] NAMES <- toupper(removed) [18:41:57.449] for (kk in seq_along(NAMES)) { [18:41:57.449] name <- removed[[kk]] [18:41:57.449] NAME <- NAMES[[kk]] [18:41:57.449] if (name != NAME && is.element(NAME, old_names)) [18:41:57.449] next [18:41:57.449] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.449] } [18:41:57.449] if (length(args) > 0) [18:41:57.449] base::do.call(base::Sys.setenv, args = args) [18:41:57.449] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.449] } [18:41:57.449] { [18:41:57.449] if (base::length(...future.futureOptionsAdded) > [18:41:57.449] 0L) { [18:41:57.449] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.449] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.449] base::options(opts) [18:41:57.449] } [18:41:57.449] { [18:41:57.449] { [18:41:57.449] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.449] NULL [18:41:57.449] } [18:41:57.449] options(future.plan = NULL) [18:41:57.449] if (is.na(NA_character_)) [18:41:57.449] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.449] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.449] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.449] .init = FALSE) [18:41:57.449] } [18:41:57.449] } [18:41:57.449] } [18:41:57.449] }) [18:41:57.449] if (TRUE) { [18:41:57.449] base::sink(type = "output", split = FALSE) [18:41:57.449] if (TRUE) { [18:41:57.449] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.449] } [18:41:57.449] else { [18:41:57.449] ...future.result["stdout"] <- base::list(NULL) [18:41:57.449] } [18:41:57.449] base::close(...future.stdout) [18:41:57.449] ...future.stdout <- NULL [18:41:57.449] } [18:41:57.449] ...future.result$conditions <- ...future.conditions [18:41:57.449] ...future.result$finished <- base::Sys.time() [18:41:57.449] ...future.result [18:41:57.449] } [18:41:57.454] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:57.454] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:57.455] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:57.455] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.455] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.456] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.456] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.456] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.457] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.457] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.457] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.457] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:57.458] MultisessionFuture started [18:41:57.458] - Launch lazy future ... done [18:41:57.458] run() for 'MultisessionFuture' ... done [18:41:57.459] Created future: [18:41:57.473] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.473] - Validating connection of MultisessionFuture [18:41:57.473] - received message: FutureResult [18:41:57.474] - Received FutureResult [18:41:57.474] - Erased future from FutureRegistry [18:41:57.474] result() for ClusterFuture ... [18:41:57.474] - result already collected: FutureResult [18:41:57.474] result() for ClusterFuture ... done [18:41:57.474] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.459] MultisessionFuture: [18:41:57.459] Label: 'future_sapply-1' [18:41:57.459] Expression: [18:41:57.459] { [18:41:57.459] do.call(function(...) { [18:41:57.459] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.459] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.459] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.459] on.exit(options(oopts), add = TRUE) [18:41:57.459] } [18:41:57.459] { [18:41:57.459] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.459] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.459] ...future.FUN(...future.X_jj, ...) [18:41:57.459] }) [18:41:57.459] } [18:41:57.459] }, args = future.call.arguments) [18:41:57.459] } [18:41:57.459] Lazy evaluation: FALSE [18:41:57.459] Asynchronous evaluation: TRUE [18:41:57.459] Local evaluation: TRUE [18:41:57.459] Environment: R_GlobalEnv [18:41:57.459] Capture standard output: TRUE [18:41:57.459] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.459] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.459] Packages: [18:41:57.459] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.459] Resolved: TRUE [18:41:57.459] Value: [18:41:57.459] Conditions captured: [18:41:57.459] Early signaling: FALSE [18:41:57.459] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.459] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.475] Chunk #1 of 2 ... DONE [18:41:57.475] Chunk #2 of 2 ... [18:41:57.475] - Finding globals in 'X' for chunk #2 ... [18:41:57.475] getGlobalsAndPackages() ... [18:41:57.476] Searching for globals... [18:41:57.476] [18:41:57.476] Searching for globals ... DONE [18:41:57.476] - globals: [0] [18:41:57.476] getGlobalsAndPackages() ... DONE [18:41:57.476] + additional globals found: [n=0] [18:41:57.477] + additional namespaces needed: [n=0] [18:41:57.477] - Finding globals in 'X' for chunk #2 ... DONE [18:41:57.477] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.477] - seeds: [18:41:57.477] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.477] getGlobalsAndPackages() ... [18:41:57.478] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.478] Resolving globals: FALSE [18:41:57.478] Tweak future expression to call with '...' arguments ... [18:41:57.478] { [18:41:57.478] do.call(function(...) { [18:41:57.478] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.478] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.478] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.478] on.exit(options(oopts), add = TRUE) [18:41:57.478] } [18:41:57.478] { [18:41:57.478] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.478] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.478] ...future.FUN(...future.X_jj, ...) [18:41:57.478] }) [18:41:57.478] } [18:41:57.478] }, args = future.call.arguments) [18:41:57.478] } [18:41:57.479] Tweak future expression to call with '...' arguments ... DONE [18:41:57.479] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.479] [18:41:57.479] getGlobalsAndPackages() ... DONE [18:41:57.480] run() for 'Future' ... [18:41:57.480] - state: 'created' [18:41:57.480] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.496] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.496] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.496] - Field: 'node' [18:41:57.496] - Field: 'label' [18:41:57.496] - Field: 'local' [18:41:57.497] - Field: 'owner' [18:41:57.497] - Field: 'envir' [18:41:57.497] - Field: 'workers' [18:41:57.497] - Field: 'packages' [18:41:57.497] - Field: 'gc' [18:41:57.497] - Field: 'conditions' [18:41:57.498] - Field: 'persistent' [18:41:57.498] - Field: 'expr' [18:41:57.498] - Field: 'uuid' [18:41:57.498] - Field: 'seed' [18:41:57.498] - Field: 'version' [18:41:57.498] - Field: 'result' [18:41:57.499] - Field: 'asynchronous' [18:41:57.499] - Field: 'calls' [18:41:57.499] - Field: 'globals' [18:41:57.499] - Field: 'stdout' [18:41:57.499] - Field: 'earlySignal' [18:41:57.499] - Field: 'lazy' [18:41:57.500] - Field: 'state' [18:41:57.500] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.500] - Launch lazy future ... [18:41:57.500] Packages needed by the future expression (n = 0): [18:41:57.501] Packages needed by future strategies (n = 0): [18:41:57.501] { [18:41:57.501] { [18:41:57.501] { [18:41:57.501] ...future.startTime <- base::Sys.time() [18:41:57.501] { [18:41:57.501] { [18:41:57.501] { [18:41:57.501] { [18:41:57.501] base::local({ [18:41:57.501] has_future <- base::requireNamespace("future", [18:41:57.501] quietly = TRUE) [18:41:57.501] if (has_future) { [18:41:57.501] ns <- base::getNamespace("future") [18:41:57.501] version <- ns[[".package"]][["version"]] [18:41:57.501] if (is.null(version)) [18:41:57.501] version <- utils::packageVersion("future") [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] version <- NULL [18:41:57.501] } [18:41:57.501] if (!has_future || version < "1.8.0") { [18:41:57.501] info <- base::c(r_version = base::gsub("R version ", [18:41:57.501] "", base::R.version$version.string), [18:41:57.501] platform = base::sprintf("%s (%s-bit)", [18:41:57.501] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.501] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.501] "release", "version")], collapse = " "), [18:41:57.501] hostname = base::Sys.info()[["nodename"]]) [18:41:57.501] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.501] info) [18:41:57.501] info <- base::paste(info, collapse = "; ") [18:41:57.501] if (!has_future) { [18:41:57.501] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.501] info) [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.501] info, version) [18:41:57.501] } [18:41:57.501] base::stop(msg) [18:41:57.501] } [18:41:57.501] }) [18:41:57.501] } [18:41:57.501] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.501] base::options(mc.cores = 1L) [18:41:57.501] } [18:41:57.501] ...future.strategy.old <- future::plan("list") [18:41:57.501] options(future.plan = NULL) [18:41:57.501] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.501] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.501] } [18:41:57.501] ...future.workdir <- getwd() [18:41:57.501] } [18:41:57.501] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.501] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.501] } [18:41:57.501] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.501] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.501] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.501] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.501] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.501] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.501] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.501] base::names(...future.oldOptions)) [18:41:57.501] } [18:41:57.501] if (FALSE) { [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] if (TRUE) { [18:41:57.501] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.501] open = "w") [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.501] windows = "NUL", "/dev/null"), open = "w") [18:41:57.501] } [18:41:57.501] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.501] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.501] base::sink(type = "output", split = FALSE) [18:41:57.501] base::close(...future.stdout) [18:41:57.501] }, add = TRUE) [18:41:57.501] } [18:41:57.501] ...future.frame <- base::sys.nframe() [18:41:57.501] ...future.conditions <- base::list() [18:41:57.501] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.501] if (FALSE) { [18:41:57.501] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.501] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.501] } [18:41:57.501] ...future.result <- base::tryCatch({ [18:41:57.501] base::withCallingHandlers({ [18:41:57.501] ...future.value <- base::withVisible(base::local({ [18:41:57.501] ...future.makeSendCondition <- base::local({ [18:41:57.501] sendCondition <- NULL [18:41:57.501] function(frame = 1L) { [18:41:57.501] if (is.function(sendCondition)) [18:41:57.501] return(sendCondition) [18:41:57.501] ns <- getNamespace("parallel") [18:41:57.501] if (exists("sendData", mode = "function", [18:41:57.501] envir = ns)) { [18:41:57.501] parallel_sendData <- get("sendData", mode = "function", [18:41:57.501] envir = ns) [18:41:57.501] envir <- sys.frame(frame) [18:41:57.501] master <- NULL [18:41:57.501] while (!identical(envir, .GlobalEnv) && [18:41:57.501] !identical(envir, emptyenv())) { [18:41:57.501] if (exists("master", mode = "list", envir = envir, [18:41:57.501] inherits = FALSE)) { [18:41:57.501] master <- get("master", mode = "list", [18:41:57.501] envir = envir, inherits = FALSE) [18:41:57.501] if (inherits(master, c("SOCKnode", [18:41:57.501] "SOCK0node"))) { [18:41:57.501] sendCondition <<- function(cond) { [18:41:57.501] data <- list(type = "VALUE", value = cond, [18:41:57.501] success = TRUE) [18:41:57.501] parallel_sendData(master, data) [18:41:57.501] } [18:41:57.501] return(sendCondition) [18:41:57.501] } [18:41:57.501] } [18:41:57.501] frame <- frame + 1L [18:41:57.501] envir <- sys.frame(frame) [18:41:57.501] } [18:41:57.501] } [18:41:57.501] sendCondition <<- function(cond) NULL [18:41:57.501] } [18:41:57.501] }) [18:41:57.501] withCallingHandlers({ [18:41:57.501] { [18:41:57.501] do.call(function(...) { [18:41:57.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.501] if (!identical(...future.globals.maxSize.org, [18:41:57.501] ...future.globals.maxSize)) { [18:41:57.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.501] on.exit(options(oopts), add = TRUE) [18:41:57.501] } [18:41:57.501] { [18:41:57.501] lapply(seq_along(...future.elements_ii), [18:41:57.501] FUN = function(jj) { [18:41:57.501] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.501] ...future.FUN(...future.X_jj, ...) [18:41:57.501] }) [18:41:57.501] } [18:41:57.501] }, args = future.call.arguments) [18:41:57.501] } [18:41:57.501] }, immediateCondition = function(cond) { [18:41:57.501] sendCondition <- ...future.makeSendCondition() [18:41:57.501] sendCondition(cond) [18:41:57.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.501] { [18:41:57.501] inherits <- base::inherits [18:41:57.501] invokeRestart <- base::invokeRestart [18:41:57.501] is.null <- base::is.null [18:41:57.501] muffled <- FALSE [18:41:57.501] if (inherits(cond, "message")) { [18:41:57.501] muffled <- grepl(pattern, "muffleMessage") [18:41:57.501] if (muffled) [18:41:57.501] invokeRestart("muffleMessage") [18:41:57.501] } [18:41:57.501] else if (inherits(cond, "warning")) { [18:41:57.501] muffled <- grepl(pattern, "muffleWarning") [18:41:57.501] if (muffled) [18:41:57.501] invokeRestart("muffleWarning") [18:41:57.501] } [18:41:57.501] else if (inherits(cond, "condition")) { [18:41:57.501] if (!is.null(pattern)) { [18:41:57.501] computeRestarts <- base::computeRestarts [18:41:57.501] grepl <- base::grepl [18:41:57.501] restarts <- computeRestarts(cond) [18:41:57.501] for (restart in restarts) { [18:41:57.501] name <- restart$name [18:41:57.501] if (is.null(name)) [18:41:57.501] next [18:41:57.501] if (!grepl(pattern, name)) [18:41:57.501] next [18:41:57.501] invokeRestart(restart) [18:41:57.501] muffled <- TRUE [18:41:57.501] break [18:41:57.501] } [18:41:57.501] } [18:41:57.501] } [18:41:57.501] invisible(muffled) [18:41:57.501] } [18:41:57.501] muffleCondition(cond) [18:41:57.501] }) [18:41:57.501] })) [18:41:57.501] future::FutureResult(value = ...future.value$value, [18:41:57.501] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.501] ...future.rng), globalenv = if (FALSE) [18:41:57.501] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.501] ...future.globalenv.names)) [18:41:57.501] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.501] }, condition = base::local({ [18:41:57.501] c <- base::c [18:41:57.501] inherits <- base::inherits [18:41:57.501] invokeRestart <- base::invokeRestart [18:41:57.501] length <- base::length [18:41:57.501] list <- base::list [18:41:57.501] seq.int <- base::seq.int [18:41:57.501] signalCondition <- base::signalCondition [18:41:57.501] sys.calls <- base::sys.calls [18:41:57.501] `[[` <- base::`[[` [18:41:57.501] `+` <- base::`+` [18:41:57.501] `<<-` <- base::`<<-` [18:41:57.501] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.501] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.501] 3L)] [18:41:57.501] } [18:41:57.501] function(cond) { [18:41:57.501] is_error <- inherits(cond, "error") [18:41:57.501] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.501] NULL) [18:41:57.501] if (is_error) { [18:41:57.501] sessionInformation <- function() { [18:41:57.501] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.501] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.501] search = base::search(), system = base::Sys.info()) [18:41:57.501] } [18:41:57.501] ...future.conditions[[length(...future.conditions) + [18:41:57.501] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.501] cond$call), session = sessionInformation(), [18:41:57.501] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.501] signalCondition(cond) [18:41:57.501] } [18:41:57.501] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.501] "immediateCondition"))) { [18:41:57.501] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.501] ...future.conditions[[length(...future.conditions) + [18:41:57.501] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.501] if (TRUE && !signal) { [18:41:57.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.501] { [18:41:57.501] inherits <- base::inherits [18:41:57.501] invokeRestart <- base::invokeRestart [18:41:57.501] is.null <- base::is.null [18:41:57.501] muffled <- FALSE [18:41:57.501] if (inherits(cond, "message")) { [18:41:57.501] muffled <- grepl(pattern, "muffleMessage") [18:41:57.501] if (muffled) [18:41:57.501] invokeRestart("muffleMessage") [18:41:57.501] } [18:41:57.501] else if (inherits(cond, "warning")) { [18:41:57.501] muffled <- grepl(pattern, "muffleWarning") [18:41:57.501] if (muffled) [18:41:57.501] invokeRestart("muffleWarning") [18:41:57.501] } [18:41:57.501] else if (inherits(cond, "condition")) { [18:41:57.501] if (!is.null(pattern)) { [18:41:57.501] computeRestarts <- base::computeRestarts [18:41:57.501] grepl <- base::grepl [18:41:57.501] restarts <- computeRestarts(cond) [18:41:57.501] for (restart in restarts) { [18:41:57.501] name <- restart$name [18:41:57.501] if (is.null(name)) [18:41:57.501] next [18:41:57.501] if (!grepl(pattern, name)) [18:41:57.501] next [18:41:57.501] invokeRestart(restart) [18:41:57.501] muffled <- TRUE [18:41:57.501] break [18:41:57.501] } [18:41:57.501] } [18:41:57.501] } [18:41:57.501] invisible(muffled) [18:41:57.501] } [18:41:57.501] muffleCondition(cond, pattern = "^muffle") [18:41:57.501] } [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] if (TRUE) { [18:41:57.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.501] { [18:41:57.501] inherits <- base::inherits [18:41:57.501] invokeRestart <- base::invokeRestart [18:41:57.501] is.null <- base::is.null [18:41:57.501] muffled <- FALSE [18:41:57.501] if (inherits(cond, "message")) { [18:41:57.501] muffled <- grepl(pattern, "muffleMessage") [18:41:57.501] if (muffled) [18:41:57.501] invokeRestart("muffleMessage") [18:41:57.501] } [18:41:57.501] else if (inherits(cond, "warning")) { [18:41:57.501] muffled <- grepl(pattern, "muffleWarning") [18:41:57.501] if (muffled) [18:41:57.501] invokeRestart("muffleWarning") [18:41:57.501] } [18:41:57.501] else if (inherits(cond, "condition")) { [18:41:57.501] if (!is.null(pattern)) { [18:41:57.501] computeRestarts <- base::computeRestarts [18:41:57.501] grepl <- base::grepl [18:41:57.501] restarts <- computeRestarts(cond) [18:41:57.501] for (restart in restarts) { [18:41:57.501] name <- restart$name [18:41:57.501] if (is.null(name)) [18:41:57.501] next [18:41:57.501] if (!grepl(pattern, name)) [18:41:57.501] next [18:41:57.501] invokeRestart(restart) [18:41:57.501] muffled <- TRUE [18:41:57.501] break [18:41:57.501] } [18:41:57.501] } [18:41:57.501] } [18:41:57.501] invisible(muffled) [18:41:57.501] } [18:41:57.501] muffleCondition(cond, pattern = "^muffle") [18:41:57.501] } [18:41:57.501] } [18:41:57.501] } [18:41:57.501] })) [18:41:57.501] }, error = function(ex) { [18:41:57.501] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.501] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.501] ...future.rng), started = ...future.startTime, [18:41:57.501] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.501] version = "1.8"), class = "FutureResult") [18:41:57.501] }, finally = { [18:41:57.501] if (!identical(...future.workdir, getwd())) [18:41:57.501] setwd(...future.workdir) [18:41:57.501] { [18:41:57.501] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.501] ...future.oldOptions$nwarnings <- NULL [18:41:57.501] } [18:41:57.501] base::options(...future.oldOptions) [18:41:57.501] if (.Platform$OS.type == "windows") { [18:41:57.501] old_names <- names(...future.oldEnvVars) [18:41:57.501] envs <- base::Sys.getenv() [18:41:57.501] names <- names(envs) [18:41:57.501] common <- intersect(names, old_names) [18:41:57.501] added <- setdiff(names, old_names) [18:41:57.501] removed <- setdiff(old_names, names) [18:41:57.501] changed <- common[...future.oldEnvVars[common] != [18:41:57.501] envs[common]] [18:41:57.501] NAMES <- toupper(changed) [18:41:57.501] args <- list() [18:41:57.501] for (kk in seq_along(NAMES)) { [18:41:57.501] name <- changed[[kk]] [18:41:57.501] NAME <- NAMES[[kk]] [18:41:57.501] if (name != NAME && is.element(NAME, old_names)) [18:41:57.501] next [18:41:57.501] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.501] } [18:41:57.501] NAMES <- toupper(added) [18:41:57.501] for (kk in seq_along(NAMES)) { [18:41:57.501] name <- added[[kk]] [18:41:57.501] NAME <- NAMES[[kk]] [18:41:57.501] if (name != NAME && is.element(NAME, old_names)) [18:41:57.501] next [18:41:57.501] args[[name]] <- "" [18:41:57.501] } [18:41:57.501] NAMES <- toupper(removed) [18:41:57.501] for (kk in seq_along(NAMES)) { [18:41:57.501] name <- removed[[kk]] [18:41:57.501] NAME <- NAMES[[kk]] [18:41:57.501] if (name != NAME && is.element(NAME, old_names)) [18:41:57.501] next [18:41:57.501] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.501] } [18:41:57.501] if (length(args) > 0) [18:41:57.501] base::do.call(base::Sys.setenv, args = args) [18:41:57.501] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.501] } [18:41:57.501] { [18:41:57.501] if (base::length(...future.futureOptionsAdded) > [18:41:57.501] 0L) { [18:41:57.501] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.501] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.501] base::options(opts) [18:41:57.501] } [18:41:57.501] { [18:41:57.501] { [18:41:57.501] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.501] NULL [18:41:57.501] } [18:41:57.501] options(future.plan = NULL) [18:41:57.501] if (is.na(NA_character_)) [18:41:57.501] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.501] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.501] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.501] .init = FALSE) [18:41:57.501] } [18:41:57.501] } [18:41:57.501] } [18:41:57.501] }) [18:41:57.501] if (TRUE) { [18:41:57.501] base::sink(type = "output", split = FALSE) [18:41:57.501] if (TRUE) { [18:41:57.501] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.501] } [18:41:57.501] else { [18:41:57.501] ...future.result["stdout"] <- base::list(NULL) [18:41:57.501] } [18:41:57.501] base::close(...future.stdout) [18:41:57.501] ...future.stdout <- NULL [18:41:57.501] } [18:41:57.501] ...future.result$conditions <- ...future.conditions [18:41:57.501] ...future.result$finished <- base::Sys.time() [18:41:57.501] ...future.result [18:41:57.501] } [18:41:57.506] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... [18:41:57.507] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... [18:41:57.507] Exporting '...future.FUN' (782 bytes) to cluster node #1 ... DONE [18:41:57.507] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.508] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.508] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:57.508] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:57.508] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.509] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.509] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.509] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.510] Exporting 5 global objects (1.46 KiB) to cluster node #1 ... DONE [18:41:57.510] MultisessionFuture started [18:41:57.510] - Launch lazy future ... done [18:41:57.511] run() for 'MultisessionFuture' ... done [18:41:57.511] Created future: [18:41:57.525] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.525] - Validating connection of MultisessionFuture [18:41:57.525] - received message: FutureResult [18:41:57.526] - Received FutureResult [18:41:57.526] - Erased future from FutureRegistry [18:41:57.526] result() for ClusterFuture ... [18:41:57.530] - result already collected: FutureResult [18:41:57.530] result() for ClusterFuture ... done [18:41:57.530] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.511] MultisessionFuture: [18:41:57.511] Label: 'future_sapply-2' [18:41:57.511] Expression: [18:41:57.511] { [18:41:57.511] do.call(function(...) { [18:41:57.511] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.511] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.511] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.511] on.exit(options(oopts), add = TRUE) [18:41:57.511] } [18:41:57.511] { [18:41:57.511] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.511] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.511] ...future.FUN(...future.X_jj, ...) [18:41:57.511] }) [18:41:57.511] } [18:41:57.511] }, args = future.call.arguments) [18:41:57.511] } [18:41:57.511] Lazy evaluation: FALSE [18:41:57.511] Asynchronous evaluation: TRUE [18:41:57.511] Local evaluation: TRUE [18:41:57.511] Environment: R_GlobalEnv [18:41:57.511] Capture standard output: TRUE [18:41:57.511] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.511] Globals: 5 objects totaling 1.02 KiB (function '...future.FUN' of 782 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:57.511] Packages: [18:41:57.511] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.511] Resolved: TRUE [18:41:57.511] Value: [18:41:57.511] Conditions captured: [18:41:57.511] Early signaling: FALSE [18:41:57.511] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.511] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.531] Chunk #2 of 2 ... DONE [18:41:57.531] Launching 2 futures (chunks) ... DONE [18:41:57.531] Resolving 2 futures (chunks) ... [18:41:57.531] resolve() on list ... [18:41:57.531] recursive: 0 [18:41:57.531] length: 2 [18:41:57.532] [18:41:57.532] Future #1 [18:41:57.532] result() for ClusterFuture ... [18:41:57.532] - result already collected: FutureResult [18:41:57.532] result() for ClusterFuture ... done [18:41:57.533] result() for ClusterFuture ... [18:41:57.533] - result already collected: FutureResult [18:41:57.533] result() for ClusterFuture ... done [18:41:57.533] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:57.533] - nx: 2 [18:41:57.533] - relay: TRUE [18:41:57.534] - stdout: TRUE [18:41:57.534] - signal: TRUE [18:41:57.534] - resignal: FALSE [18:41:57.534] - force: TRUE [18:41:57.534] - relayed: [n=2] FALSE, FALSE [18:41:57.534] - queued futures: [n=2] FALSE, FALSE [18:41:57.535] - until=1 [18:41:57.535] - relaying element #1 [18:41:57.535] result() for ClusterFuture ... [18:41:57.535] - result already collected: FutureResult [18:41:57.535] result() for ClusterFuture ... done [18:41:57.535] result() for ClusterFuture ... [18:41:57.536] - result already collected: FutureResult [18:41:57.536] result() for ClusterFuture ... done [18:41:57.536] result() for ClusterFuture ... [18:41:57.536] - result already collected: FutureResult [18:41:57.536] result() for ClusterFuture ... done [18:41:57.537] result() for ClusterFuture ... [18:41:57.537] - result already collected: FutureResult [18:41:57.537] result() for ClusterFuture ... done [18:41:57.537] - relayed: [n=2] TRUE, FALSE [18:41:57.537] - queued futures: [n=2] TRUE, FALSE [18:41:57.537] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:57.537] length: 1 (resolved future 1) [18:41:57.538] Future #2 [18:41:57.538] result() for ClusterFuture ... [18:41:57.538] - result already collected: FutureResult [18:41:57.538] result() for ClusterFuture ... done [18:41:57.538] result() for ClusterFuture ... [18:41:57.538] - result already collected: FutureResult [18:41:57.539] result() for ClusterFuture ... done [18:41:57.539] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:57.539] - nx: 2 [18:41:57.539] - relay: TRUE [18:41:57.539] - stdout: TRUE [18:41:57.539] - signal: TRUE [18:41:57.540] - resignal: FALSE [18:41:57.540] - force: TRUE [18:41:57.540] - relayed: [n=2] TRUE, FALSE [18:41:57.540] - queued futures: [n=2] TRUE, FALSE [18:41:57.540] - until=2 [18:41:57.540] - relaying element #2 [18:41:57.540] result() for ClusterFuture ... [18:41:57.541] - result already collected: FutureResult [18:41:57.541] result() for ClusterFuture ... done [18:41:57.541] result() for ClusterFuture ... [18:41:57.541] - result already collected: FutureResult [18:41:57.541] result() for ClusterFuture ... done [18:41:57.541] result() for ClusterFuture ... [18:41:57.542] - result already collected: FutureResult [18:41:57.542] result() for ClusterFuture ... done [18:41:57.542] result() for ClusterFuture ... [18:41:57.542] - result already collected: FutureResult [18:41:57.542] result() for ClusterFuture ... done [18:41:57.542] - relayed: [n=2] TRUE, TRUE [18:41:57.543] - queued futures: [n=2] TRUE, TRUE [18:41:57.543] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:57.543] length: 0 (resolved future 2) [18:41:57.543] Relaying remaining futures [18:41:57.543] signalConditionsASAP(NULL, pos=0) ... [18:41:57.543] - nx: 2 [18:41:57.543] - relay: TRUE [18:41:57.544] - stdout: TRUE [18:41:57.544] - signal: TRUE [18:41:57.544] - resignal: FALSE [18:41:57.544] - force: TRUE [18:41:57.544] - relayed: [n=2] TRUE, TRUE [18:41:57.544] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:57.545] - relayed: [n=2] TRUE, TRUE [18:41:57.545] - queued futures: [n=2] TRUE, TRUE [18:41:57.545] signalConditionsASAP(NULL, pos=0) ... done [18:41:57.545] resolve() on list ... DONE [18:41:57.545] result() for ClusterFuture ... [18:41:57.545] - result already collected: FutureResult [18:41:57.546] result() for ClusterFuture ... done [18:41:57.546] result() for ClusterFuture ... [18:41:57.546] - result already collected: FutureResult [18:41:57.546] result() for ClusterFuture ... done [18:41:57.546] result() for ClusterFuture ... [18:41:57.546] - result already collected: FutureResult [18:41:57.547] result() for ClusterFuture ... done [18:41:57.547] result() for ClusterFuture ... [18:41:57.547] - result already collected: FutureResult [18:41:57.547] result() for ClusterFuture ... done [18:41:57.547] - Number of value chunks collected: 2 [18:41:57.547] Resolving 2 futures (chunks) ... DONE [18:41:57.547] Reducing values from 2 chunks ... [18:41:57.548] - Number of values collected after concatenation: 4 [18:41:57.548] - Number of values expected: 4 [18:41:57.548] Reducing values from 2 chunks ... DONE [18:41:57.548] future_lapply() ... DONE List of 2 $ y0: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" $ y1: num [1:3, 1:5, 1:4] 100 100 100 200 200 200 300 300 300 400 ... ..- attr(*, "dimnames")=List of 3 .. ..$ : NULL .. ..$ : NULL .. ..$ : chr [1:4] "A" "B" "C" "D" [18:41:57.552] future_lapply() ... [18:41:57.554] Number of chunks: 2 [18:41:57.555] getGlobalsAndPackagesXApply() ... [18:41:57.555] - future.globals: TRUE [18:41:57.555] getGlobalsAndPackages() ... [18:41:57.555] Searching for globals... [18:41:57.556] - globals found: [1] 'FUN' [18:41:57.556] Searching for globals ... DONE [18:41:57.556] Resolving globals: FALSE [18:41:57.557] The total size of the 1 globals is 35 bytes (35 bytes) [18:41:57.557] The total size of the 1 globals exported for future expression ('FUN()') is 35 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (35 bytes of class 'function') [18:41:57.557] - globals: [1] 'FUN' [18:41:57.557] [18:41:57.558] getGlobalsAndPackages() ... DONE [18:41:57.558] - globals found/used: [n=1] 'FUN' [18:41:57.558] - needed namespaces: [n=0] [18:41:57.558] Finding globals ... DONE [18:41:57.558] - use_args: TRUE [18:41:57.558] - Getting '...' globals ... [18:41:57.559] resolve() on list ... [18:41:57.559] recursive: 0 [18:41:57.559] length: 1 [18:41:57.559] elements: '...' [18:41:57.559] length: 0 (resolved future 1) [18:41:57.560] resolve() on list ... DONE [18:41:57.560] - '...' content: [n=0] [18:41:57.560] List of 1 [18:41:57.560] $ ...: list() [18:41:57.560] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.560] - attr(*, "where")=List of 1 [18:41:57.560] ..$ ...: [18:41:57.560] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.560] - attr(*, "resolved")= logi TRUE [18:41:57.560] - attr(*, "total_size")= num NA [18:41:57.563] - Getting '...' globals ... DONE [18:41:57.563] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:57.563] List of 2 [18:41:57.563] $ ...future.FUN:function (x) [18:41:57.563] $ ... : list() [18:41:57.563] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.563] - attr(*, "where")=List of 2 [18:41:57.563] ..$ ...future.FUN: [18:41:57.563] ..$ ... : [18:41:57.563] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.563] - attr(*, "resolved")= logi FALSE [18:41:57.563] - attr(*, "total_size")= int 4258 [18:41:57.567] Packages to be attached in all futures: [n=0] [18:41:57.567] getGlobalsAndPackagesXApply() ... DONE [18:41:57.567] Number of futures (= number of chunks): 2 [18:41:57.567] Launching 2 futures (chunks) ... [18:41:57.567] Chunk #1 of 2 ... [18:41:57.568] - Finding globals in 'X' for chunk #1 ... [18:41:57.568] getGlobalsAndPackages() ... [18:41:57.568] Searching for globals... [18:41:57.568] [18:41:57.568] Searching for globals ... DONE [18:41:57.569] - globals: [0] [18:41:57.569] getGlobalsAndPackages() ... DONE [18:41:57.569] + additional globals found: [n=0] [18:41:57.569] + additional namespaces needed: [n=0] [18:41:57.569] - Finding globals in 'X' for chunk #1 ... DONE [18:41:57.569] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.570] - seeds: [18:41:57.570] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.570] getGlobalsAndPackages() ... [18:41:57.570] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.570] Resolving globals: FALSE [18:41:57.570] Tweak future expression to call with '...' arguments ... [18:41:57.571] { [18:41:57.571] do.call(function(...) { [18:41:57.571] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.571] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.571] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.571] on.exit(options(oopts), add = TRUE) [18:41:57.571] } [18:41:57.571] { [18:41:57.571] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.571] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.571] ...future.FUN(...future.X_jj, ...) [18:41:57.571] }) [18:41:57.571] } [18:41:57.571] }, args = future.call.arguments) [18:41:57.571] } [18:41:57.571] Tweak future expression to call with '...' arguments ... DONE [18:41:57.572] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.572] [18:41:57.572] getGlobalsAndPackages() ... DONE [18:41:57.572] run() for 'Future' ... [18:41:57.572] - state: 'created' [18:41:57.573] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.588] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.588] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.588] - Field: 'node' [18:41:57.589] - Field: 'label' [18:41:57.589] - Field: 'local' [18:41:57.589] - Field: 'owner' [18:41:57.589] - Field: 'envir' [18:41:57.589] - Field: 'workers' [18:41:57.589] - Field: 'packages' [18:41:57.590] - Field: 'gc' [18:41:57.590] - Field: 'conditions' [18:41:57.590] - Field: 'persistent' [18:41:57.590] - Field: 'expr' [18:41:57.590] - Field: 'uuid' [18:41:57.590] - Field: 'seed' [18:41:57.591] - Field: 'version' [18:41:57.591] - Field: 'result' [18:41:57.591] - Field: 'asynchronous' [18:41:57.591] - Field: 'calls' [18:41:57.591] - Field: 'globals' [18:41:57.592] - Field: 'stdout' [18:41:57.592] - Field: 'earlySignal' [18:41:57.592] - Field: 'lazy' [18:41:57.592] - Field: 'state' [18:41:57.592] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.592] - Launch lazy future ... [18:41:57.593] Packages needed by the future expression (n = 0): [18:41:57.593] Packages needed by future strategies (n = 0): [18:41:57.593] { [18:41:57.593] { [18:41:57.593] { [18:41:57.593] ...future.startTime <- base::Sys.time() [18:41:57.593] { [18:41:57.593] { [18:41:57.593] { [18:41:57.593] { [18:41:57.593] base::local({ [18:41:57.593] has_future <- base::requireNamespace("future", [18:41:57.593] quietly = TRUE) [18:41:57.593] if (has_future) { [18:41:57.593] ns <- base::getNamespace("future") [18:41:57.593] version <- ns[[".package"]][["version"]] [18:41:57.593] if (is.null(version)) [18:41:57.593] version <- utils::packageVersion("future") [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] version <- NULL [18:41:57.593] } [18:41:57.593] if (!has_future || version < "1.8.0") { [18:41:57.593] info <- base::c(r_version = base::gsub("R version ", [18:41:57.593] "", base::R.version$version.string), [18:41:57.593] platform = base::sprintf("%s (%s-bit)", [18:41:57.593] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.593] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.593] "release", "version")], collapse = " "), [18:41:57.593] hostname = base::Sys.info()[["nodename"]]) [18:41:57.593] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.593] info) [18:41:57.593] info <- base::paste(info, collapse = "; ") [18:41:57.593] if (!has_future) { [18:41:57.593] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.593] info) [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.593] info, version) [18:41:57.593] } [18:41:57.593] base::stop(msg) [18:41:57.593] } [18:41:57.593] }) [18:41:57.593] } [18:41:57.593] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.593] base::options(mc.cores = 1L) [18:41:57.593] } [18:41:57.593] ...future.strategy.old <- future::plan("list") [18:41:57.593] options(future.plan = NULL) [18:41:57.593] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.593] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.593] } [18:41:57.593] ...future.workdir <- getwd() [18:41:57.593] } [18:41:57.593] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.593] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.593] } [18:41:57.593] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.593] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.593] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.593] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.593] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.593] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.593] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.593] base::names(...future.oldOptions)) [18:41:57.593] } [18:41:57.593] if (FALSE) { [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] if (TRUE) { [18:41:57.593] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.593] open = "w") [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.593] windows = "NUL", "/dev/null"), open = "w") [18:41:57.593] } [18:41:57.593] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.593] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.593] base::sink(type = "output", split = FALSE) [18:41:57.593] base::close(...future.stdout) [18:41:57.593] }, add = TRUE) [18:41:57.593] } [18:41:57.593] ...future.frame <- base::sys.nframe() [18:41:57.593] ...future.conditions <- base::list() [18:41:57.593] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.593] if (FALSE) { [18:41:57.593] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.593] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.593] } [18:41:57.593] ...future.result <- base::tryCatch({ [18:41:57.593] base::withCallingHandlers({ [18:41:57.593] ...future.value <- base::withVisible(base::local({ [18:41:57.593] ...future.makeSendCondition <- base::local({ [18:41:57.593] sendCondition <- NULL [18:41:57.593] function(frame = 1L) { [18:41:57.593] if (is.function(sendCondition)) [18:41:57.593] return(sendCondition) [18:41:57.593] ns <- getNamespace("parallel") [18:41:57.593] if (exists("sendData", mode = "function", [18:41:57.593] envir = ns)) { [18:41:57.593] parallel_sendData <- get("sendData", mode = "function", [18:41:57.593] envir = ns) [18:41:57.593] envir <- sys.frame(frame) [18:41:57.593] master <- NULL [18:41:57.593] while (!identical(envir, .GlobalEnv) && [18:41:57.593] !identical(envir, emptyenv())) { [18:41:57.593] if (exists("master", mode = "list", envir = envir, [18:41:57.593] inherits = FALSE)) { [18:41:57.593] master <- get("master", mode = "list", [18:41:57.593] envir = envir, inherits = FALSE) [18:41:57.593] if (inherits(master, c("SOCKnode", [18:41:57.593] "SOCK0node"))) { [18:41:57.593] sendCondition <<- function(cond) { [18:41:57.593] data <- list(type = "VALUE", value = cond, [18:41:57.593] success = TRUE) [18:41:57.593] parallel_sendData(master, data) [18:41:57.593] } [18:41:57.593] return(sendCondition) [18:41:57.593] } [18:41:57.593] } [18:41:57.593] frame <- frame + 1L [18:41:57.593] envir <- sys.frame(frame) [18:41:57.593] } [18:41:57.593] } [18:41:57.593] sendCondition <<- function(cond) NULL [18:41:57.593] } [18:41:57.593] }) [18:41:57.593] withCallingHandlers({ [18:41:57.593] { [18:41:57.593] do.call(function(...) { [18:41:57.593] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.593] if (!identical(...future.globals.maxSize.org, [18:41:57.593] ...future.globals.maxSize)) { [18:41:57.593] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.593] on.exit(options(oopts), add = TRUE) [18:41:57.593] } [18:41:57.593] { [18:41:57.593] lapply(seq_along(...future.elements_ii), [18:41:57.593] FUN = function(jj) { [18:41:57.593] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.593] ...future.FUN(...future.X_jj, ...) [18:41:57.593] }) [18:41:57.593] } [18:41:57.593] }, args = future.call.arguments) [18:41:57.593] } [18:41:57.593] }, immediateCondition = function(cond) { [18:41:57.593] sendCondition <- ...future.makeSendCondition() [18:41:57.593] sendCondition(cond) [18:41:57.593] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.593] { [18:41:57.593] inherits <- base::inherits [18:41:57.593] invokeRestart <- base::invokeRestart [18:41:57.593] is.null <- base::is.null [18:41:57.593] muffled <- FALSE [18:41:57.593] if (inherits(cond, "message")) { [18:41:57.593] muffled <- grepl(pattern, "muffleMessage") [18:41:57.593] if (muffled) [18:41:57.593] invokeRestart("muffleMessage") [18:41:57.593] } [18:41:57.593] else if (inherits(cond, "warning")) { [18:41:57.593] muffled <- grepl(pattern, "muffleWarning") [18:41:57.593] if (muffled) [18:41:57.593] invokeRestart("muffleWarning") [18:41:57.593] } [18:41:57.593] else if (inherits(cond, "condition")) { [18:41:57.593] if (!is.null(pattern)) { [18:41:57.593] computeRestarts <- base::computeRestarts [18:41:57.593] grepl <- base::grepl [18:41:57.593] restarts <- computeRestarts(cond) [18:41:57.593] for (restart in restarts) { [18:41:57.593] name <- restart$name [18:41:57.593] if (is.null(name)) [18:41:57.593] next [18:41:57.593] if (!grepl(pattern, name)) [18:41:57.593] next [18:41:57.593] invokeRestart(restart) [18:41:57.593] muffled <- TRUE [18:41:57.593] break [18:41:57.593] } [18:41:57.593] } [18:41:57.593] } [18:41:57.593] invisible(muffled) [18:41:57.593] } [18:41:57.593] muffleCondition(cond) [18:41:57.593] }) [18:41:57.593] })) [18:41:57.593] future::FutureResult(value = ...future.value$value, [18:41:57.593] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.593] ...future.rng), globalenv = if (FALSE) [18:41:57.593] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.593] ...future.globalenv.names)) [18:41:57.593] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.593] }, condition = base::local({ [18:41:57.593] c <- base::c [18:41:57.593] inherits <- base::inherits [18:41:57.593] invokeRestart <- base::invokeRestart [18:41:57.593] length <- base::length [18:41:57.593] list <- base::list [18:41:57.593] seq.int <- base::seq.int [18:41:57.593] signalCondition <- base::signalCondition [18:41:57.593] sys.calls <- base::sys.calls [18:41:57.593] `[[` <- base::`[[` [18:41:57.593] `+` <- base::`+` [18:41:57.593] `<<-` <- base::`<<-` [18:41:57.593] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.593] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.593] 3L)] [18:41:57.593] } [18:41:57.593] function(cond) { [18:41:57.593] is_error <- inherits(cond, "error") [18:41:57.593] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.593] NULL) [18:41:57.593] if (is_error) { [18:41:57.593] sessionInformation <- function() { [18:41:57.593] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.593] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.593] search = base::search(), system = base::Sys.info()) [18:41:57.593] } [18:41:57.593] ...future.conditions[[length(...future.conditions) + [18:41:57.593] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.593] cond$call), session = sessionInformation(), [18:41:57.593] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.593] signalCondition(cond) [18:41:57.593] } [18:41:57.593] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.593] "immediateCondition"))) { [18:41:57.593] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.593] ...future.conditions[[length(...future.conditions) + [18:41:57.593] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.593] if (TRUE && !signal) { [18:41:57.593] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.593] { [18:41:57.593] inherits <- base::inherits [18:41:57.593] invokeRestart <- base::invokeRestart [18:41:57.593] is.null <- base::is.null [18:41:57.593] muffled <- FALSE [18:41:57.593] if (inherits(cond, "message")) { [18:41:57.593] muffled <- grepl(pattern, "muffleMessage") [18:41:57.593] if (muffled) [18:41:57.593] invokeRestart("muffleMessage") [18:41:57.593] } [18:41:57.593] else if (inherits(cond, "warning")) { [18:41:57.593] muffled <- grepl(pattern, "muffleWarning") [18:41:57.593] if (muffled) [18:41:57.593] invokeRestart("muffleWarning") [18:41:57.593] } [18:41:57.593] else if (inherits(cond, "condition")) { [18:41:57.593] if (!is.null(pattern)) { [18:41:57.593] computeRestarts <- base::computeRestarts [18:41:57.593] grepl <- base::grepl [18:41:57.593] restarts <- computeRestarts(cond) [18:41:57.593] for (restart in restarts) { [18:41:57.593] name <- restart$name [18:41:57.593] if (is.null(name)) [18:41:57.593] next [18:41:57.593] if (!grepl(pattern, name)) [18:41:57.593] next [18:41:57.593] invokeRestart(restart) [18:41:57.593] muffled <- TRUE [18:41:57.593] break [18:41:57.593] } [18:41:57.593] } [18:41:57.593] } [18:41:57.593] invisible(muffled) [18:41:57.593] } [18:41:57.593] muffleCondition(cond, pattern = "^muffle") [18:41:57.593] } [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] if (TRUE) { [18:41:57.593] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.593] { [18:41:57.593] inherits <- base::inherits [18:41:57.593] invokeRestart <- base::invokeRestart [18:41:57.593] is.null <- base::is.null [18:41:57.593] muffled <- FALSE [18:41:57.593] if (inherits(cond, "message")) { [18:41:57.593] muffled <- grepl(pattern, "muffleMessage") [18:41:57.593] if (muffled) [18:41:57.593] invokeRestart("muffleMessage") [18:41:57.593] } [18:41:57.593] else if (inherits(cond, "warning")) { [18:41:57.593] muffled <- grepl(pattern, "muffleWarning") [18:41:57.593] if (muffled) [18:41:57.593] invokeRestart("muffleWarning") [18:41:57.593] } [18:41:57.593] else if (inherits(cond, "condition")) { [18:41:57.593] if (!is.null(pattern)) { [18:41:57.593] computeRestarts <- base::computeRestarts [18:41:57.593] grepl <- base::grepl [18:41:57.593] restarts <- computeRestarts(cond) [18:41:57.593] for (restart in restarts) { [18:41:57.593] name <- restart$name [18:41:57.593] if (is.null(name)) [18:41:57.593] next [18:41:57.593] if (!grepl(pattern, name)) [18:41:57.593] next [18:41:57.593] invokeRestart(restart) [18:41:57.593] muffled <- TRUE [18:41:57.593] break [18:41:57.593] } [18:41:57.593] } [18:41:57.593] } [18:41:57.593] invisible(muffled) [18:41:57.593] } [18:41:57.593] muffleCondition(cond, pattern = "^muffle") [18:41:57.593] } [18:41:57.593] } [18:41:57.593] } [18:41:57.593] })) [18:41:57.593] }, error = function(ex) { [18:41:57.593] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.593] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.593] ...future.rng), started = ...future.startTime, [18:41:57.593] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.593] version = "1.8"), class = "FutureResult") [18:41:57.593] }, finally = { [18:41:57.593] if (!identical(...future.workdir, getwd())) [18:41:57.593] setwd(...future.workdir) [18:41:57.593] { [18:41:57.593] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.593] ...future.oldOptions$nwarnings <- NULL [18:41:57.593] } [18:41:57.593] base::options(...future.oldOptions) [18:41:57.593] if (.Platform$OS.type == "windows") { [18:41:57.593] old_names <- names(...future.oldEnvVars) [18:41:57.593] envs <- base::Sys.getenv() [18:41:57.593] names <- names(envs) [18:41:57.593] common <- intersect(names, old_names) [18:41:57.593] added <- setdiff(names, old_names) [18:41:57.593] removed <- setdiff(old_names, names) [18:41:57.593] changed <- common[...future.oldEnvVars[common] != [18:41:57.593] envs[common]] [18:41:57.593] NAMES <- toupper(changed) [18:41:57.593] args <- list() [18:41:57.593] for (kk in seq_along(NAMES)) { [18:41:57.593] name <- changed[[kk]] [18:41:57.593] NAME <- NAMES[[kk]] [18:41:57.593] if (name != NAME && is.element(NAME, old_names)) [18:41:57.593] next [18:41:57.593] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.593] } [18:41:57.593] NAMES <- toupper(added) [18:41:57.593] for (kk in seq_along(NAMES)) { [18:41:57.593] name <- added[[kk]] [18:41:57.593] NAME <- NAMES[[kk]] [18:41:57.593] if (name != NAME && is.element(NAME, old_names)) [18:41:57.593] next [18:41:57.593] args[[name]] <- "" [18:41:57.593] } [18:41:57.593] NAMES <- toupper(removed) [18:41:57.593] for (kk in seq_along(NAMES)) { [18:41:57.593] name <- removed[[kk]] [18:41:57.593] NAME <- NAMES[[kk]] [18:41:57.593] if (name != NAME && is.element(NAME, old_names)) [18:41:57.593] next [18:41:57.593] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.593] } [18:41:57.593] if (length(args) > 0) [18:41:57.593] base::do.call(base::Sys.setenv, args = args) [18:41:57.593] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.593] } [18:41:57.593] { [18:41:57.593] if (base::length(...future.futureOptionsAdded) > [18:41:57.593] 0L) { [18:41:57.593] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.593] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.593] base::options(opts) [18:41:57.593] } [18:41:57.593] { [18:41:57.593] { [18:41:57.593] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.593] NULL [18:41:57.593] } [18:41:57.593] options(future.plan = NULL) [18:41:57.593] if (is.na(NA_character_)) [18:41:57.593] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.593] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.593] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.593] .init = FALSE) [18:41:57.593] } [18:41:57.593] } [18:41:57.593] } [18:41:57.593] }) [18:41:57.593] if (TRUE) { [18:41:57.593] base::sink(type = "output", split = FALSE) [18:41:57.593] if (TRUE) { [18:41:57.593] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.593] } [18:41:57.593] else { [18:41:57.593] ...future.result["stdout"] <- base::list(NULL) [18:41:57.593] } [18:41:57.593] base::close(...future.stdout) [18:41:57.593] ...future.stdout <- NULL [18:41:57.593] } [18:41:57.593] ...future.result$conditions <- ...future.conditions [18:41:57.593] ...future.result$finished <- base::Sys.time() [18:41:57.593] ...future.result [18:41:57.593] } [18:41:57.599] Exporting 5 global objects (705 bytes) to cluster node #1 ... [18:41:57.599] Exporting '...future.FUN' (35 bytes) to cluster node #1 ... [18:41:57.600] Exporting '...future.FUN' (35 bytes) to cluster node #1 ... DONE [18:41:57.600] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.600] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.600] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:41:57.601] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:41:57.601] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.601] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.602] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.602] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.602] Exporting 5 global objects (705 bytes) to cluster node #1 ... DONE [18:41:57.603] MultisessionFuture started [18:41:57.603] - Launch lazy future ... done [18:41:57.603] run() for 'MultisessionFuture' ... done [18:41:57.603] Created future: [18:41:57.617] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.618] - Validating connection of MultisessionFuture [18:41:57.618] - received message: FutureResult [18:41:57.618] - Received FutureResult [18:41:57.618] - Erased future from FutureRegistry [18:41:57.619] result() for ClusterFuture ... [18:41:57.619] - result already collected: FutureResult [18:41:57.619] result() for ClusterFuture ... done [18:41:57.619] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.604] MultisessionFuture: [18:41:57.604] Label: 'future_sapply-1' [18:41:57.604] Expression: [18:41:57.604] { [18:41:57.604] do.call(function(...) { [18:41:57.604] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.604] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.604] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.604] on.exit(options(oopts), add = TRUE) [18:41:57.604] } [18:41:57.604] { [18:41:57.604] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.604] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.604] ...future.FUN(...future.X_jj, ...) [18:41:57.604] }) [18:41:57.604] } [18:41:57.604] }, args = future.call.arguments) [18:41:57.604] } [18:41:57.604] Lazy evaluation: FALSE [18:41:57.604] Asynchronous evaluation: TRUE [18:41:57.604] Local evaluation: TRUE [18:41:57.604] Environment: R_GlobalEnv [18:41:57.604] Capture standard output: TRUE [18:41:57.604] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.604] Globals: 5 objects totaling 229 bytes (function '...future.FUN' of 35 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:41:57.604] Packages: [18:41:57.604] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.604] Resolved: TRUE [18:41:57.604] Value: [18:41:57.604] Conditions captured: [18:41:57.604] Early signaling: FALSE [18:41:57.604] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.604] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.620] Chunk #1 of 2 ... DONE [18:41:57.620] Chunk #2 of 2 ... [18:41:57.620] - Finding globals in 'X' for chunk #2 ... [18:41:57.620] getGlobalsAndPackages() ... [18:41:57.620] Searching for globals... [18:41:57.621] [18:41:57.621] Searching for globals ... DONE [18:41:57.621] - globals: [0] [18:41:57.621] getGlobalsAndPackages() ... DONE [18:41:57.621] + additional globals found: [n=0] [18:41:57.621] + additional namespaces needed: [n=0] [18:41:57.622] - Finding globals in 'X' for chunk #2 ... DONE [18:41:57.622] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.622] - seeds: [18:41:57.622] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.622] getGlobalsAndPackages() ... [18:41:57.622] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.623] Resolving globals: FALSE [18:41:57.623] Tweak future expression to call with '...' arguments ... [18:41:57.623] { [18:41:57.623] do.call(function(...) { [18:41:57.623] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.623] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.623] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.623] on.exit(options(oopts), add = TRUE) [18:41:57.623] } [18:41:57.623] { [18:41:57.623] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.623] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.623] ...future.FUN(...future.X_jj, ...) [18:41:57.623] }) [18:41:57.623] } [18:41:57.623] }, args = future.call.arguments) [18:41:57.623] } [18:41:57.623] Tweak future expression to call with '...' arguments ... DONE [18:41:57.624] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.624] [18:41:57.624] getGlobalsAndPackages() ... DONE [18:41:57.624] run() for 'Future' ... [18:41:57.625] - state: 'created' [18:41:57.625] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.640] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.640] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.640] - Field: 'node' [18:41:57.640] - Field: 'label' [18:41:57.641] - Field: 'local' [18:41:57.641] - Field: 'owner' [18:41:57.641] - Field: 'envir' [18:41:57.641] - Field: 'workers' [18:41:57.641] - Field: 'packages' [18:41:57.641] - Field: 'gc' [18:41:57.642] - Field: 'conditions' [18:41:57.642] - Field: 'persistent' [18:41:57.642] - Field: 'expr' [18:41:57.642] - Field: 'uuid' [18:41:57.642] - Field: 'seed' [18:41:57.642] - Field: 'version' [18:41:57.643] - Field: 'result' [18:41:57.643] - Field: 'asynchronous' [18:41:57.643] - Field: 'calls' [18:41:57.643] - Field: 'globals' [18:41:57.643] - Field: 'stdout' [18:41:57.644] - Field: 'earlySignal' [18:41:57.644] - Field: 'lazy' [18:41:57.644] - Field: 'state' [18:41:57.644] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.644] - Launch lazy future ... [18:41:57.645] Packages needed by the future expression (n = 0): [18:41:57.645] Packages needed by future strategies (n = 0): [18:41:57.645] { [18:41:57.645] { [18:41:57.645] { [18:41:57.645] ...future.startTime <- base::Sys.time() [18:41:57.645] { [18:41:57.645] { [18:41:57.645] { [18:41:57.645] { [18:41:57.645] base::local({ [18:41:57.645] has_future <- base::requireNamespace("future", [18:41:57.645] quietly = TRUE) [18:41:57.645] if (has_future) { [18:41:57.645] ns <- base::getNamespace("future") [18:41:57.645] version <- ns[[".package"]][["version"]] [18:41:57.645] if (is.null(version)) [18:41:57.645] version <- utils::packageVersion("future") [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] version <- NULL [18:41:57.645] } [18:41:57.645] if (!has_future || version < "1.8.0") { [18:41:57.645] info <- base::c(r_version = base::gsub("R version ", [18:41:57.645] "", base::R.version$version.string), [18:41:57.645] platform = base::sprintf("%s (%s-bit)", [18:41:57.645] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.645] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.645] "release", "version")], collapse = " "), [18:41:57.645] hostname = base::Sys.info()[["nodename"]]) [18:41:57.645] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.645] info) [18:41:57.645] info <- base::paste(info, collapse = "; ") [18:41:57.645] if (!has_future) { [18:41:57.645] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.645] info) [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.645] info, version) [18:41:57.645] } [18:41:57.645] base::stop(msg) [18:41:57.645] } [18:41:57.645] }) [18:41:57.645] } [18:41:57.645] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.645] base::options(mc.cores = 1L) [18:41:57.645] } [18:41:57.645] ...future.strategy.old <- future::plan("list") [18:41:57.645] options(future.plan = NULL) [18:41:57.645] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.645] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.645] } [18:41:57.645] ...future.workdir <- getwd() [18:41:57.645] } [18:41:57.645] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.645] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.645] } [18:41:57.645] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.645] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.645] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.645] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.645] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.645] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.645] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.645] base::names(...future.oldOptions)) [18:41:57.645] } [18:41:57.645] if (FALSE) { [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] if (TRUE) { [18:41:57.645] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.645] open = "w") [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.645] windows = "NUL", "/dev/null"), open = "w") [18:41:57.645] } [18:41:57.645] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.645] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.645] base::sink(type = "output", split = FALSE) [18:41:57.645] base::close(...future.stdout) [18:41:57.645] }, add = TRUE) [18:41:57.645] } [18:41:57.645] ...future.frame <- base::sys.nframe() [18:41:57.645] ...future.conditions <- base::list() [18:41:57.645] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.645] if (FALSE) { [18:41:57.645] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.645] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.645] } [18:41:57.645] ...future.result <- base::tryCatch({ [18:41:57.645] base::withCallingHandlers({ [18:41:57.645] ...future.value <- base::withVisible(base::local({ [18:41:57.645] ...future.makeSendCondition <- base::local({ [18:41:57.645] sendCondition <- NULL [18:41:57.645] function(frame = 1L) { [18:41:57.645] if (is.function(sendCondition)) [18:41:57.645] return(sendCondition) [18:41:57.645] ns <- getNamespace("parallel") [18:41:57.645] if (exists("sendData", mode = "function", [18:41:57.645] envir = ns)) { [18:41:57.645] parallel_sendData <- get("sendData", mode = "function", [18:41:57.645] envir = ns) [18:41:57.645] envir <- sys.frame(frame) [18:41:57.645] master <- NULL [18:41:57.645] while (!identical(envir, .GlobalEnv) && [18:41:57.645] !identical(envir, emptyenv())) { [18:41:57.645] if (exists("master", mode = "list", envir = envir, [18:41:57.645] inherits = FALSE)) { [18:41:57.645] master <- get("master", mode = "list", [18:41:57.645] envir = envir, inherits = FALSE) [18:41:57.645] if (inherits(master, c("SOCKnode", [18:41:57.645] "SOCK0node"))) { [18:41:57.645] sendCondition <<- function(cond) { [18:41:57.645] data <- list(type = "VALUE", value = cond, [18:41:57.645] success = TRUE) [18:41:57.645] parallel_sendData(master, data) [18:41:57.645] } [18:41:57.645] return(sendCondition) [18:41:57.645] } [18:41:57.645] } [18:41:57.645] frame <- frame + 1L [18:41:57.645] envir <- sys.frame(frame) [18:41:57.645] } [18:41:57.645] } [18:41:57.645] sendCondition <<- function(cond) NULL [18:41:57.645] } [18:41:57.645] }) [18:41:57.645] withCallingHandlers({ [18:41:57.645] { [18:41:57.645] do.call(function(...) { [18:41:57.645] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.645] if (!identical(...future.globals.maxSize.org, [18:41:57.645] ...future.globals.maxSize)) { [18:41:57.645] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.645] on.exit(options(oopts), add = TRUE) [18:41:57.645] } [18:41:57.645] { [18:41:57.645] lapply(seq_along(...future.elements_ii), [18:41:57.645] FUN = function(jj) { [18:41:57.645] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.645] ...future.FUN(...future.X_jj, ...) [18:41:57.645] }) [18:41:57.645] } [18:41:57.645] }, args = future.call.arguments) [18:41:57.645] } [18:41:57.645] }, immediateCondition = function(cond) { [18:41:57.645] sendCondition <- ...future.makeSendCondition() [18:41:57.645] sendCondition(cond) [18:41:57.645] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.645] { [18:41:57.645] inherits <- base::inherits [18:41:57.645] invokeRestart <- base::invokeRestart [18:41:57.645] is.null <- base::is.null [18:41:57.645] muffled <- FALSE [18:41:57.645] if (inherits(cond, "message")) { [18:41:57.645] muffled <- grepl(pattern, "muffleMessage") [18:41:57.645] if (muffled) [18:41:57.645] invokeRestart("muffleMessage") [18:41:57.645] } [18:41:57.645] else if (inherits(cond, "warning")) { [18:41:57.645] muffled <- grepl(pattern, "muffleWarning") [18:41:57.645] if (muffled) [18:41:57.645] invokeRestart("muffleWarning") [18:41:57.645] } [18:41:57.645] else if (inherits(cond, "condition")) { [18:41:57.645] if (!is.null(pattern)) { [18:41:57.645] computeRestarts <- base::computeRestarts [18:41:57.645] grepl <- base::grepl [18:41:57.645] restarts <- computeRestarts(cond) [18:41:57.645] for (restart in restarts) { [18:41:57.645] name <- restart$name [18:41:57.645] if (is.null(name)) [18:41:57.645] next [18:41:57.645] if (!grepl(pattern, name)) [18:41:57.645] next [18:41:57.645] invokeRestart(restart) [18:41:57.645] muffled <- TRUE [18:41:57.645] break [18:41:57.645] } [18:41:57.645] } [18:41:57.645] } [18:41:57.645] invisible(muffled) [18:41:57.645] } [18:41:57.645] muffleCondition(cond) [18:41:57.645] }) [18:41:57.645] })) [18:41:57.645] future::FutureResult(value = ...future.value$value, [18:41:57.645] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.645] ...future.rng), globalenv = if (FALSE) [18:41:57.645] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.645] ...future.globalenv.names)) [18:41:57.645] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.645] }, condition = base::local({ [18:41:57.645] c <- base::c [18:41:57.645] inherits <- base::inherits [18:41:57.645] invokeRestart <- base::invokeRestart [18:41:57.645] length <- base::length [18:41:57.645] list <- base::list [18:41:57.645] seq.int <- base::seq.int [18:41:57.645] signalCondition <- base::signalCondition [18:41:57.645] sys.calls <- base::sys.calls [18:41:57.645] `[[` <- base::`[[` [18:41:57.645] `+` <- base::`+` [18:41:57.645] `<<-` <- base::`<<-` [18:41:57.645] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.645] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.645] 3L)] [18:41:57.645] } [18:41:57.645] function(cond) { [18:41:57.645] is_error <- inherits(cond, "error") [18:41:57.645] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.645] NULL) [18:41:57.645] if (is_error) { [18:41:57.645] sessionInformation <- function() { [18:41:57.645] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.645] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.645] search = base::search(), system = base::Sys.info()) [18:41:57.645] } [18:41:57.645] ...future.conditions[[length(...future.conditions) + [18:41:57.645] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.645] cond$call), session = sessionInformation(), [18:41:57.645] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.645] signalCondition(cond) [18:41:57.645] } [18:41:57.645] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.645] "immediateCondition"))) { [18:41:57.645] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.645] ...future.conditions[[length(...future.conditions) + [18:41:57.645] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.645] if (TRUE && !signal) { [18:41:57.645] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.645] { [18:41:57.645] inherits <- base::inherits [18:41:57.645] invokeRestart <- base::invokeRestart [18:41:57.645] is.null <- base::is.null [18:41:57.645] muffled <- FALSE [18:41:57.645] if (inherits(cond, "message")) { [18:41:57.645] muffled <- grepl(pattern, "muffleMessage") [18:41:57.645] if (muffled) [18:41:57.645] invokeRestart("muffleMessage") [18:41:57.645] } [18:41:57.645] else if (inherits(cond, "warning")) { [18:41:57.645] muffled <- grepl(pattern, "muffleWarning") [18:41:57.645] if (muffled) [18:41:57.645] invokeRestart("muffleWarning") [18:41:57.645] } [18:41:57.645] else if (inherits(cond, "condition")) { [18:41:57.645] if (!is.null(pattern)) { [18:41:57.645] computeRestarts <- base::computeRestarts [18:41:57.645] grepl <- base::grepl [18:41:57.645] restarts <- computeRestarts(cond) [18:41:57.645] for (restart in restarts) { [18:41:57.645] name <- restart$name [18:41:57.645] if (is.null(name)) [18:41:57.645] next [18:41:57.645] if (!grepl(pattern, name)) [18:41:57.645] next [18:41:57.645] invokeRestart(restart) [18:41:57.645] muffled <- TRUE [18:41:57.645] break [18:41:57.645] } [18:41:57.645] } [18:41:57.645] } [18:41:57.645] invisible(muffled) [18:41:57.645] } [18:41:57.645] muffleCondition(cond, pattern = "^muffle") [18:41:57.645] } [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] if (TRUE) { [18:41:57.645] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.645] { [18:41:57.645] inherits <- base::inherits [18:41:57.645] invokeRestart <- base::invokeRestart [18:41:57.645] is.null <- base::is.null [18:41:57.645] muffled <- FALSE [18:41:57.645] if (inherits(cond, "message")) { [18:41:57.645] muffled <- grepl(pattern, "muffleMessage") [18:41:57.645] if (muffled) [18:41:57.645] invokeRestart("muffleMessage") [18:41:57.645] } [18:41:57.645] else if (inherits(cond, "warning")) { [18:41:57.645] muffled <- grepl(pattern, "muffleWarning") [18:41:57.645] if (muffled) [18:41:57.645] invokeRestart("muffleWarning") [18:41:57.645] } [18:41:57.645] else if (inherits(cond, "condition")) { [18:41:57.645] if (!is.null(pattern)) { [18:41:57.645] computeRestarts <- base::computeRestarts [18:41:57.645] grepl <- base::grepl [18:41:57.645] restarts <- computeRestarts(cond) [18:41:57.645] for (restart in restarts) { [18:41:57.645] name <- restart$name [18:41:57.645] if (is.null(name)) [18:41:57.645] next [18:41:57.645] if (!grepl(pattern, name)) [18:41:57.645] next [18:41:57.645] invokeRestart(restart) [18:41:57.645] muffled <- TRUE [18:41:57.645] break [18:41:57.645] } [18:41:57.645] } [18:41:57.645] } [18:41:57.645] invisible(muffled) [18:41:57.645] } [18:41:57.645] muffleCondition(cond, pattern = "^muffle") [18:41:57.645] } [18:41:57.645] } [18:41:57.645] } [18:41:57.645] })) [18:41:57.645] }, error = function(ex) { [18:41:57.645] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.645] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.645] ...future.rng), started = ...future.startTime, [18:41:57.645] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.645] version = "1.8"), class = "FutureResult") [18:41:57.645] }, finally = { [18:41:57.645] if (!identical(...future.workdir, getwd())) [18:41:57.645] setwd(...future.workdir) [18:41:57.645] { [18:41:57.645] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.645] ...future.oldOptions$nwarnings <- NULL [18:41:57.645] } [18:41:57.645] base::options(...future.oldOptions) [18:41:57.645] if (.Platform$OS.type == "windows") { [18:41:57.645] old_names <- names(...future.oldEnvVars) [18:41:57.645] envs <- base::Sys.getenv() [18:41:57.645] names <- names(envs) [18:41:57.645] common <- intersect(names, old_names) [18:41:57.645] added <- setdiff(names, old_names) [18:41:57.645] removed <- setdiff(old_names, names) [18:41:57.645] changed <- common[...future.oldEnvVars[common] != [18:41:57.645] envs[common]] [18:41:57.645] NAMES <- toupper(changed) [18:41:57.645] args <- list() [18:41:57.645] for (kk in seq_along(NAMES)) { [18:41:57.645] name <- changed[[kk]] [18:41:57.645] NAME <- NAMES[[kk]] [18:41:57.645] if (name != NAME && is.element(NAME, old_names)) [18:41:57.645] next [18:41:57.645] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.645] } [18:41:57.645] NAMES <- toupper(added) [18:41:57.645] for (kk in seq_along(NAMES)) { [18:41:57.645] name <- added[[kk]] [18:41:57.645] NAME <- NAMES[[kk]] [18:41:57.645] if (name != NAME && is.element(NAME, old_names)) [18:41:57.645] next [18:41:57.645] args[[name]] <- "" [18:41:57.645] } [18:41:57.645] NAMES <- toupper(removed) [18:41:57.645] for (kk in seq_along(NAMES)) { [18:41:57.645] name <- removed[[kk]] [18:41:57.645] NAME <- NAMES[[kk]] [18:41:57.645] if (name != NAME && is.element(NAME, old_names)) [18:41:57.645] next [18:41:57.645] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.645] } [18:41:57.645] if (length(args) > 0) [18:41:57.645] base::do.call(base::Sys.setenv, args = args) [18:41:57.645] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.645] } [18:41:57.645] { [18:41:57.645] if (base::length(...future.futureOptionsAdded) > [18:41:57.645] 0L) { [18:41:57.645] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.645] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.645] base::options(opts) [18:41:57.645] } [18:41:57.645] { [18:41:57.645] { [18:41:57.645] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.645] NULL [18:41:57.645] } [18:41:57.645] options(future.plan = NULL) [18:41:57.645] if (is.na(NA_character_)) [18:41:57.645] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.645] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.645] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.645] .init = FALSE) [18:41:57.645] } [18:41:57.645] } [18:41:57.645] } [18:41:57.645] }) [18:41:57.645] if (TRUE) { [18:41:57.645] base::sink(type = "output", split = FALSE) [18:41:57.645] if (TRUE) { [18:41:57.645] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.645] } [18:41:57.645] else { [18:41:57.645] ...future.result["stdout"] <- base::list(NULL) [18:41:57.645] } [18:41:57.645] base::close(...future.stdout) [18:41:57.645] ...future.stdout <- NULL [18:41:57.645] } [18:41:57.645] ...future.result$conditions <- ...future.conditions [18:41:57.645] ...future.result$finished <- base::Sys.time() [18:41:57.645] ...future.result [18:41:57.645] } [18:41:57.651] Exporting 5 global objects (717 bytes) to cluster node #1 ... [18:41:57.651] Exporting '...future.FUN' (35 bytes) to cluster node #1 ... [18:41:57.651] Exporting '...future.FUN' (35 bytes) to cluster node #1 ... DONE [18:41:57.651] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:57.652] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:57.652] Exporting '...future.elements_ii' (55 bytes) to cluster node #1 ... [18:41:57.652] Exporting '...future.elements_ii' (55 bytes) to cluster node #1 ... DONE [18:41:57.653] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.653] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.653] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.654] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.654] Exporting 5 global objects (717 bytes) to cluster node #1 ... DONE [18:41:57.654] MultisessionFuture started [18:41:57.655] - Launch lazy future ... done [18:41:57.655] run() for 'MultisessionFuture' ... done [18:41:57.655] Created future: [18:41:57.673] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.673] - Validating connection of MultisessionFuture [18:41:57.673] - received message: FutureResult [18:41:57.673] - Received FutureResult [18:41:57.674] - Erased future from FutureRegistry [18:41:57.674] result() for ClusterFuture ... [18:41:57.674] - result already collected: FutureResult [18:41:57.674] result() for ClusterFuture ... done [18:41:57.674] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.655] MultisessionFuture: [18:41:57.655] Label: 'future_sapply-2' [18:41:57.655] Expression: [18:41:57.655] { [18:41:57.655] do.call(function(...) { [18:41:57.655] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.655] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.655] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.655] on.exit(options(oopts), add = TRUE) [18:41:57.655] } [18:41:57.655] { [18:41:57.655] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.655] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.655] ...future.FUN(...future.X_jj, ...) [18:41:57.655] }) [18:41:57.655] } [18:41:57.655] }, args = future.call.arguments) [18:41:57.655] } [18:41:57.655] Lazy evaluation: FALSE [18:41:57.655] Asynchronous evaluation: TRUE [18:41:57.655] Local evaluation: TRUE [18:41:57.655] Environment: R_GlobalEnv [18:41:57.655] Capture standard output: TRUE [18:41:57.655] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.655] Globals: 5 objects totaling 241 bytes (function '...future.FUN' of 35 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:41:57.655] Packages: [18:41:57.655] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.655] Resolved: TRUE [18:41:57.655] Value: [18:41:57.655] Conditions captured: [18:41:57.655] Early signaling: FALSE [18:41:57.655] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.655] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.675] Chunk #2 of 2 ... DONE [18:41:57.675] Launching 2 futures (chunks) ... DONE [18:41:57.675] Resolving 2 futures (chunks) ... [18:41:57.675] resolve() on list ... [18:41:57.676] recursive: 0 [18:41:57.676] length: 2 [18:41:57.676] [18:41:57.676] Future #1 [18:41:57.676] result() for ClusterFuture ... [18:41:57.676] - result already collected: FutureResult [18:41:57.677] result() for ClusterFuture ... done [18:41:57.677] result() for ClusterFuture ... [18:41:57.677] - result already collected: FutureResult [18:41:57.677] result() for ClusterFuture ... done [18:41:57.677] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:57.677] - nx: 2 [18:41:57.678] - relay: TRUE [18:41:57.678] - stdout: TRUE [18:41:57.678] - signal: TRUE [18:41:57.678] - resignal: FALSE [18:41:57.678] - force: TRUE [18:41:57.678] - relayed: [n=2] FALSE, FALSE [18:41:57.679] - queued futures: [n=2] FALSE, FALSE [18:41:57.679] - until=1 [18:41:57.679] - relaying element #1 [18:41:57.679] result() for ClusterFuture ... [18:41:57.679] - result already collected: FutureResult [18:41:57.679] result() for ClusterFuture ... done [18:41:57.680] result() for ClusterFuture ... [18:41:57.680] - result already collected: FutureResult [18:41:57.680] result() for ClusterFuture ... done [18:41:57.680] result() for ClusterFuture ... [18:41:57.680] - result already collected: FutureResult [18:41:57.680] result() for ClusterFuture ... done [18:41:57.681] result() for ClusterFuture ... [18:41:57.681] - result already collected: FutureResult [18:41:57.681] result() for ClusterFuture ... done [18:41:57.681] - relayed: [n=2] TRUE, FALSE [18:41:57.681] - queued futures: [n=2] TRUE, FALSE [18:41:57.681] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:57.682] length: 1 (resolved future 1) [18:41:57.682] Future #2 [18:41:57.682] result() for ClusterFuture ... [18:41:57.682] - result already collected: FutureResult [18:41:57.682] result() for ClusterFuture ... done [18:41:57.683] result() for ClusterFuture ... [18:41:57.683] - result already collected: FutureResult [18:41:57.683] result() for ClusterFuture ... done [18:41:57.683] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:57.683] - nx: 2 [18:41:57.683] - relay: TRUE [18:41:57.684] - stdout: TRUE [18:41:57.684] - signal: TRUE [18:41:57.684] - resignal: FALSE [18:41:57.684] - force: TRUE [18:41:57.684] - relayed: [n=2] TRUE, FALSE [18:41:57.684] - queued futures: [n=2] TRUE, FALSE [18:41:57.684] - until=2 [18:41:57.685] - relaying element #2 [18:41:57.685] result() for ClusterFuture ... [18:41:57.685] - result already collected: FutureResult [18:41:57.685] result() for ClusterFuture ... done [18:41:57.685] result() for ClusterFuture ... [18:41:57.685] - result already collected: FutureResult [18:41:57.686] result() for ClusterFuture ... done [18:41:57.686] result() for ClusterFuture ... [18:41:57.686] - result already collected: FutureResult [18:41:57.686] result() for ClusterFuture ... done [18:41:57.686] result() for ClusterFuture ... [18:41:57.687] - result already collected: FutureResult [18:41:57.687] result() for ClusterFuture ... done [18:41:57.687] - relayed: [n=2] TRUE, TRUE [18:41:57.690] - queued futures: [n=2] TRUE, TRUE [18:41:57.691] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:57.691] length: 0 (resolved future 2) [18:41:57.691] Relaying remaining futures [18:41:57.691] signalConditionsASAP(NULL, pos=0) ... [18:41:57.691] - nx: 2 [18:41:57.692] - relay: TRUE [18:41:57.692] - stdout: TRUE [18:41:57.692] - signal: TRUE [18:41:57.692] - resignal: FALSE [18:41:57.692] - force: TRUE [18:41:57.693] - relayed: [n=2] TRUE, TRUE [18:41:57.693] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:57.693] - relayed: [n=2] TRUE, TRUE [18:41:57.693] - queued futures: [n=2] TRUE, TRUE [18:41:57.694] signalConditionsASAP(NULL, pos=0) ... done [18:41:57.694] resolve() on list ... DONE [18:41:57.694] result() for ClusterFuture ... [18:41:57.694] - result already collected: FutureResult [18:41:57.694] result() for ClusterFuture ... done [18:41:57.694] result() for ClusterFuture ... [18:41:57.695] - result already collected: FutureResult [18:41:57.695] result() for ClusterFuture ... done [18:41:57.695] result() for ClusterFuture ... [18:41:57.695] - result already collected: FutureResult [18:41:57.695] result() for ClusterFuture ... done [18:41:57.695] result() for ClusterFuture ... [18:41:57.696] - result already collected: FutureResult [18:41:57.696] result() for ClusterFuture ... done [18:41:57.696] - Number of value chunks collected: 2 [18:41:57.696] Resolving 2 futures (chunks) ... DONE [18:41:57.696] Reducing values from 2 chunks ... [18:41:57.696] - Number of values collected after concatenation: 3 [18:41:57.696] - Number of values expected: 3 [18:41:57.697] Reducing values from 2 chunks ... DONE [18:41:57.697] future_lapply() ... DONE [18:41:57.697] future_lapply() ... [18:41:57.700] Number of chunks: 2 [18:41:57.700] getGlobalsAndPackagesXApply() ... [18:41:57.701] - future.globals: TRUE [18:41:57.701] getGlobalsAndPackages() ... [18:41:57.701] Searching for globals... [18:41:57.703] - globals found: [4] 'FUN', 'compute', '...', '+' [18:41:57.704] Searching for globals ... DONE [18:41:57.704] Resolving globals: FALSE [18:41:57.704] Tweak future expression to call with '...' arguments ... [18:41:57.704] { [18:41:57.704] do.call(function(...) FUN(), args = future.call.arguments) [18:41:57.704] } [18:41:57.704] Tweak future expression to call with '...' arguments ... DONE [18:41:57.705] The total size of the 3 globals is 1.51 KiB (1548 bytes) [18:41:57.705] The total size of the 3 globals exported for future expression ('FUN()') is 1.51 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are three globals: 'FUN' (1.10 KiB of class 'function'), 'compute' (315 bytes of class 'function') and 'future.call.arguments' (109 bytes of class 'list') [18:41:57.706] - globals: [3] 'FUN', 'compute', 'future.call.arguments' [18:41:57.706] [18:41:57.706] getGlobalsAndPackages() ... DONE [18:41:57.706] - globals found/used: [n=3] 'FUN', 'compute', 'future.call.arguments' [18:41:57.706] - needed namespaces: [n=0] [18:41:57.706] Finding globals ... DONE [18:41:57.707] - use_args: TRUE [18:41:57.707] - Getting '...' globals ... [18:41:57.707] resolve() on list ... [18:41:57.707] recursive: 0 [18:41:57.708] length: 1 [18:41:57.708] elements: '...' [18:41:57.708] length: 0 (resolved future 1) [18:41:57.708] resolve() on list ... DONE [18:41:57.708] - '...' content: [n=0] [18:41:57.708] List of 1 [18:41:57.708] $ ...: list() [18:41:57.708] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.708] - attr(*, "where")=List of 1 [18:41:57.708] ..$ ...: [18:41:57.708] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.708] - attr(*, "resolved")= logi TRUE [18:41:57.708] - attr(*, "total_size")= num NA [18:41:57.711] - Getting '...' globals ... DONE [18:41:57.712] Globals to be used in all futures (chunks): [n=4] '...future.FUN', 'compute', 'future.call.arguments', '...' [18:41:57.712] List of 4 [18:41:57.712] $ ...future.FUN :function (x) [18:41:57.712] $ compute :function (a, x_vec) [18:41:57.712] $ future.call.arguments:List of 1 [18:41:57.712] ..$ : int 0 [18:41:57.712] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.712] $ ... : list() [18:41:57.712] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.712] - attr(*, "where")=List of 4 [18:41:57.712] ..$ ...future.FUN : [18:41:57.712] ..$ compute : [18:41:57.712] ..$ future.call.arguments: [18:41:57.712] ..$ ... : [18:41:57.712] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.712] - attr(*, "resolved")= logi FALSE [18:41:57.712] - attr(*, "total_size")= int 6977 [18:41:57.717] Packages to be attached in all futures: [n=0] [18:41:57.717] getGlobalsAndPackagesXApply() ... DONE [18:41:57.717] Number of futures (= number of chunks): 2 [18:41:57.717] Launching 2 futures (chunks) ... [18:41:57.718] Chunk #1 of 2 ... [18:41:57.718] - Finding globals in 'X' for chunk #1 ... [18:41:57.718] getGlobalsAndPackages() ... [18:41:57.718] Searching for globals... [18:41:57.718] [18:41:57.719] Searching for globals ... DONE [18:41:57.719] - globals: [0] [18:41:57.719] getGlobalsAndPackages() ... DONE [18:41:57.719] + additional globals found: [n=0] [18:41:57.719] + additional namespaces needed: [n=0] [18:41:57.719] - Finding globals in 'X' for chunk #1 ... DONE [18:41:57.720] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.720] - seeds: [18:41:57.720] - All globals exported: [n=7] '...future.FUN', 'compute', 'future.call.arguments', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.720] getGlobalsAndPackages() ... [18:41:57.720] - globals passed as-is: [7] '...future.FUN', 'compute', 'future.call.arguments', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.720] Resolving globals: FALSE [18:41:57.721] Tweak future expression to call with '...' arguments ... [18:41:57.721] - Detected 2 'future.call.arguments' global entries: [18:41:57.721] List of 2 [18:41:57.721] $ future.call.arguments:List of 1 [18:41:57.721] ..$ : int 0 [18:41:57.721] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.721] $ future.call.arguments: list() [18:41:57.721] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.721] - attr(*, "where")=List of 2 [18:41:57.721] ..$ future.call.arguments: [18:41:57.721] ..$ future.call.arguments: [18:41:57.721] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.721] - attr(*, "resolved")= logi FALSE [18:41:57.721] - attr(*, "total_size")= num 6977 [18:41:57.725] future.call.arguments future.call.arguments [18:41:57.725] 1 0 [18:41:57.725] - 'future.call.arguments' global entries: [18:41:57.725] List of 2 [18:41:57.725] $ future.call.arguments:List of 1 [18:41:57.725] ..$ : int 0 [18:41:57.725] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.725] $ ...future.elements_ii:List of 1 [18:41:57.725] ..$ : int 1 [18:41:57.725] - attr(*, "where")=List of 2 [18:41:57.725] ..$ future.call.arguments: [18:41:57.725] ..$ ...future.elements_ii: [18:41:57.725] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.725] - attr(*, "resolved")= logi FALSE [18:41:57.725] - attr(*, "total_size")= num 6977 [18:41:57.730] { [18:41:57.730] do.call(function(...) { [18:41:57.730] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.730] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.730] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.730] on.exit(options(oopts), add = TRUE) [18:41:57.730] } [18:41:57.730] { [18:41:57.730] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.730] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.730] ...future.FUN(...future.X_jj) [18:41:57.730] }) [18:41:57.730] } [18:41:57.730] }, args = future.call.arguments) [18:41:57.730] } [18:41:57.730] Tweak future expression to call with '...' arguments ... DONE [18:41:57.731] - globals: [6] '...future.FUN', 'compute', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.731] [18:41:57.731] getGlobalsAndPackages() ... DONE [18:41:57.731] run() for 'Future' ... [18:41:57.731] - state: 'created' [18:41:57.732] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.747] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.747] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.747] - Field: 'node' [18:41:57.748] - Field: 'label' [18:41:57.748] - Field: 'local' [18:41:57.748] - Field: 'owner' [18:41:57.748] - Field: 'envir' [18:41:57.748] - Field: 'workers' [18:41:57.748] - Field: 'packages' [18:41:57.749] - Field: 'gc' [18:41:57.749] - Field: 'conditions' [18:41:57.749] - Field: 'persistent' [18:41:57.749] - Field: 'expr' [18:41:57.749] - Field: 'uuid' [18:41:57.749] - Field: 'seed' [18:41:57.750] - Field: 'version' [18:41:57.750] - Field: 'result' [18:41:57.750] - Field: 'asynchronous' [18:41:57.750] - Field: 'calls' [18:41:57.750] - Field: 'globals' [18:41:57.751] - Field: 'stdout' [18:41:57.751] - Field: 'earlySignal' [18:41:57.751] - Field: 'lazy' [18:41:57.751] - Field: 'state' [18:41:57.751] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.751] - Launch lazy future ... [18:41:57.752] Packages needed by the future expression (n = 0): [18:41:57.752] Packages needed by future strategies (n = 0): [18:41:57.752] { [18:41:57.752] { [18:41:57.752] { [18:41:57.752] ...future.startTime <- base::Sys.time() [18:41:57.752] { [18:41:57.752] { [18:41:57.752] { [18:41:57.752] { [18:41:57.752] base::local({ [18:41:57.752] has_future <- base::requireNamespace("future", [18:41:57.752] quietly = TRUE) [18:41:57.752] if (has_future) { [18:41:57.752] ns <- base::getNamespace("future") [18:41:57.752] version <- ns[[".package"]][["version"]] [18:41:57.752] if (is.null(version)) [18:41:57.752] version <- utils::packageVersion("future") [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] version <- NULL [18:41:57.752] } [18:41:57.752] if (!has_future || version < "1.8.0") { [18:41:57.752] info <- base::c(r_version = base::gsub("R version ", [18:41:57.752] "", base::R.version$version.string), [18:41:57.752] platform = base::sprintf("%s (%s-bit)", [18:41:57.752] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.752] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.752] "release", "version")], collapse = " "), [18:41:57.752] hostname = base::Sys.info()[["nodename"]]) [18:41:57.752] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.752] info) [18:41:57.752] info <- base::paste(info, collapse = "; ") [18:41:57.752] if (!has_future) { [18:41:57.752] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.752] info) [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.752] info, version) [18:41:57.752] } [18:41:57.752] base::stop(msg) [18:41:57.752] } [18:41:57.752] }) [18:41:57.752] } [18:41:57.752] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.752] base::options(mc.cores = 1L) [18:41:57.752] } [18:41:57.752] ...future.strategy.old <- future::plan("list") [18:41:57.752] options(future.plan = NULL) [18:41:57.752] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.752] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.752] } [18:41:57.752] ...future.workdir <- getwd() [18:41:57.752] } [18:41:57.752] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.752] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.752] } [18:41:57.752] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.752] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.752] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.752] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.752] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.752] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.752] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.752] base::names(...future.oldOptions)) [18:41:57.752] } [18:41:57.752] if (FALSE) { [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] if (TRUE) { [18:41:57.752] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.752] open = "w") [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.752] windows = "NUL", "/dev/null"), open = "w") [18:41:57.752] } [18:41:57.752] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.752] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.752] base::sink(type = "output", split = FALSE) [18:41:57.752] base::close(...future.stdout) [18:41:57.752] }, add = TRUE) [18:41:57.752] } [18:41:57.752] ...future.frame <- base::sys.nframe() [18:41:57.752] ...future.conditions <- base::list() [18:41:57.752] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.752] if (FALSE) { [18:41:57.752] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.752] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.752] } [18:41:57.752] ...future.result <- base::tryCatch({ [18:41:57.752] base::withCallingHandlers({ [18:41:57.752] ...future.value <- base::withVisible(base::local({ [18:41:57.752] ...future.makeSendCondition <- base::local({ [18:41:57.752] sendCondition <- NULL [18:41:57.752] function(frame = 1L) { [18:41:57.752] if (is.function(sendCondition)) [18:41:57.752] return(sendCondition) [18:41:57.752] ns <- getNamespace("parallel") [18:41:57.752] if (exists("sendData", mode = "function", [18:41:57.752] envir = ns)) { [18:41:57.752] parallel_sendData <- get("sendData", mode = "function", [18:41:57.752] envir = ns) [18:41:57.752] envir <- sys.frame(frame) [18:41:57.752] master <- NULL [18:41:57.752] while (!identical(envir, .GlobalEnv) && [18:41:57.752] !identical(envir, emptyenv())) { [18:41:57.752] if (exists("master", mode = "list", envir = envir, [18:41:57.752] inherits = FALSE)) { [18:41:57.752] master <- get("master", mode = "list", [18:41:57.752] envir = envir, inherits = FALSE) [18:41:57.752] if (inherits(master, c("SOCKnode", [18:41:57.752] "SOCK0node"))) { [18:41:57.752] sendCondition <<- function(cond) { [18:41:57.752] data <- list(type = "VALUE", value = cond, [18:41:57.752] success = TRUE) [18:41:57.752] parallel_sendData(master, data) [18:41:57.752] } [18:41:57.752] return(sendCondition) [18:41:57.752] } [18:41:57.752] } [18:41:57.752] frame <- frame + 1L [18:41:57.752] envir <- sys.frame(frame) [18:41:57.752] } [18:41:57.752] } [18:41:57.752] sendCondition <<- function(cond) NULL [18:41:57.752] } [18:41:57.752] }) [18:41:57.752] withCallingHandlers({ [18:41:57.752] { [18:41:57.752] do.call(function(...) { [18:41:57.752] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.752] if (!identical(...future.globals.maxSize.org, [18:41:57.752] ...future.globals.maxSize)) { [18:41:57.752] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.752] on.exit(options(oopts), add = TRUE) [18:41:57.752] } [18:41:57.752] { [18:41:57.752] lapply(seq_along(...future.elements_ii), [18:41:57.752] FUN = function(jj) { [18:41:57.752] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.752] ...future.FUN(...future.X_jj) [18:41:57.752] }) [18:41:57.752] } [18:41:57.752] }, args = future.call.arguments) [18:41:57.752] } [18:41:57.752] }, immediateCondition = function(cond) { [18:41:57.752] sendCondition <- ...future.makeSendCondition() [18:41:57.752] sendCondition(cond) [18:41:57.752] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.752] { [18:41:57.752] inherits <- base::inherits [18:41:57.752] invokeRestart <- base::invokeRestart [18:41:57.752] is.null <- base::is.null [18:41:57.752] muffled <- FALSE [18:41:57.752] if (inherits(cond, "message")) { [18:41:57.752] muffled <- grepl(pattern, "muffleMessage") [18:41:57.752] if (muffled) [18:41:57.752] invokeRestart("muffleMessage") [18:41:57.752] } [18:41:57.752] else if (inherits(cond, "warning")) { [18:41:57.752] muffled <- grepl(pattern, "muffleWarning") [18:41:57.752] if (muffled) [18:41:57.752] invokeRestart("muffleWarning") [18:41:57.752] } [18:41:57.752] else if (inherits(cond, "condition")) { [18:41:57.752] if (!is.null(pattern)) { [18:41:57.752] computeRestarts <- base::computeRestarts [18:41:57.752] grepl <- base::grepl [18:41:57.752] restarts <- computeRestarts(cond) [18:41:57.752] for (restart in restarts) { [18:41:57.752] name <- restart$name [18:41:57.752] if (is.null(name)) [18:41:57.752] next [18:41:57.752] if (!grepl(pattern, name)) [18:41:57.752] next [18:41:57.752] invokeRestart(restart) [18:41:57.752] muffled <- TRUE [18:41:57.752] break [18:41:57.752] } [18:41:57.752] } [18:41:57.752] } [18:41:57.752] invisible(muffled) [18:41:57.752] } [18:41:57.752] muffleCondition(cond) [18:41:57.752] }) [18:41:57.752] })) [18:41:57.752] future::FutureResult(value = ...future.value$value, [18:41:57.752] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.752] ...future.rng), globalenv = if (FALSE) [18:41:57.752] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.752] ...future.globalenv.names)) [18:41:57.752] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.752] }, condition = base::local({ [18:41:57.752] c <- base::c [18:41:57.752] inherits <- base::inherits [18:41:57.752] invokeRestart <- base::invokeRestart [18:41:57.752] length <- base::length [18:41:57.752] list <- base::list [18:41:57.752] seq.int <- base::seq.int [18:41:57.752] signalCondition <- base::signalCondition [18:41:57.752] sys.calls <- base::sys.calls [18:41:57.752] `[[` <- base::`[[` [18:41:57.752] `+` <- base::`+` [18:41:57.752] `<<-` <- base::`<<-` [18:41:57.752] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.752] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.752] 3L)] [18:41:57.752] } [18:41:57.752] function(cond) { [18:41:57.752] is_error <- inherits(cond, "error") [18:41:57.752] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.752] NULL) [18:41:57.752] if (is_error) { [18:41:57.752] sessionInformation <- function() { [18:41:57.752] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.752] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.752] search = base::search(), system = base::Sys.info()) [18:41:57.752] } [18:41:57.752] ...future.conditions[[length(...future.conditions) + [18:41:57.752] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.752] cond$call), session = sessionInformation(), [18:41:57.752] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.752] signalCondition(cond) [18:41:57.752] } [18:41:57.752] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.752] "immediateCondition"))) { [18:41:57.752] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.752] ...future.conditions[[length(...future.conditions) + [18:41:57.752] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.752] if (TRUE && !signal) { [18:41:57.752] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.752] { [18:41:57.752] inherits <- base::inherits [18:41:57.752] invokeRestart <- base::invokeRestart [18:41:57.752] is.null <- base::is.null [18:41:57.752] muffled <- FALSE [18:41:57.752] if (inherits(cond, "message")) { [18:41:57.752] muffled <- grepl(pattern, "muffleMessage") [18:41:57.752] if (muffled) [18:41:57.752] invokeRestart("muffleMessage") [18:41:57.752] } [18:41:57.752] else if (inherits(cond, "warning")) { [18:41:57.752] muffled <- grepl(pattern, "muffleWarning") [18:41:57.752] if (muffled) [18:41:57.752] invokeRestart("muffleWarning") [18:41:57.752] } [18:41:57.752] else if (inherits(cond, "condition")) { [18:41:57.752] if (!is.null(pattern)) { [18:41:57.752] computeRestarts <- base::computeRestarts [18:41:57.752] grepl <- base::grepl [18:41:57.752] restarts <- computeRestarts(cond) [18:41:57.752] for (restart in restarts) { [18:41:57.752] name <- restart$name [18:41:57.752] if (is.null(name)) [18:41:57.752] next [18:41:57.752] if (!grepl(pattern, name)) [18:41:57.752] next [18:41:57.752] invokeRestart(restart) [18:41:57.752] muffled <- TRUE [18:41:57.752] break [18:41:57.752] } [18:41:57.752] } [18:41:57.752] } [18:41:57.752] invisible(muffled) [18:41:57.752] } [18:41:57.752] muffleCondition(cond, pattern = "^muffle") [18:41:57.752] } [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] if (TRUE) { [18:41:57.752] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.752] { [18:41:57.752] inherits <- base::inherits [18:41:57.752] invokeRestart <- base::invokeRestart [18:41:57.752] is.null <- base::is.null [18:41:57.752] muffled <- FALSE [18:41:57.752] if (inherits(cond, "message")) { [18:41:57.752] muffled <- grepl(pattern, "muffleMessage") [18:41:57.752] if (muffled) [18:41:57.752] invokeRestart("muffleMessage") [18:41:57.752] } [18:41:57.752] else if (inherits(cond, "warning")) { [18:41:57.752] muffled <- grepl(pattern, "muffleWarning") [18:41:57.752] if (muffled) [18:41:57.752] invokeRestart("muffleWarning") [18:41:57.752] } [18:41:57.752] else if (inherits(cond, "condition")) { [18:41:57.752] if (!is.null(pattern)) { [18:41:57.752] computeRestarts <- base::computeRestarts [18:41:57.752] grepl <- base::grepl [18:41:57.752] restarts <- computeRestarts(cond) [18:41:57.752] for (restart in restarts) { [18:41:57.752] name <- restart$name [18:41:57.752] if (is.null(name)) [18:41:57.752] next [18:41:57.752] if (!grepl(pattern, name)) [18:41:57.752] next [18:41:57.752] invokeRestart(restart) [18:41:57.752] muffled <- TRUE [18:41:57.752] break [18:41:57.752] } [18:41:57.752] } [18:41:57.752] } [18:41:57.752] invisible(muffled) [18:41:57.752] } [18:41:57.752] muffleCondition(cond, pattern = "^muffle") [18:41:57.752] } [18:41:57.752] } [18:41:57.752] } [18:41:57.752] })) [18:41:57.752] }, error = function(ex) { [18:41:57.752] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.752] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.752] ...future.rng), started = ...future.startTime, [18:41:57.752] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.752] version = "1.8"), class = "FutureResult") [18:41:57.752] }, finally = { [18:41:57.752] if (!identical(...future.workdir, getwd())) [18:41:57.752] setwd(...future.workdir) [18:41:57.752] { [18:41:57.752] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.752] ...future.oldOptions$nwarnings <- NULL [18:41:57.752] } [18:41:57.752] base::options(...future.oldOptions) [18:41:57.752] if (.Platform$OS.type == "windows") { [18:41:57.752] old_names <- names(...future.oldEnvVars) [18:41:57.752] envs <- base::Sys.getenv() [18:41:57.752] names <- names(envs) [18:41:57.752] common <- intersect(names, old_names) [18:41:57.752] added <- setdiff(names, old_names) [18:41:57.752] removed <- setdiff(old_names, names) [18:41:57.752] changed <- common[...future.oldEnvVars[common] != [18:41:57.752] envs[common]] [18:41:57.752] NAMES <- toupper(changed) [18:41:57.752] args <- list() [18:41:57.752] for (kk in seq_along(NAMES)) { [18:41:57.752] name <- changed[[kk]] [18:41:57.752] NAME <- NAMES[[kk]] [18:41:57.752] if (name != NAME && is.element(NAME, old_names)) [18:41:57.752] next [18:41:57.752] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.752] } [18:41:57.752] NAMES <- toupper(added) [18:41:57.752] for (kk in seq_along(NAMES)) { [18:41:57.752] name <- added[[kk]] [18:41:57.752] NAME <- NAMES[[kk]] [18:41:57.752] if (name != NAME && is.element(NAME, old_names)) [18:41:57.752] next [18:41:57.752] args[[name]] <- "" [18:41:57.752] } [18:41:57.752] NAMES <- toupper(removed) [18:41:57.752] for (kk in seq_along(NAMES)) { [18:41:57.752] name <- removed[[kk]] [18:41:57.752] NAME <- NAMES[[kk]] [18:41:57.752] if (name != NAME && is.element(NAME, old_names)) [18:41:57.752] next [18:41:57.752] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.752] } [18:41:57.752] if (length(args) > 0) [18:41:57.752] base::do.call(base::Sys.setenv, args = args) [18:41:57.752] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.752] } [18:41:57.752] { [18:41:57.752] if (base::length(...future.futureOptionsAdded) > [18:41:57.752] 0L) { [18:41:57.752] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.752] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.752] base::options(opts) [18:41:57.752] } [18:41:57.752] { [18:41:57.752] { [18:41:57.752] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.752] NULL [18:41:57.752] } [18:41:57.752] options(future.plan = NULL) [18:41:57.752] if (is.na(NA_character_)) [18:41:57.752] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.752] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.752] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.752] .init = FALSE) [18:41:57.752] } [18:41:57.752] } [18:41:57.752] } [18:41:57.752] }) [18:41:57.752] if (TRUE) { [18:41:57.752] base::sink(type = "output", split = FALSE) [18:41:57.752] if (TRUE) { [18:41:57.752] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.752] } [18:41:57.752] else { [18:41:57.752] ...future.result["stdout"] <- base::list(NULL) [18:41:57.752] } [18:41:57.752] base::close(...future.stdout) [18:41:57.752] ...future.stdout <- NULL [18:41:57.752] } [18:41:57.752] ...future.result$conditions <- ...future.conditions [18:41:57.752] ...future.result$finished <- base::Sys.time() [18:41:57.752] ...future.result [18:41:57.752] } [18:41:57.758] Exporting 6 global objects (2.04 KiB) to cluster node #1 ... [18:41:57.758] Exporting '...future.FUN' (1.10 KiB) to cluster node #1 ... [18:41:57.758] Exporting '...future.FUN' (1.10 KiB) to cluster node #1 ... DONE [18:41:57.759] Exporting 'compute' (315 bytes) to cluster node #1 ... [18:41:57.759] Exporting 'compute' (315 bytes) to cluster node #1 ... DONE [18:41:57.759] Exporting 'future.call.arguments' (109 bytes) to cluster node #1 ... [18:41:57.760] Exporting 'future.call.arguments' (109 bytes) to cluster node #1 ... DONE [18:41:57.760] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:41:57.760] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:41:57.760] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.761] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.761] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.761] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.761] Exporting 6 global objects (2.04 KiB) to cluster node #1 ... DONE [18:41:57.762] MultisessionFuture started [18:41:57.762] - Launch lazy future ... done [18:41:57.762] run() for 'MultisessionFuture' ... done [18:41:57.763] Created future: [18:41:57.776] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.776] - Validating connection of MultisessionFuture [18:41:57.777] - received message: FutureResult [18:41:57.777] - Received FutureResult [18:41:57.777] - Erased future from FutureRegistry [18:41:57.777] result() for ClusterFuture ... [18:41:57.777] - result already collected: FutureResult [18:41:57.778] result() for ClusterFuture ... done [18:41:57.778] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.763] MultisessionFuture: [18:41:57.763] Label: 'future_sapply-1' [18:41:57.763] Expression: [18:41:57.763] { [18:41:57.763] do.call(function(...) { [18:41:57.763] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.763] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.763] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.763] on.exit(options(oopts), add = TRUE) [18:41:57.763] } [18:41:57.763] { [18:41:57.763] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.763] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.763] ...future.FUN(...future.X_jj) [18:41:57.763] }) [18:41:57.763] } [18:41:57.763] }, args = future.call.arguments) [18:41:57.763] } [18:41:57.763] Lazy evaluation: FALSE [18:41:57.763] Asynchronous evaluation: TRUE [18:41:57.763] Local evaluation: TRUE [18:41:57.763] Environment: 0x000001c2eb220538 [18:41:57.763] Capture standard output: TRUE [18:41:57.763] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.763] Globals: 6 objects totaling 1.61 KiB (function '...future.FUN' of 1.10 KiB, function 'compute' of 315 bytes, DotDotDotList 'future.call.arguments' of 109 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:57.763] Packages: [18:41:57.763] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.763] Resolved: TRUE [18:41:57.763] Value: [18:41:57.763] Conditions captured: [18:41:57.763] Early signaling: FALSE [18:41:57.763] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.763] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.778] Chunk #1 of 2 ... DONE [18:41:57.778] Chunk #2 of 2 ... [18:41:57.779] - Finding globals in 'X' for chunk #2 ... [18:41:57.779] getGlobalsAndPackages() ... [18:41:57.779] Searching for globals... [18:41:57.779] [18:41:57.779] Searching for globals ... DONE [18:41:57.780] - globals: [0] [18:41:57.780] getGlobalsAndPackages() ... DONE [18:41:57.780] + additional globals found: [n=0] [18:41:57.780] + additional namespaces needed: [n=0] [18:41:57.780] - Finding globals in 'X' for chunk #2 ... DONE [18:41:57.780] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:57.781] - seeds: [18:41:57.781] - All globals exported: [n=7] '...future.FUN', 'compute', 'future.call.arguments', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.781] getGlobalsAndPackages() ... [18:41:57.781] - globals passed as-is: [7] '...future.FUN', 'compute', 'future.call.arguments', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.781] Resolving globals: FALSE [18:41:57.781] Tweak future expression to call with '...' arguments ... [18:41:57.782] - Detected 2 'future.call.arguments' global entries: [18:41:57.782] List of 2 [18:41:57.782] $ future.call.arguments:List of 1 [18:41:57.782] ..$ : int 0 [18:41:57.782] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.782] $ future.call.arguments: list() [18:41:57.782] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.782] - attr(*, "where")=List of 2 [18:41:57.782] ..$ future.call.arguments: [18:41:57.782] ..$ future.call.arguments: [18:41:57.782] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.782] - attr(*, "resolved")= logi FALSE [18:41:57.782] - attr(*, "total_size")= num 6977 [18:41:57.786] future.call.arguments future.call.arguments [18:41:57.786] 1 0 [18:41:57.786] - 'future.call.arguments' global entries: [18:41:57.787] List of 2 [18:41:57.787] $ future.call.arguments:List of 1 [18:41:57.787] ..$ : int 0 [18:41:57.787] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:57.787] $ ...future.elements_ii:List of 1 [18:41:57.787] ..$ : int 2 [18:41:57.787] - attr(*, "where")=List of 2 [18:41:57.787] ..$ future.call.arguments: [18:41:57.787] ..$ ...future.elements_ii: [18:41:57.787] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:57.787] - attr(*, "resolved")= logi FALSE [18:41:57.787] - attr(*, "total_size")= num 6977 [18:41:57.791] { [18:41:57.791] do.call(function(...) { [18:41:57.791] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.791] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.791] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.791] on.exit(options(oopts), add = TRUE) [18:41:57.791] } [18:41:57.791] { [18:41:57.791] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.791] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.791] ...future.FUN(...future.X_jj) [18:41:57.791] }) [18:41:57.791] } [18:41:57.791] }, args = future.call.arguments) [18:41:57.791] } [18:41:57.791] Tweak future expression to call with '...' arguments ... DONE [18:41:57.792] - globals: [6] '...future.FUN', 'compute', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:57.792] [18:41:57.792] getGlobalsAndPackages() ... DONE [18:41:57.792] run() for 'Future' ... [18:41:57.793] - state: 'created' [18:41:57.793] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:57.808] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.808] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:57.808] - Field: 'node' [18:41:57.808] - Field: 'label' [18:41:57.809] - Field: 'local' [18:41:57.809] - Field: 'owner' [18:41:57.809] - Field: 'envir' [18:41:57.809] - Field: 'workers' [18:41:57.809] - Field: 'packages' [18:41:57.809] - Field: 'gc' [18:41:57.810] - Field: 'conditions' [18:41:57.810] - Field: 'persistent' [18:41:57.810] - Field: 'expr' [18:41:57.810] - Field: 'uuid' [18:41:57.810] - Field: 'seed' [18:41:57.811] - Field: 'version' [18:41:57.811] - Field: 'result' [18:41:57.811] - Field: 'asynchronous' [18:41:57.811] - Field: 'calls' [18:41:57.811] - Field: 'globals' [18:41:57.811] - Field: 'stdout' [18:41:57.812] - Field: 'earlySignal' [18:41:57.812] - Field: 'lazy' [18:41:57.812] - Field: 'state' [18:41:57.812] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:57.812] - Launch lazy future ... [18:41:57.813] Packages needed by the future expression (n = 0): [18:41:57.813] Packages needed by future strategies (n = 0): [18:41:57.813] { [18:41:57.813] { [18:41:57.813] { [18:41:57.813] ...future.startTime <- base::Sys.time() [18:41:57.813] { [18:41:57.813] { [18:41:57.813] { [18:41:57.813] { [18:41:57.813] base::local({ [18:41:57.813] has_future <- base::requireNamespace("future", [18:41:57.813] quietly = TRUE) [18:41:57.813] if (has_future) { [18:41:57.813] ns <- base::getNamespace("future") [18:41:57.813] version <- ns[[".package"]][["version"]] [18:41:57.813] if (is.null(version)) [18:41:57.813] version <- utils::packageVersion("future") [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] version <- NULL [18:41:57.813] } [18:41:57.813] if (!has_future || version < "1.8.0") { [18:41:57.813] info <- base::c(r_version = base::gsub("R version ", [18:41:57.813] "", base::R.version$version.string), [18:41:57.813] platform = base::sprintf("%s (%s-bit)", [18:41:57.813] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:57.813] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:57.813] "release", "version")], collapse = " "), [18:41:57.813] hostname = base::Sys.info()[["nodename"]]) [18:41:57.813] info <- base::sprintf("%s: %s", base::names(info), [18:41:57.813] info) [18:41:57.813] info <- base::paste(info, collapse = "; ") [18:41:57.813] if (!has_future) { [18:41:57.813] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:57.813] info) [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:57.813] info, version) [18:41:57.813] } [18:41:57.813] base::stop(msg) [18:41:57.813] } [18:41:57.813] }) [18:41:57.813] } [18:41:57.813] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:57.813] base::options(mc.cores = 1L) [18:41:57.813] } [18:41:57.813] ...future.strategy.old <- future::plan("list") [18:41:57.813] options(future.plan = NULL) [18:41:57.813] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.813] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:57.813] } [18:41:57.813] ...future.workdir <- getwd() [18:41:57.813] } [18:41:57.813] ...future.oldOptions <- base::as.list(base::.Options) [18:41:57.813] ...future.oldEnvVars <- base::Sys.getenv() [18:41:57.813] } [18:41:57.813] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:57.813] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:57.813] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:57.813] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:57.813] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:57.813] future.stdout.windows.reencode = NULL, width = 80L) [18:41:57.813] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:57.813] base::names(...future.oldOptions)) [18:41:57.813] } [18:41:57.813] if (FALSE) { [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] if (TRUE) { [18:41:57.813] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:57.813] open = "w") [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:57.813] windows = "NUL", "/dev/null"), open = "w") [18:41:57.813] } [18:41:57.813] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:57.813] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:57.813] base::sink(type = "output", split = FALSE) [18:41:57.813] base::close(...future.stdout) [18:41:57.813] }, add = TRUE) [18:41:57.813] } [18:41:57.813] ...future.frame <- base::sys.nframe() [18:41:57.813] ...future.conditions <- base::list() [18:41:57.813] ...future.rng <- base::globalenv()$.Random.seed [18:41:57.813] if (FALSE) { [18:41:57.813] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:57.813] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:57.813] } [18:41:57.813] ...future.result <- base::tryCatch({ [18:41:57.813] base::withCallingHandlers({ [18:41:57.813] ...future.value <- base::withVisible(base::local({ [18:41:57.813] ...future.makeSendCondition <- base::local({ [18:41:57.813] sendCondition <- NULL [18:41:57.813] function(frame = 1L) { [18:41:57.813] if (is.function(sendCondition)) [18:41:57.813] return(sendCondition) [18:41:57.813] ns <- getNamespace("parallel") [18:41:57.813] if (exists("sendData", mode = "function", [18:41:57.813] envir = ns)) { [18:41:57.813] parallel_sendData <- get("sendData", mode = "function", [18:41:57.813] envir = ns) [18:41:57.813] envir <- sys.frame(frame) [18:41:57.813] master <- NULL [18:41:57.813] while (!identical(envir, .GlobalEnv) && [18:41:57.813] !identical(envir, emptyenv())) { [18:41:57.813] if (exists("master", mode = "list", envir = envir, [18:41:57.813] inherits = FALSE)) { [18:41:57.813] master <- get("master", mode = "list", [18:41:57.813] envir = envir, inherits = FALSE) [18:41:57.813] if (inherits(master, c("SOCKnode", [18:41:57.813] "SOCK0node"))) { [18:41:57.813] sendCondition <<- function(cond) { [18:41:57.813] data <- list(type = "VALUE", value = cond, [18:41:57.813] success = TRUE) [18:41:57.813] parallel_sendData(master, data) [18:41:57.813] } [18:41:57.813] return(sendCondition) [18:41:57.813] } [18:41:57.813] } [18:41:57.813] frame <- frame + 1L [18:41:57.813] envir <- sys.frame(frame) [18:41:57.813] } [18:41:57.813] } [18:41:57.813] sendCondition <<- function(cond) NULL [18:41:57.813] } [18:41:57.813] }) [18:41:57.813] withCallingHandlers({ [18:41:57.813] { [18:41:57.813] do.call(function(...) { [18:41:57.813] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.813] if (!identical(...future.globals.maxSize.org, [18:41:57.813] ...future.globals.maxSize)) { [18:41:57.813] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.813] on.exit(options(oopts), add = TRUE) [18:41:57.813] } [18:41:57.813] { [18:41:57.813] lapply(seq_along(...future.elements_ii), [18:41:57.813] FUN = function(jj) { [18:41:57.813] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.813] ...future.FUN(...future.X_jj) [18:41:57.813] }) [18:41:57.813] } [18:41:57.813] }, args = future.call.arguments) [18:41:57.813] } [18:41:57.813] }, immediateCondition = function(cond) { [18:41:57.813] sendCondition <- ...future.makeSendCondition() [18:41:57.813] sendCondition(cond) [18:41:57.813] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.813] { [18:41:57.813] inherits <- base::inherits [18:41:57.813] invokeRestart <- base::invokeRestart [18:41:57.813] is.null <- base::is.null [18:41:57.813] muffled <- FALSE [18:41:57.813] if (inherits(cond, "message")) { [18:41:57.813] muffled <- grepl(pattern, "muffleMessage") [18:41:57.813] if (muffled) [18:41:57.813] invokeRestart("muffleMessage") [18:41:57.813] } [18:41:57.813] else if (inherits(cond, "warning")) { [18:41:57.813] muffled <- grepl(pattern, "muffleWarning") [18:41:57.813] if (muffled) [18:41:57.813] invokeRestart("muffleWarning") [18:41:57.813] } [18:41:57.813] else if (inherits(cond, "condition")) { [18:41:57.813] if (!is.null(pattern)) { [18:41:57.813] computeRestarts <- base::computeRestarts [18:41:57.813] grepl <- base::grepl [18:41:57.813] restarts <- computeRestarts(cond) [18:41:57.813] for (restart in restarts) { [18:41:57.813] name <- restart$name [18:41:57.813] if (is.null(name)) [18:41:57.813] next [18:41:57.813] if (!grepl(pattern, name)) [18:41:57.813] next [18:41:57.813] invokeRestart(restart) [18:41:57.813] muffled <- TRUE [18:41:57.813] break [18:41:57.813] } [18:41:57.813] } [18:41:57.813] } [18:41:57.813] invisible(muffled) [18:41:57.813] } [18:41:57.813] muffleCondition(cond) [18:41:57.813] }) [18:41:57.813] })) [18:41:57.813] future::FutureResult(value = ...future.value$value, [18:41:57.813] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.813] ...future.rng), globalenv = if (FALSE) [18:41:57.813] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:57.813] ...future.globalenv.names)) [18:41:57.813] else NULL, started = ...future.startTime, version = "1.8") [18:41:57.813] }, condition = base::local({ [18:41:57.813] c <- base::c [18:41:57.813] inherits <- base::inherits [18:41:57.813] invokeRestart <- base::invokeRestart [18:41:57.813] length <- base::length [18:41:57.813] list <- base::list [18:41:57.813] seq.int <- base::seq.int [18:41:57.813] signalCondition <- base::signalCondition [18:41:57.813] sys.calls <- base::sys.calls [18:41:57.813] `[[` <- base::`[[` [18:41:57.813] `+` <- base::`+` [18:41:57.813] `<<-` <- base::`<<-` [18:41:57.813] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:57.813] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:57.813] 3L)] [18:41:57.813] } [18:41:57.813] function(cond) { [18:41:57.813] is_error <- inherits(cond, "error") [18:41:57.813] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:57.813] NULL) [18:41:57.813] if (is_error) { [18:41:57.813] sessionInformation <- function() { [18:41:57.813] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:57.813] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:57.813] search = base::search(), system = base::Sys.info()) [18:41:57.813] } [18:41:57.813] ...future.conditions[[length(...future.conditions) + [18:41:57.813] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:57.813] cond$call), session = sessionInformation(), [18:41:57.813] timestamp = base::Sys.time(), signaled = 0L) [18:41:57.813] signalCondition(cond) [18:41:57.813] } [18:41:57.813] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:57.813] "immediateCondition"))) { [18:41:57.813] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:57.813] ...future.conditions[[length(...future.conditions) + [18:41:57.813] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:57.813] if (TRUE && !signal) { [18:41:57.813] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.813] { [18:41:57.813] inherits <- base::inherits [18:41:57.813] invokeRestart <- base::invokeRestart [18:41:57.813] is.null <- base::is.null [18:41:57.813] muffled <- FALSE [18:41:57.813] if (inherits(cond, "message")) { [18:41:57.813] muffled <- grepl(pattern, "muffleMessage") [18:41:57.813] if (muffled) [18:41:57.813] invokeRestart("muffleMessage") [18:41:57.813] } [18:41:57.813] else if (inherits(cond, "warning")) { [18:41:57.813] muffled <- grepl(pattern, "muffleWarning") [18:41:57.813] if (muffled) [18:41:57.813] invokeRestart("muffleWarning") [18:41:57.813] } [18:41:57.813] else if (inherits(cond, "condition")) { [18:41:57.813] if (!is.null(pattern)) { [18:41:57.813] computeRestarts <- base::computeRestarts [18:41:57.813] grepl <- base::grepl [18:41:57.813] restarts <- computeRestarts(cond) [18:41:57.813] for (restart in restarts) { [18:41:57.813] name <- restart$name [18:41:57.813] if (is.null(name)) [18:41:57.813] next [18:41:57.813] if (!grepl(pattern, name)) [18:41:57.813] next [18:41:57.813] invokeRestart(restart) [18:41:57.813] muffled <- TRUE [18:41:57.813] break [18:41:57.813] } [18:41:57.813] } [18:41:57.813] } [18:41:57.813] invisible(muffled) [18:41:57.813] } [18:41:57.813] muffleCondition(cond, pattern = "^muffle") [18:41:57.813] } [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] if (TRUE) { [18:41:57.813] muffleCondition <- function (cond, pattern = "^muffle") [18:41:57.813] { [18:41:57.813] inherits <- base::inherits [18:41:57.813] invokeRestart <- base::invokeRestart [18:41:57.813] is.null <- base::is.null [18:41:57.813] muffled <- FALSE [18:41:57.813] if (inherits(cond, "message")) { [18:41:57.813] muffled <- grepl(pattern, "muffleMessage") [18:41:57.813] if (muffled) [18:41:57.813] invokeRestart("muffleMessage") [18:41:57.813] } [18:41:57.813] else if (inherits(cond, "warning")) { [18:41:57.813] muffled <- grepl(pattern, "muffleWarning") [18:41:57.813] if (muffled) [18:41:57.813] invokeRestart("muffleWarning") [18:41:57.813] } [18:41:57.813] else if (inherits(cond, "condition")) { [18:41:57.813] if (!is.null(pattern)) { [18:41:57.813] computeRestarts <- base::computeRestarts [18:41:57.813] grepl <- base::grepl [18:41:57.813] restarts <- computeRestarts(cond) [18:41:57.813] for (restart in restarts) { [18:41:57.813] name <- restart$name [18:41:57.813] if (is.null(name)) [18:41:57.813] next [18:41:57.813] if (!grepl(pattern, name)) [18:41:57.813] next [18:41:57.813] invokeRestart(restart) [18:41:57.813] muffled <- TRUE [18:41:57.813] break [18:41:57.813] } [18:41:57.813] } [18:41:57.813] } [18:41:57.813] invisible(muffled) [18:41:57.813] } [18:41:57.813] muffleCondition(cond, pattern = "^muffle") [18:41:57.813] } [18:41:57.813] } [18:41:57.813] } [18:41:57.813] })) [18:41:57.813] }, error = function(ex) { [18:41:57.813] base::structure(base::list(value = NULL, visible = NULL, [18:41:57.813] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:57.813] ...future.rng), started = ...future.startTime, [18:41:57.813] finished = Sys.time(), session_uuid = NA_character_, [18:41:57.813] version = "1.8"), class = "FutureResult") [18:41:57.813] }, finally = { [18:41:57.813] if (!identical(...future.workdir, getwd())) [18:41:57.813] setwd(...future.workdir) [18:41:57.813] { [18:41:57.813] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:57.813] ...future.oldOptions$nwarnings <- NULL [18:41:57.813] } [18:41:57.813] base::options(...future.oldOptions) [18:41:57.813] if (.Platform$OS.type == "windows") { [18:41:57.813] old_names <- names(...future.oldEnvVars) [18:41:57.813] envs <- base::Sys.getenv() [18:41:57.813] names <- names(envs) [18:41:57.813] common <- intersect(names, old_names) [18:41:57.813] added <- setdiff(names, old_names) [18:41:57.813] removed <- setdiff(old_names, names) [18:41:57.813] changed <- common[...future.oldEnvVars[common] != [18:41:57.813] envs[common]] [18:41:57.813] NAMES <- toupper(changed) [18:41:57.813] args <- list() [18:41:57.813] for (kk in seq_along(NAMES)) { [18:41:57.813] name <- changed[[kk]] [18:41:57.813] NAME <- NAMES[[kk]] [18:41:57.813] if (name != NAME && is.element(NAME, old_names)) [18:41:57.813] next [18:41:57.813] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.813] } [18:41:57.813] NAMES <- toupper(added) [18:41:57.813] for (kk in seq_along(NAMES)) { [18:41:57.813] name <- added[[kk]] [18:41:57.813] NAME <- NAMES[[kk]] [18:41:57.813] if (name != NAME && is.element(NAME, old_names)) [18:41:57.813] next [18:41:57.813] args[[name]] <- "" [18:41:57.813] } [18:41:57.813] NAMES <- toupper(removed) [18:41:57.813] for (kk in seq_along(NAMES)) { [18:41:57.813] name <- removed[[kk]] [18:41:57.813] NAME <- NAMES[[kk]] [18:41:57.813] if (name != NAME && is.element(NAME, old_names)) [18:41:57.813] next [18:41:57.813] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:57.813] } [18:41:57.813] if (length(args) > 0) [18:41:57.813] base::do.call(base::Sys.setenv, args = args) [18:41:57.813] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:57.813] } [18:41:57.813] { [18:41:57.813] if (base::length(...future.futureOptionsAdded) > [18:41:57.813] 0L) { [18:41:57.813] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:57.813] base::names(opts) <- ...future.futureOptionsAdded [18:41:57.813] base::options(opts) [18:41:57.813] } [18:41:57.813] { [18:41:57.813] { [18:41:57.813] base::options(mc.cores = ...future.mc.cores.old) [18:41:57.813] NULL [18:41:57.813] } [18:41:57.813] options(future.plan = NULL) [18:41:57.813] if (is.na(NA_character_)) [18:41:57.813] Sys.unsetenv("R_FUTURE_PLAN") [18:41:57.813] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:57.813] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:57.813] .init = FALSE) [18:41:57.813] } [18:41:57.813] } [18:41:57.813] } [18:41:57.813] }) [18:41:57.813] if (TRUE) { [18:41:57.813] base::sink(type = "output", split = FALSE) [18:41:57.813] if (TRUE) { [18:41:57.813] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:57.813] } [18:41:57.813] else { [18:41:57.813] ...future.result["stdout"] <- base::list(NULL) [18:41:57.813] } [18:41:57.813] base::close(...future.stdout) [18:41:57.813] ...future.stdout <- NULL [18:41:57.813] } [18:41:57.813] ...future.result$conditions <- ...future.conditions [18:41:57.813] ...future.result$finished <- base::Sys.time() [18:41:57.813] ...future.result [18:41:57.813] } [18:41:57.819] Exporting 6 global objects (2.04 KiB) to cluster node #1 ... [18:41:57.819] Exporting '...future.FUN' (1.10 KiB) to cluster node #1 ... [18:41:57.823] Exporting '...future.FUN' (1.10 KiB) to cluster node #1 ... DONE [18:41:57.823] Exporting 'compute' (315 bytes) to cluster node #1 ... [18:41:57.824] Exporting 'compute' (315 bytes) to cluster node #1 ... DONE [18:41:57.824] Exporting 'future.call.arguments' (109 bytes) to cluster node #1 ... [18:41:57.824] Exporting 'future.call.arguments' (109 bytes) to cluster node #1 ... DONE [18:41:57.824] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:41:57.825] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:41:57.825] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:57.826] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:57.826] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:57.826] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:57.826] Exporting 6 global objects (2.04 KiB) to cluster node #1 ... DONE [18:41:57.827] MultisessionFuture started [18:41:57.827] - Launch lazy future ... done [18:41:57.827] run() for 'MultisessionFuture' ... done [18:41:57.828] Created future: [18:41:57.842] receiveMessageFromWorker() for ClusterFuture ... [18:41:57.842] - Validating connection of MultisessionFuture [18:41:57.842] - received message: FutureResult [18:41:57.842] - Received FutureResult [18:41:57.843] - Erased future from FutureRegistry [18:41:57.843] result() for ClusterFuture ... [18:41:57.843] - result already collected: FutureResult [18:41:57.843] result() for ClusterFuture ... done [18:41:57.843] receiveMessageFromWorker() for ClusterFuture ... done [18:41:57.828] MultisessionFuture: [18:41:57.828] Label: 'future_sapply-2' [18:41:57.828] Expression: [18:41:57.828] { [18:41:57.828] do.call(function(...) { [18:41:57.828] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:57.828] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:57.828] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:57.828] on.exit(options(oopts), add = TRUE) [18:41:57.828] } [18:41:57.828] { [18:41:57.828] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:57.828] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:57.828] ...future.FUN(...future.X_jj) [18:41:57.828] }) [18:41:57.828] } [18:41:57.828] }, args = future.call.arguments) [18:41:57.828] } [18:41:57.828] Lazy evaluation: FALSE [18:41:57.828] Asynchronous evaluation: TRUE [18:41:57.828] Local evaluation: TRUE [18:41:57.828] Environment: 0x000001c2eb220538 [18:41:57.828] Capture standard output: TRUE [18:41:57.828] Capture condition classes: 'condition' (excluding 'nothing') [18:41:57.828] Globals: 6 objects totaling 1.61 KiB (function '...future.FUN' of 1.10 KiB, function 'compute' of 315 bytes, DotDotDotList 'future.call.arguments' of 109 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:57.828] Packages: [18:41:57.828] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:57.828] Resolved: TRUE [18:41:57.828] Value: [18:41:57.828] Conditions captured: [18:41:57.828] Early signaling: FALSE [18:41:57.828] Owner process: 5108dd3e-2207-c747-f30f-e1a3ef0cb029 [18:41:57.828] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:57.844] Chunk #2 of 2 ... DONE [18:41:57.844] Launching 2 futures (chunks) ... DONE [18:41:57.844] Resolving 2 futures (chunks) ... [18:41:57.844] resolve() on list ... [18:41:57.844] recursive: 0 [18:41:57.845] length: 2 [18:41:57.845] [18:41:57.845] Future #1 [18:41:57.845] result() for ClusterFuture ... [18:41:57.845] - result already collected: FutureResult [18:41:57.845] result() for ClusterFuture ... done [18:41:57.846] result() for ClusterFuture ... [18:41:57.846] - result already collected: FutureResult [18:41:57.846] result() for ClusterFuture ... done [18:41:57.846] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:57.846] - nx: 2 [18:41:57.846] - relay: TRUE [18:41:57.846] - stdout: TRUE [18:41:57.847] - signal: TRUE [18:41:57.847] - resignal: FALSE [18:41:57.847] - force: TRUE [18:41:57.847] - relayed: [n=2] FALSE, FALSE [18:41:57.847] - queued futures: [n=2] FALSE, FALSE [18:41:57.847] - until=1 [18:41:57.848] - relaying element #1 [18:41:57.848] result() for ClusterFuture ... [18:41:57.848] - result already collected: FutureResult [18:41:57.848] result() for ClusterFuture ... done [18:41:57.848] result() for ClusterFuture ... [18:41:57.848] - result already collected: FutureResult [18:41:57.849] result() for ClusterFuture ... done [18:41:57.849] result() for ClusterFuture ... [18:41:57.849] - result already collected: FutureResult [18:41:57.849] result() for ClusterFuture ... done [18:41:57.850] result() for ClusterFuture ... [18:41:57.850] - result already collected: FutureResult [18:41:57.850] result() for ClusterFuture ... done [18:41:57.850] - relayed: [n=2] TRUE, FALSE [18:41:57.851] - queued futures: [n=2] TRUE, FALSE [18:41:57.851] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:57.851] length: 1 (resolved future 1) [18:41:57.851] Future #2 [18:41:57.851] result() for ClusterFuture ... [18:41:57.851] - result already collected: FutureResult [18:41:57.852] result() for ClusterFuture ... done [18:41:57.852] result() for ClusterFuture ... [18:41:57.852] - result already collected: FutureResult [18:41:57.852] result() for ClusterFuture ... done [18:41:57.852] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:57.852] - nx: 2 [18:41:57.853] - relay: TRUE [18:41:57.853] - stdout: TRUE [18:41:57.853] - signal: TRUE [18:41:57.853] - resignal: FALSE [18:41:57.853] - force: TRUE [18:41:57.853] - relayed: [n=2] TRUE, FALSE [18:41:57.853] - queued futures: [n=2] TRUE, FALSE [18:41:57.854] - until=2 [18:41:57.854] - relaying element #2 [18:41:57.854] result() for ClusterFuture ... [18:41:57.854] - result already collected: FutureResult [18:41:57.854] result() for ClusterFuture ... done [18:41:57.854] result() for ClusterFuture ... [18:41:57.855] - result already collected: FutureResult [18:41:57.855] result() for ClusterFuture ... done [18:41:57.855] result() for ClusterFuture ... [18:41:57.855] - result already collected: FutureResult [18:41:57.855] result() for ClusterFuture ... done [18:41:57.855] result() for ClusterFuture ... [18:41:57.855] - result already collected: FutureResult [18:41:57.856] result() for ClusterFuture ... done [18:41:57.856] - relayed: [n=2] TRUE, TRUE [18:41:57.856] - queued futures: [n=2] TRUE, TRUE [18:41:57.856] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:57.856] length: 0 (resolved future 2) [18:41:57.856] Relaying remaining futures [18:41:57.857] signalConditionsASAP(NULL, pos=0) ... [18:41:57.857] - nx: 2 [18:41:57.857] - relay: TRUE [18:41:57.857] - stdout: TRUE [18:41:57.857] - signal: TRUE [18:41:57.857] - resignal: FALSE [18:41:57.857] - force: TRUE [18:41:57.858] - relayed: [n=2] TRUE, TRUE [18:41:57.858] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:57.858] - relayed: [n=2] TRUE, TRUE [18:41:57.858] - queued futures: [n=2] TRUE, TRUE [18:41:57.858] signalConditionsASAP(NULL, pos=0) ... done [18:41:57.858] resolve() on list ... DONE [18:41:57.859] result() for ClusterFuture ... [18:41:57.859] - result already collected: FutureResult [18:41:57.859] result() for ClusterFuture ... done [18:41:57.859] result() for ClusterFuture ... [18:41:57.859] - result already collected: FutureResult [18:41:57.860] result() for ClusterFuture ... done [18:41:57.860] result() for ClusterFuture ... [18:41:57.860] - result already collected: FutureResult [18:41:57.860] result() for ClusterFuture ... done [18:41:57.860] result() for ClusterFuture ... [18:41:57.860] - result already collected: FutureResult [18:41:57.860] result() for ClusterFuture ... done [18:41:57.861] - Number of value chunks collected: 2 [18:41:57.861] Resolving 2 futures (chunks) ... DONE [18:41:57.861] Reducing values from 2 chunks ... [18:41:57.861] - Number of values collected after concatenation: 2 [18:41:57.861] - Number of values expected: 2 [18:41:57.861] Reducing values from 2 chunks ... DONE [18:41:57.862] future_lapply() ... DONE [1] 1 2 [18:41:57.862] plan(): Setting new future strategy stack: [18:41:57.862] List of future strategies: [18:41:57.862] 1. sequential: [18:41:57.862] - args: function (..., envir = parent.frame(), workers = "") [18:41:57.862] - tweaked: FALSE [18:41:57.862] - call: plan(sequential) [18:41:57.871] plan(): nbrOfWorkers() = 1 *** strategy = 'multisession' ... done > > message("*** future_sapply() ... DONE") *** future_sapply() ... DONE > > source("incl/end.R") [18:41:57.872] plan(): Setting new future strategy stack: [18:41:57.872] List of future strategies: [18:41:57.872] 1. FutureStrategy: [18:41:57.872] - args: function (..., envir = parent.frame(), workers = "") [18:41:57.872] - tweaked: FALSE [18:41:57.872] - call: future::plan(oplan) [18:41:57.873] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 14.59 0.60 17.87